diff --git a/analysis_scripts/analysis_utils.R b/analysis_scripts/analysis_utils.R
index 2ed913835..f61bd8841 100644
--- a/analysis_scripts/analysis_utils.R
+++ b/analysis_scripts/analysis_utils.R
@@ -2,6 +2,16 @@ library(jsonlite)
library(data.table)
library(dplyr)
+
+proj_dir = here()
+source(file.path(proj_dir, "/utils/scraper_processing_utils.R"))
+
+
+#' Read in the quote information from processed coreNLP TSV output
+#'
+#' @param corenlp_file The processed coreNLP output TSV file.
+#' Expected column names are full_name, gender, and quote
+#' @return a dataframe of the quote information
read_corenlp_quote_files <- function(corenlp_file){
corenlp_df = data.frame(fread(corenlp_file, header=T, quote=""))
@@ -17,6 +27,11 @@ read_corenlp_quote_files <- function(corenlp_file){
return(corenlp_df)
}
+#' Read in the benchmark quote information from processed coreNLP TSV output
+#'
+#' @param gold_file The hand-processed coreNLP output TSV file.
+#' Expected column names are full_name, gender, quote
+#' @return a dataframe of the benchmark quote information
read_benchmark_quote_file <- function(gold_file){
gold_df = data.frame(fread(gold_file, header=T, quote=FALSE))
@@ -28,14 +43,24 @@ read_benchmark_quote_file <- function(gold_file){
}
-
+#' Read in the location information from processed coreNLP TSV output
+#'
+#' @param corenlp_file The processed coreNLP output TSV file.
+#' Expected column names are address.country_code, country, un_region, and un_subregion
+#' @return a dataframe of the location information
read_corenlp_location_files <- function(corenlp_file){
corenlp_df = data.frame(fread(corenlp_file, header=T))
+ country_df = get_country_info()
+ corenlp_df = merge(corenlp_df, country_df, all.x=T)
+ corenlp_df = unique(corenlp_df)
+
+ colnames(corenlp_df)[which(colnames(corenlp_df)=="address.country_code")] = "est_country_code"
colnames(corenlp_df)[which(colnames(corenlp_df)=="country")] = "est_country"
colnames(corenlp_df)[which(colnames(corenlp_df)=="un_region")] = "est_un_region"
colnames(corenlp_df)[which(colnames(corenlp_df)=="un_subregion")] = "est_un_subregion"
+ corenlp_df$est_country[which(is.na(corenlp_df$est_country_code))] = "NO_EST"
corenlp_df$est_country[which(is.na(corenlp_df$est_country))] = "NO_EST"
corenlp_df$est_un_region[which(is.na(corenlp_df$est_un_region))] = "NO_EST"
corenlp_df$est_un_subregion[which(is.na(corenlp_df$est_un_subregion))] = "NO_EST"
@@ -44,9 +69,15 @@ read_corenlp_location_files <- function(corenlp_file){
return(corenlp_df)
}
+#' Read in the benchmark location information from processed coreNLP TSV output
+#'
+#' @param bm_loc_file The hand-processed coreNLP output TSV file.
+#' Expected column names are address.country_code, country, un_region, and un_subregion
+#' @return a dataframe of the benchmark location information
read_benchmark_location_file <- function(bm_loc_file){
gold_df = data.frame(fread(bm_loc_file, header=T))
+ colnames(gold_df)[which(colnames(gold_df)=="address.country_code")] = "true_country_code"
colnames(gold_df)[which(colnames(gold_df)=="country")] = "true_country"
colnames(gold_df)[which(colnames(gold_df)=="un_region")] = "true_un_region"
colnames(gold_df)[which(colnames(gold_df)=="un_subregion")] = "true_un_subregion"
@@ -54,92 +85,3 @@ read_benchmark_location_file <- function(bm_loc_file){
}
-
-make_comparison <- function(gold_df, res_df){
-
- # join the df to make comparison
- compare_df = merge(gold_df, res_df, by=c("file_id", "quote"), all.x=T)
-
- #check if the predicted speaker is contained within the true speaker
- speaker_idx = which(colnames(compare_df) == "est_speaker")
- true_speaker_idx = which(colnames(compare_df) == "true_speaker")
- speaker_match = apply(compare_df, 1,
- function(x) grepl(x[speaker_idx],
- x[true_speaker_idx],
- fixed=T))
-
- compare_df$is_speaker_correct = speaker_match
-
-
-
- gender_idx = which(colnames(compare_df) == "est_gender")
- true_gender_idx = which(colnames(compare_df) == "true_gender")
- gender_match = apply(compare_df, 1,
- function(x) x[gender_idx] == x[true_gender_idx])
-
- compare_df$is_gender_correct = gender_match
-
- return(compare_df)
-
-}
-
-evaluate_gender_speaker <- function(compare_df){
-
- eval_df = subset(compare_df, !is.na(true_gender))
- eval_df = subset(eval_df, true_gender!="NOT_CLEAR")
-
- # overall accuracy
- overall_gender_acc = sum(eval_df$is_gender_correct) / nrow(eval_df)
-
- ## get per DOC stats
- # perdocument accuracy
- per_doc_acc = eval_df %>%
- group_by(file_id) %>%
- summarize(acc = sum(is_gender_correct) / length(is_gender_correct))
- per_doc_acc = data.frame(per_doc_acc)
-
-}
-
-evaluate_speaker_attrib <- function(compare_df, outfile){
-
- eval_df = subset(compare_df, !is.na(true_speaker))
- eval_df = subset(eval_df, true_speaker!="NOT_CLEAR")
-
- # overall accuracy
- overall_speaker_acc = sum(eval_df$is_speaker_correct) / nrow(eval_df)
-
- ## get per DOC stats
- # perdocument accuracy
- per_doc_acc = eval_df %>%
- group_by(file_id) %>%
- summarize(acc = sum(is_speaker_correct) / length(is_speaker_correct))
- per_doc_acc = data.frame(per_doc_acc)
-
- # document stats
- num_quotes = data.frame(table(eval_df$file_id))
- colnames(num_quotes) = c("file_id", "num_quotes")
- per_doc_acc = merge(per_doc_acc, num_quotes)
-
-
-}
-
-basic_doc_stats <- function(gold_df, year_idx_file){
-
-
- eval_df = subset(gold_df, !is.na(true_gender))
- eval_df = subset(eval_df, true_gender!="NOT_CLEAR")
-
-
- year_df = data.frame(fread(year_idx_file))
- eval_df = merge(year_df, eval_df)
-
- ## get per year stats
- # perdocument accuracy
- per_year_gender = eval_df %>%
- group_by(year) %>%
- summarize(percent_male = sum(true_gender=="MALE") / length(true_gender))
- per_year_gender = data.frame(per_year_gender)
-
-
-
-}
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis.Rmd b/analysis_scripts/analyze_benchmark_data/benchmark_analysis.Rmd
index 00ba3d884..8342ee8f5 100644
--- a/analysis_scripts/analyze_benchmark_data/benchmark_analysis.Rmd
+++ b/analysis_scripts/analyze_benchmark_data/benchmark_analysis.Rmd
@@ -12,6 +12,7 @@ require(data.table)
require(here)
require(ggplot2)
require(caret)
+require(ggrepel)
proj_dir = here()
source(paste(proj_dir, "/analysis_scripts/analysis_utils.R", sep=""))
@@ -167,7 +168,7 @@ bm_loc_file = paste(proj_dir,
bm_loc_df = read_benchmark_location_file(bm_loc_file)
raw_loc_file = paste(proj_dir,
- "/data/benchmark_data/benchmark_location_table_hand_annotated.tsv",
+ "/data/benchmark_data/benchmark_location_table_raw.tsv",
sep="")
raw_loc_df = read_corenlp_location_files(raw_loc_file)
@@ -184,40 +185,43 @@ head(bm_loc_df)
head(raw_loc_df)
```
-Similar to before we will match columns baed on their names, in `raw_loc_df` it has `est_` columns and in `bm_loc_df` is has matching `true_` columns
+Similar to before we will match columns based on their names, in `raw_loc_df` it has `est_` columns and in `bm_loc_df` is has matching `true_` columns
Now lets first look at the benchmark data
```{r echo=F, fig.width=15}
# filter out any places where the gender is NA
# this can happen when a quote is from an unidentified i.e. spokesperson
- eval_df = subset(bm_loc_df, !is.na(true_country))
+ eval_df = subset(bm_loc_df, true_country_code != "NAN")
eval_df = merge(year_df, eval_df)
# we only care if a country was mentioned once or not at all
- eval_df = eval_df[,c("file_id", "true_country", "true_un_region",
+ eval_df = eval_df[,c("file_id", "true_country_code", "true_un_region",
"true_un_subregion", "year")]
eval_df = unique(eval_df)
## plot per year stats
- country_agg = data.frame(table(eval_df[,c("true_country", "year")]))
- ggplot(country_agg, aes(x=year, y=Freq, color=true_country, group=true_country)) +
+ country_agg = unique(eval_df[,c("file_id","true_country_code", "year")])
+ country_agg = data.frame(table(country_agg[,c("true_country_code", "year")]))
+ ggplot(country_agg, aes(x=year, y=Freq, color=true_country_code, group=true_country_code)) +
geom_line() + geom_point() + theme_bw() +
xlab("Year of Article") +
ylab("Number of Articles (10 articles/year) with \n at least one Country Mention") +
ylim(c(0, 10)) +
ggtitle("Country Mention by Year")
- subregion_agg = data.frame(table(eval_df[,c("true_un_subregion", "year")]))
+ subregion_agg = unique(eval_df[,c("file_id","true_un_subregion", "year")])
+ subregion_agg = data.frame(table(subregion_agg[,c("true_un_subregion", "year")]))
ggplot(subregion_agg, aes(x=year, y=Freq, color=true_un_subregion, group=true_un_subregion)) +
geom_line() + geom_point() + theme_bw() +
xlab("Year of Article") +
ylab("Number of Articles (10 articles/year) with \n at least one UN Subregion Mention") +
ggtitle("Subregion Mention by Year")
- region_agg = data.frame(table(eval_df[,c("true_un_region", "year")]))
+ region_agg = unique(eval_df[,c("file_id","true_un_region", "year")])
+ region_agg = data.frame(table(region_agg[,c("true_un_region", "year")]))
ggplot(region_agg, aes(x=year, y=Freq, color=true_un_region, group=true_un_region)) +
geom_line() + geom_point() + theme_bw() +
xlab("Year of Article") +
@@ -226,4 +230,201 @@ Now lets first look at the benchmark data
```
+Ok, so we see a strong signal that US/Americas/Europe are mentioned at a much
+higher rate than other regions.
+We would like to also see this pattern in our predicted locations, but first we
+need to show that our estimations are accurate.
+Shown below are now analyses comparing our hand-annotated benchmark data
+against the fully-automated processed data.
+We would like to show that the true number of articles with a region mention,
+is highly correlated to the estimated number of articles from our full pipeline.
+
+
+First let's take a look at the prediction errors for UN Subregions
+
+```{r fig.align='center', fig.width = 15, fig.height = 15, echo=FALSE, warning=FALSE, message=F}
+
+
+ # join the df to make comparison
+ bm_loc_df$text = tolower(bm_loc_df$text)
+ raw_loc_df$text = tolower(raw_loc_df$text)
+ compare_df = merge(bm_loc_df, raw_loc_df, by=c("file_id", "text"), all.x=T)
+
+ # now we only count ONCE per article
+ compare_df = subset(compare_df, select = -c(text))
+ compare_df = unique(compare_df)
+
+ #compare per country
+ country_idx = which(colnames(compare_df) == "est_un_subregion")
+ true_country_idx = which(colnames(compare_df) == "true_un_subregion")
+ country_match = apply(compare_df, 1,
+ function(x) x[country_idx] == x[true_country_idx])
+
+ compare_df$is_country_correct = country_match
+
+ # write out confusion tables
+
+ # first need to format the levels
+ compare_df$est_un_subregion = as.factor(compare_df$est_un_subregion)
+ compare_df$true_un_subregion = as.factor(compare_df$true_un_subregion)
+
+ all_levels = unique(c(levels(compare_df$est_un_subregion),
+ levels(compare_df$true_un_subregion)))
+
+ missing_levels = setdiff(all_levels, levels(compare_df$est_un_subregion))
+ levels(compare_df$est_un_subregion) =
+ c(levels(compare_df$est_un_subregion), missing_levels)
+
+ missing_levels = setdiff(all_levels, levels(compare_df$true_un_subregion))
+ levels(compare_df$true_un_subregion) =
+ c(levels(compare_df$true_un_subregion), missing_levels)
+ compare_df$true_un_subregion = factor(compare_df$true_un_subregion,
+ levels=levels(compare_df$est_un_subregion))
+
+
+ confusion_matrix <- confusionMatrix(compare_df$est_un_subregion,
+ compare_df$true_un_subregion)
+ gg_conf = prettyConfused(compare_df$true_un_subregion, compare_df$est_un_subregion, text.scl = 5)
+ gg_conf = gg_conf + ggtitle(paste("UN Subregion Prediction Kappa:",
+ round(confusion_matrix$overall['Kappa'], 4))) +
+ theme(axis.text.x = element_text(angle = 45, vjust = 0.5, hjust=1))
+
+ gg_conf
+
+
+
+```
+
+We find that there exist errors in the prediction, but it is not completely off.
+We would like to verify that our hand annotation and pipeline results
+are at least strongly correlated.
+
+
+```{r echo=FALSE, out.width="50%", warning=FALSE, message=F}
+
+ rsq <- function (x, y) cor(x, y) ^ 2
+ rmse <- function (x, y) sqrt(mean((x-y) ^ 2))
+
+
+ pred_freq = as.data.frame(table(compare_df$est_country_code))
+ colnames(pred_freq) = c("country", "Pred_Freq")
+
+ true_freq = as.data.frame(table(compare_df$true_country_code))
+ colnames(true_freq) = c("country", "True_Freq")
+
+ freq_df = merge(pred_freq, true_freq, all=T)
+ freq_df = subset(freq_df, !country %in% c("NOT_COUNTRY", "NOT_FOUND",
+ "NAN", "NONE", "MULTI"))
+ freq_df[is.na(freq_df)] = 0
+
+ rsq_tot = round(rsq(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ rmse_tot = round(rmse(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ gg_corr_all = ggplot(freq_df, aes(x=Pred_Freq, y=True_Freq, label=country)) +
+ geom_point() + geom_abline(intercept = 0, slope = 1) +
+ theme_bw() + geom_text_repel() +
+ xlab("Predicted Frequency") +
+ ylab("True Frequency") +
+ ggtitle(paste("Pred. vs. True Country Frequencies, R-sq:", rsq_tot,
+ "RMSE:", rmse_tot))
+
+ freq_df = subset(freq_df, Pred_Freq < 20)
+ rsq_sub = round(rsq(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ rmse_sub = round(rmse(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ gg_corr_subset = ggplot(freq_df,
+ aes(x=Pred_Freq, y=True_Freq, label=country)) +
+ geom_point() + geom_abline(intercept = 0, slope = 1) +
+ theme_bw() + geom_text_repel() +
+ xlab("Predicted Frequency") +
+ ylab("True Frequency") +
+ ggtitle(paste("Excluding top 2: Pred. vs. True Country Frequencies, R-sq:",
+ rsq_sub,
+ "RMSE:", rmse_sub))
+
+ gg_corr_all
+ gg_corr_subset
+
+```
+Let's look at if subregions is any better/worse:
+
+```{r echo=FALSE, out.width="50%", warning=FALSE, message=F}
+ pred_freq = as.data.frame(table(compare_df$est_un_subregion))
+ colnames(pred_freq) = c("un_subregion", "Pred_Freq")
+
+ true_freq = as.data.frame(table(compare_df$true_un_subregion))
+ colnames(true_freq) = c("un_subregion", "True_Freq")
+
+ freq_df = merge(pred_freq, true_freq, all=T)
+ freq_df = subset(freq_df, un_subregion != "NO_EST")
+ freq_df[is.na(freq_df)] = 0
+
+ rsq_tot = round(rsq(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ rmse_tot = round(rmse(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ gg_corr_all = ggplot(freq_df, aes(x=Pred_Freq, y=True_Freq, label=un_subregion)) +
+ geom_point() + geom_abline(intercept = 0, slope = 1) +
+ theme_bw() + geom_text_repel() +
+ xlab("Predicted Frequency") +
+ ylab("True Frequency") +
+ ggtitle(paste("Pred. vs. True UN Subregion Frequencies, R-sq:", rsq_tot,
+ "RMSE:", rmse_tot))
+
+ freq_df = subset(freq_df, Pred_Freq < 60)
+ rsq_sub = round(rsq(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ rmse_sub = round(rmse(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ gg_corr_subset = ggplot(freq_df,
+ aes(x=Pred_Freq, y=True_Freq, label=un_subregion)) +
+ geom_point() + geom_abline(intercept = 0, slope = 1) +
+ theme_bw() + geom_text_repel() +
+ xlab("Predicted Frequency") +
+ ylab("True Frequency") +
+ ggtitle(paste("Excluding top 1: Pred. vs. True UN Subregion Frequencies, R-sq:",
+ rsq_sub,
+ "RMSE:", rmse_sub))
+ gg_corr_all
+ gg_corr_subset
+
+```
+
+Now, finally large regions:
+
+```{r echo=FALSE, out.width="50%", warning=FALSE, message=F}
+
+ pred_freq = as.data.frame(table(compare_df$est_un_region))
+ colnames(pred_freq) = c("un_region", "Pred_Freq")
+
+ true_freq = as.data.frame(table(compare_df$true_un_region))
+ colnames(true_freq) = c("un_region", "True_Freq")
+
+ freq_df = merge(pred_freq, true_freq, all=T)
+ freq_df = subset(freq_df, un_region != "NO_EST")
+ freq_df[is.na(freq_df)] = 0
+
+ rsq_tot = round(rsq(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ rmse_tot = round(rmse(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ gg_corr_all = ggplot(freq_df, aes(x=Pred_Freq, y=True_Freq, label=un_region)) +
+ geom_point() + geom_abline(intercept = 0, slope = 1) +
+ theme_bw() + geom_text_repel() +
+ xlab("Predicted Frequency") +
+ ylab("True Frequency") +
+ xlim(c(0,110)) + ylim(c(0,110)) +
+ ggtitle(paste("Pred. vs. True UN Region Frequencies, R-sq:", rsq_tot,
+ "RMSE:", rmse_tot))
+
+ freq_df = subset(freq_df, Pred_Freq < 60)
+ rsq_sub = round(rsq(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ rmse_sub = round(rmse(freq_df$Pred_Freq, freq_df$True_Freq), 2)
+ gg_corr_subset = ggplot(freq_df,
+ aes(x=Pred_Freq, y=True_Freq, label=un_region)) +
+ geom_point() + geom_abline(intercept = 0, slope = 1) +
+ theme_bw() + geom_text_repel() +
+ xlab("Predicted Frequency") +
+ ylab("True Frequency") +
+ xlim(c(0,20)) + ylim(c(0,20)) +
+ ggtitle(paste("Excluding top Europe+Americas: \nPred. vs. True UN Region Frequencies, R-sq:",
+ rsq_sub,
+ "RMSE:", rmse_sub))
+
+ gg_corr_all
+ gg_corr_subset
+
+```
\ No newline at end of file
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis.md b/analysis_scripts/analyze_benchmark_data/benchmark_analysis.md
index c79791e24..e60ad17da 100644
--- a/analysis_scripts/analyze_benchmark_data/benchmark_analysis.md
+++ b/analysis_scripts/analyze_benchmark_data/benchmark_analysis.md
@@ -109,7 +109,7 @@ bm_loc_file = paste(proj_dir,
bm_loc_df = read_benchmark_location_file(bm_loc_file)
raw_loc_file = paste(proj_dir,
- "/data/benchmark_data/benchmark_location_table_hand_annotated.tsv",
+ "/data/benchmark_data/benchmark_location_table_raw.tsv",
sep="")
raw_loc_df = read_corenlp_location_files(raw_loc_file)
@@ -121,54 +121,70 @@ The location data tries to find an organization, state, province, or country. Af
head(bm_loc_df)
```
- ## file_id text
- ## 1 4641259a.html National Center for Genome Resources in Santa Fe
- ## 2 4641259a.html University of California
- ## 3 4641259a.html Yale University
- ## 4 4641259a.html US
- ## 5 4641259a.html New Mexico
- ## 6 4641259a.html Connecticut
- ## ner true_country true_un_region
- ## 1 ORGANIZATION United States of America (USA) Americas
- ## 2 ORGANIZATION United States of America (USA) Americas
- ## 3 ORGANIZATION United States of America (USA) Americas
- ## 4 COUNTRY United States of America (USA) Americas
- ## 5 STATE_OR_PROVINCE United States of America (USA) Americas
- ## 6 STATE_OR_PROVINCE United States of America (USA) Americas
- ## true_un_subregion
- ## 1 Northern America
- ## 2 Northern America
- ## 3 Northern America
- ## 4 Northern America
- ## 5 Northern America
- ## 6 Northern America
+ ## true_country_code file_id
+ ## 1 ar d41586-020-01756-0
+ ## 2 ar d41586-020-01756-0
+ ## 3 au climatologists-to-physicists-your-planet-needs-you-1.17270
+ ## 4 au climatologists-to-physicists-your-planet-needs-you-1.17270
+ ## 5 au d41586-020-00166-6
+ ## 6 au d41586-020-00166-6
+ ## text ner true_country true_un_region
+ ## 1 Argentina COUNTRY Argentina Americas
+ ## 2 Sinergium Biotech ORGANIZATION Argentina Americas
+ ## 3 Monash University ORGANIZATION Australia Oceania
+ ## 4 Australia COUNTRY Australia Oceania
+ ## 5 University of New South Wales ORGANIZATION Australia Oceania
+ ## 6 Australia COUNTRY Australia Oceania
+ ## true_un_subregion
+ ## 1 South America
+ ## 2 South America
+ ## 3 Australia and New Zealand
+ ## 4 Australia and New Zealand
+ ## 5 Australia and New Zealand
+ ## 6 Australia and New Zealand
``` r
head(raw_loc_df)
```
- ## file_id text
- ## 1 4641259a.html National Center for Genome Resources in Santa Fe
- ## 2 4641259a.html University of California
- ## 3 4641259a.html Yale University
- ## 4 4641259a.html US
- ## 5 4641259a.html New Mexico
- ## 6 4641259a.html Connecticut
- ## ner est_country est_un_region
- ## 1 ORGANIZATION United States of America (USA) Americas
- ## 2 ORGANIZATION United States of America (USA) Americas
- ## 3 ORGANIZATION United States of America (USA) Americas
- ## 4 COUNTRY United States of America (USA) Americas
- ## 5 STATE_OR_PROVINCE United States of America (USA) Americas
- ## 6 STATE_OR_PROVINCE United States of America (USA) Americas
- ## est_un_subregion
- ## 1 Northern America
- ## 2 Northern America
- ## 3 Northern America
- ## 4 Northern America
- ## 5 Northern America
- ## 6 Northern America
-
-Similar to before we will match columns baed on their names, in `raw_loc_df` it has `est_` columns and in `bm_loc_df` is has matching `true_` columns
+ ## est_country_code file_id
+ ## 1 ao us-science-academies-take-on-human-genome-editing-1.17581
+ ## 2 ar d41586-020-01756-0
+ ## 3 au d41586-020-00166-6
+ ## 4 au d41586-020-02835-y
+ ## 5 au d41586-020-02835-y
+ ## 6 au d41586-020-02835-y
+ ## text ner
+ ## 1 nam ORGANIZATION
+ ## 2 argentina COUNTRY
+ ## 3 australia COUNTRY
+ ## 4 csiro ORGANIZATION
+ ## 5 commonwealth scientific and industrial research organisation ORGANIZATION
+ ## 6 james cook university ORGANIZATION
+ ## est_country est_un_region est_un_subregion
+ ## 1 Angola Africa Middle Africa
+ ## 2 Argentina Americas South America
+ ## 3 Australia Oceania Australia and New Zealand
+ ## 4 Australia Oceania Australia and New Zealand
+ ## 5 Australia Oceania Australia and New Zealand
+ ## 6 Australia Oceania Australia and New Zealand
+
+Similar to before we will match columns based on their names, in `raw_loc_df` it has `est_` columns and in `bm_loc_df` is has matching `true_` columns
Now lets first look at the benchmark data ![](benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-1.png)![](benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-2.png)![](benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-3.png)
+
+Ok, so we see a strong signal that US/Americas/Europe are mentioned at a much higher rate than other regions. We would like to also see this pattern in our predicted locations, but first we need to show that our estimations are accurate. Shown below are now analyses comparing our hand-annotated benchmark data against the fully-automated processed data. We would like to show that the true number of articles with a region mention, is highly correlated to the estimated number of articles from our full pipeline.
+
+First let's take a look at the prediction errors for UN Subregions
+
+
+
+We find that there exist errors in the prediction, but it is not completely off. We would like to verify that our hand annotation and pipeline results are at least strongly correlated.
+
+ Let's look at if subregions is any better/worse:
+
+
+
+Now, finally large regions:
+
+
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-10-1.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-10-1.png
new file mode 100644
index 000000000..1fa50a1d8
Binary files /dev/null and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-10-1.png differ
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-11-1.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-11-1.png
new file mode 100644
index 000000000..a965d9704
Binary files /dev/null and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-11-1.png differ
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-11-2.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-11-2.png
new file mode 100644
index 000000000..f5ef8b812
Binary files /dev/null and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-11-2.png differ
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-12-1.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-12-1.png
new file mode 100644
index 000000000..53af533b7
Binary files /dev/null and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-12-1.png differ
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-12-2.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-12-2.png
new file mode 100644
index 000000000..a8888511d
Binary files /dev/null and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-12-2.png differ
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-13-1.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-13-1.png
new file mode 100644
index 000000000..c56f79f15
Binary files /dev/null and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-13-1.png differ
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-13-2.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-13-2.png
new file mode 100644
index 000000000..6cf098349
Binary files /dev/null and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-13-2.png differ
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-1.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-1.png
index 5e799556e..33309dd00 100644
Binary files a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-1.png and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-1.png differ
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-2.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-2.png
index 78912da8c..f3ca6e72d 100644
Binary files a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-2.png and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-2.png differ
diff --git a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-3.png b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-3.png
index 5a5971faf..920ea1087 100644
Binary files a/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-3.png and b/analysis_scripts/analyze_benchmark_data/benchmark_analysis_files/figure-markdown_github/unnamed-chunk-9-3.png differ
diff --git a/analysis_scripts/analyze_quote_data/gender_analysis_all_years.md b/analysis_scripts/analyze_quote_data/gender_analysis_all_years.md
index c59fc3df2..a2e560cb9 100644
--- a/analysis_scripts/analyze_quote_data/gender_analysis_all_years.md
+++ b/analysis_scripts/analyze_quote_data/gender_analysis_all_years.md
@@ -43,26 +43,26 @@ head(bm_quote_df)
```
## file_id year est_speaker est_gender canonical_speaker
- ## 1 4641259a.html 2010 Sergio Baranzini MALE Unknown
- ## 2 4641259a.html 2010 Daniel Geschwind MALE Geschwind
- ## 3 4641259a.html 2010 Sergio Baranzini MALE Unknown
+ ## 1 4641259a.html 2010 Sergio Baranzini MALE Stephen Kingsmore
+ ## 2 4641259a.html 2010 Sergio Baranzini MALE Unknown
+ ## 3 4641259a.html 2010 Daniel Geschwind MALE Geschwind
## 4 4641259a.html 2010 Stephen Kingsmore MALE Stephen Kingsmore
- ## 5 4641259a.html 2010 Stephen Kingsmore MALE Stephen Kingsmore
- ## 6 4641259a.html 2010 Sergio Baranzini MALE Stephen Kingsmore
- ## partial_name
- ## 1 Sergio Baranzini
- ## 2 Geschwind
- ## 3 Baranzini
- ## 4 Kingsmore
- ## 5 Kingsmore
- ## 6 Baranzini
- ## quote
- ## 1 "it is an incredibly important negative"
- ## 2 "What they've done here is create a very nice template for others to follow,"
- ## 3 "It isn't just sequence — they went from sequence to epigenome to expression. That's what really makes [the study] something special."
- ## 4 "If we sequenced another dozen twin pairs we could make this much more definitive,"
- ## 5 "There had to be some trigger that caused one to develop it and the other not,"
- ## 6 "we really ought to look at sequencing of the brain tissue,"
+ ## 5 4641259a.html 2010 Sergio Baranzini MALE Sergio Baranzini
+ ## 6 4641259a.html 2010 Stephen Kingsmore MALE Stephen Kingsmore
+ ## partial_name
+ ## 1 Baranzini
+ ## 2 Baranzini
+ ## 3 Geschwind
+ ## 4 Kingsmore
+ ## 5 Baranzini
+ ## 6 Kingsmore
+ ## quote
+ ## 1 we really ought to look at sequencing of the brain tissue,
+ ## 2 It isn't just sequence — they went from sequence to epigenome to expression. That's what really makes [the study] something special.
+ ## 3 What they've done here is create a very nice template for others to follow,
+ ## 4 There had to be some trigger that caused one to develop it and the other not,
+ ## 5 one was exposed to the perfect combination of environmental triggers
+ ## 6 Both twins came into the world with the same set of high risks for developing MS,
Now we read in the full data for the same years.
@@ -84,26 +84,26 @@ head(full_quote_df)
```
## file_id est_speaker est_gender canonical_speaker
- ## 2 news.2010.122.html Aaron Krochmal MALE Aaron Krochmal
- ## 3 463722a.html Aaron Ciechanover MALE biochemist
- ## 4 463722a.html Aaron Ciechanover MALE biochemist
- ## 5 news.2010.122.html Aaron Krochmal MALE Aaron Krochmal
- ## 6 news.2010.370.html Abass Alavi MALE Abass Alavi
- ## 7 news.2010.383.html Abbott MALE Zambetti
+ ## 2 463722a.html Aaron Ciechanover MALE biochemist
+ ## 3 news.2010.122.html Aaron Krochmal MALE Aaron Krochmal
+ ## 4 4631004a.html Aaron Kelley MALE Aaron Kelley
+ ## 5 463722a.html Aaron Ciechanover MALE biochemist
+ ## 6 news.2010.122.html Aaron Krochmal MALE Aaron Krochmal
+ ## 7 news.2010.370.html Abass Alavi MALE Abass Alavi
## partial_name
- ## 2 Aaron Krochmal
- ## 3 Aaron Ciechanover
- ## 4 Aaron Ciechanover
- ## 5 Aaron Krochmal
- ## 6 Abass Alavi
- ## 7 Zambetti
- ## quote
- ## 2 "Although aspects of the findings contradict known behavioural and physiological work, the use of molecular genetic techniques is a new step in understanding how the facial pits work."
- ## 3 "It's the only programme that brings together people speaking so many different languages and gets them to work productively."
- ## 4 "It would be a terrible mistake to go in this direction,"
- ## 5 "The authors used elegant molecular techniques to confirm an idea long substantiated by physiological and behavioural data,"
- ## 6 "This is a big lesson for all the major institutions that they are going to have to tighten their internal reviews."
- ## 7 "But it's a keystone finding,"
+ ## 2 Aaron Ciechanover
+ ## 3 Aaron Krochmal
+ ## 4 Aaron Kelley
+ ## 5 Aaron Ciechanover
+ ## 6 Aaron Krochmal
+ ## 7 Abass Alavi
+ ## quote
+ ## 2 It would be a terrible mistake to go in this direction,
+ ## 3 The authors used elegant molecular techniques to confirm an idea long substantiated by physiological and behavioural data,
+ ## 4 Enzyme costs are not the number-one concern any more,
+ ## 5 It's the only programme that brings together people speaking so many different languages and gets them to work productively.
+ ## 6 Although aspects of the findings contradict known behavioural and physiological work, the use of molecular genetic techniques is a new step in understanding how the facial pits work.
+ ## 7 This is a big lesson for all the major institutions that they are going to have to tighten their internal reviews.
## year
## 2 2010
## 3 2010
diff --git a/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-1.png b/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-1.png
index e5d1735d4..8b60b5b55 100644
Binary files a/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-1.png and b/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-1.png differ
diff --git a/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-1.png b/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-1.png
index a81c95b31..ff028dfc3 100644
Binary files a/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-1.png and b/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-1.png differ
diff --git a/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-2.png b/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-2.png
index a35dd90c9..b68b2091a 100644
Binary files a/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-2.png and b/analysis_scripts/analyze_quote_data/gender_analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-2.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years.Rmd b/analysis_scripts/analyze_quote_data/location-analysis_all_years.Rmd
index 21e7c6b61..d570e5858 100644
--- a/analysis_scripts/analyze_quote_data/location-analysis_all_years.Rmd
+++ b/analysis_scripts/analyze_quote_data/location-analysis_all_years.Rmd
@@ -11,6 +11,8 @@ knitr::opts_chunk$set(echo = TRUE)
require(data.table)
require(here)
require(ggplot2)
+require(ggrepel)
+require(ggpubr)
require(caret)
proj_dir = here()
@@ -29,3 +31,256 @@ The data we will be working with are the following:
**All analysis shown below depends on the functions described in `/analysis_scripts/analysis_utils.R`**
+
+## Check Benchmark Consistency
+
+We would like to make sure that our benchmark data is representative of our complete dataset, so let's look at some quote stats to make sure.
+
+### reading in the quote data
+
+First we read in the benchmark data
+```{r}
+
+# get the project directory, everything is set relative to this
+proj_dir = here()
+
+# read in the benchmark quote table
+bm_loc_file = paste(proj_dir,
+ "/data/benchmark_data/benchmark_location_table_raw.tsv",
+ sep="")
+
+bm_loc_df = read_corenlp_location_files(bm_loc_file)
+
+# add the year annotation
+year_idx_file = paste(proj_dir,
+ "/data/benchmark_data/coreNLP_input/fileID_year.tsv",
+ sep="")
+year_df = data.frame(fread(year_idx_file))
+bm_loc_df = merge(year_df, bm_loc_df)
+
+
+head(bm_loc_df)
+
+
+```
+
+Now we read in the full data for the same years.
+```{r}
+
+# read in the full year quote table for 2010, 2015-2020
+full_loc_df = NA
+for(curr_year in c(2010, 2015:2020)){
+ loc_file = paste(proj_dir,
+ "/data/scraped_data/location_table_raw_", curr_year, ".tsv",
+ sep="")
+ loc_df = read_corenlp_location_files(loc_file)
+ loc_df$year = curr_year
+
+ full_loc_df = rbind(full_loc_df, loc_df)
+}
+full_loc_df = full_loc_df[-1,]
+
+full_loc_df = subset(full_loc_df, est_un_region != "" &
+ est_un_subregion != "" &
+ est_un_region != "NO_EST" &
+ est_un_subregion != "NO_EST")
+
+head(full_loc_df)
+
+
+```
+
+Now we join the tables together for comparison.
+```{r}
+
+full_loc_df$is_benchmark = "full_data"
+bm_loc_df$is_benchmark = "benchmark"
+
+bm_full_loc_df = rbind(subset(full_loc_df, year %in% c("2010", "2015", "2020")),
+ bm_loc_df)
+bm_full_loc_df = subset(bm_full_loc_df, est_un_region != "" &
+ est_un_subregion != "" &
+ est_un_region != "NO_EST" &
+ est_un_subregion != "NO_EST")
+
+```
+
+### compare benchmark and non-benchmark data
+
+Now lets check how well the benchmark proportions match the full dataset proportions.
+The number of articles per year in each benchmark set is 10, the total number of articles
+in the year is between 400-1000.
+Since the number of articles in the benchmark set is very small, we don't expect
+exact consistency between the benchmark and total data sets.
+
+#### Lets look at the largest region definition first: UN region
+```{r fig.align='center', fig.width = 15, fig.height = 10, echo=FALSE, warning=FALSE, message=F}
+
+
+ num_articles = unique(bm_full_loc_df[,c("is_benchmark", "year",
+ "file_id")])
+ num_articles = num_articles %>%
+ group_by(is_benchmark, year) %>%
+ summarize(n())
+ colnames(num_articles) = c("is_benchmark", "year",
+ "num_total_articles")
+
+ # function for aggregating over the region of interest
+ get_aggr_region <- function(bm_full_loc_df, region_col_id, num_articles){
+
+ region_df = unique(bm_full_loc_df[,c("is_benchmark", "year",
+ region_col_id, "file_id")])
+ colnames(region_df)[3] = "est_region"
+ region_df = region_df %>%
+ group_by(is_benchmark, year, est_region) %>%
+ summarize(n())
+ colnames(region_df) = c("is_benchmark", "year",
+ "est_region", "num_articles")
+
+ region_df = merge(num_articles, region_df)
+ region_df$prop_mentioned = region_df$num_articles / region_df$num_total_articles
+
+ # plotting labels
+ region_df$label = region_df$est_region
+ region_df$label[region_df$is_benchmark == "benchmark"] = ""
+
+ colnames(region_df)[4] = region_col_id
+
+
+ return(region_df)
+
+ }
+
+ un_region_df = get_aggr_region(bm_full_loc_df, region_col_id="est_un_region",
+ num_articles)
+ ggplot(un_region_df, aes(x=is_benchmark, y=prop_mentioned,
+ color = est_un_region, fill=est_un_region,
+ label = label)) +
+ geom_point() + geom_line(aes(group=est_un_region)) +
+ geom_text_repel() + facet_grid(~year) + theme_bw() +
+ xlab("Year of Article") +
+ ylab("Fraction Articles with mention of UN Region ") +
+ ggtitle("Proportion of articles with at least 1 mention of a UN Region") +
+ scale_fill_brewer(palette="Set2") + ylim(c(0, 1.1)) +
+ theme(legend.position = "none")
+
+
+
+```
+
+#### Lets look at the UN Subregion level
+```{r fig.align='center', fig.width = 15, fig.height = 10, echo=FALSE, warning=FALSE, message=F}
+
+
+ un_subregion_df = get_aggr_region(bm_full_loc_df, region_col_id="est_un_subregion",
+ num_articles)
+ ggplot(un_subregion_df, aes(x=is_benchmark, y=prop_mentioned,
+ color = est_un_subregion, fill=est_un_subregion,
+ label = label)) +
+ geom_point() + geom_line(aes(group=est_un_subregion)) +
+ geom_text_repel() + facet_grid(~year) + theme_bw() +
+ xlab("Year of Article") +
+ ylab("Fraction Articles with mention of UN Subregion ") +
+ ggtitle("Proportion of articles with at least 1 mention of a UN Subregion") +
+ scale_fill_brewer(palette="Set2") + ylim(c(0, 1.1)) +
+ theme(legend.position = "none")
+
+ prop_region = subset(un_subregion_df, prop_mentioned < 0.31 )
+ ggplot(subset(un_subregion_df, est_un_subregion %in% prop_region$est_un_subregion),
+ aes(x=is_benchmark, y=prop_mentioned,
+ color = est_un_subregion, fill=est_un_subregion,
+ label = label)) +
+ geom_point() + geom_line(aes(group=est_un_subregion)) +
+ geom_text_repel() + facet_grid(~year) + theme_bw() +
+ xlab("Year of Article") +
+ ylab("Fraction Articles with mention of UN Subregion ") +
+ ggtitle("Proportion of articles with at least 1 mention of a UN Subregion
+ subsetted to having a proportion 0.3 or lower") +
+ scale_fill_brewer(palette="Set2") +
+ theme(legend.position = "none")
+
+
+```
+
+#### Now Finally the Country Code level, except divided by subregion
+```{r fig.align='center', fig.width = 15, fig.height = 10, echo=FALSE, warning=FALSE, message=F}
+
+
+ un_cc_df = get_aggr_region(bm_full_loc_df, region_col_id="est_country_code",
+ num_articles)
+ subregion_ref = unique(bm_full_loc_df[,c("est_country_code", "est_un_subregion")])
+
+ bg_obs = subset(un_cc_df, is_benchmark == "benchmark" &
+ num_articles > 0)
+ un_cc_df = subset(un_cc_df, est_country_code %in% bg_obs$est_country_code)
+
+ un_cc_df = merge(un_cc_df, subregion_ref)
+
+ all_gg = list()
+ for(curr_subregion in unique(un_cc_df$est_un_subregion)){
+
+ plot_df = subset(un_cc_df, est_un_subregion == curr_subregion)
+ gg = ggplot(plot_df, aes(x=is_benchmark, y=prop_mentioned,
+ color = est_country_code, fill=est_country_code,
+ label = label)) +
+ geom_point() + geom_line(aes(group=est_country_code)) +
+ geom_text_repel() +
+ facet_grid(~year) + theme_bw() +
+ xlab("Year of Article") +
+ ylab("Fraction Articles with mention of Country") +
+ ggtitle(paste(curr_subregion, " -- Proportion of articles with at least 1 mention of a Country on BG")) +
+ theme(legend.position = "none")
+ all_gg[[curr_subregion]] = gg
+ }
+ ggarrange(plotlist=all_gg, ncol = 2)
+
+
+```
+
+### Compare locations over all years
+
+Now lets see the proportion of articles on the full dataset that mention each UN Subregion.
+This is shown in the next 2 plots: the top plot is all UN subregions and the bottom plot
+removes the Northern American and Northern Europe subregions in order to get a
+clearer look at the change in other subregions.
+
+```{r fig.align='center', fig.width = 15, fig.height = 10, echo=FALSE, warning=FALSE, message=F}
+
+ tot_num_articles = unique(full_loc_df[,c("is_benchmark", "year",
+ "file_id")])
+ tot_num_articles = tot_num_articles %>%
+ group_by(is_benchmark, year) %>%
+ summarize(n())
+ colnames(tot_num_articles) = c("is_benchmark", "year",
+ "num_total_articles")
+
+ un_subregion_df = get_aggr_region(full_loc_df, region_col_id="est_un_subregion",
+ tot_num_articles)
+ un_subregion_df$label[un_subregion_df$year != "2020"] = ""
+ ggplot(un_subregion_df, aes(x=as.factor(year), y=prop_mentioned,
+ color = est_un_subregion, fill=est_un_subregion,
+ label = label)) +
+ geom_point() + geom_line(aes(group=est_un_subregion)) +
+ geom_text_repel() + theme_bw() +
+ xlab("Year of Article") +
+ ylab("Fraction Articles with mention of UN Subregion ") +
+ ggtitle("Proportion of articles with at least 1 mention of a UN Subregion") +
+ scale_fill_brewer(palette="Set2") + ylim(c(0, 1.1)) +
+ theme(legend.position = "none")
+
+ prop_region = subset(un_subregion_df, prop_mentioned < 0.2 )
+ ggplot(subset(un_subregion_df, est_un_subregion %in% prop_region$est_un_subregion),
+ aes(x=as.factor(year), y=prop_mentioned,
+ color = est_un_subregion, fill=est_un_subregion,
+ label = label)) +
+ geom_point() + geom_line(aes(group=est_un_subregion)) +
+ geom_text_repel() + theme_bw() +
+ xlab("Year of Article") +
+ ylab("Fraction Articles with mention of UN Subregion ") +
+ ggtitle("Proportion of articles with at least 1 mention of a UN Subregion
+ subsetted to having a proportion 0.2 or lower") +
+ scale_fill_brewer(palette="Set2") +
+ theme(legend.position = "none")
+
+
+```
\ No newline at end of file
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years.md b/analysis_scripts/analyze_quote_data/location-analysis_all_years.md
new file mode 100644
index 000000000..dba961cbc
--- /dev/null
+++ b/analysis_scripts/analyze_quote_data/location-analysis_all_years.md
@@ -0,0 +1,234 @@
+location\_analysis
+================
+Natalie Davidson
+1/22/2021
+
+## Nature News Location Bias
+
+This document is a working analysis of the quotes extracted from Nature News content to see if there are differences in gender representation. The data we will be working with are the following:
+
+1. `./data/benchmark_data/benchmark_quote_table_raw.tsv` is the output after scraping a randomly selected set of 10 articles from 2010, 2015, or 2020 (`./nature_news_scraper/run_scrape_benchmark.sh`) then running it through coreNLP with additional processing (`./process_scraped_data/run_process_target_year.sh`)
+2. `./data/scraped_data/quote_table_raw_20*.tsv` are the output after scraping all articles from a year between 2001 2020 (`./nature_news_scraper/run_scrape_benchmark.sh`) then running it through coreNLP with additional processing (`./process_scraped_data/run_process_target_year.sh`)
+
+**All analysis shown below depends on the functions described in `/analysis_scripts/analysis_utils.R`**
+
+## Check Benchmark Consistency
+
+We would like to make sure that our benchmark data is representative of our complete dataset, so let's look at some quote stats to make sure.
+
+### reading in the quote data
+
+First we read in the benchmark data
+
+``` r
+# get the project directory, everything is set relative to this
+proj_dir = here()
+
+# read in the benchmark quote table
+bm_loc_file = paste(proj_dir,
+ "/data/benchmark_data/benchmark_location_table_raw.tsv",
+ sep="")
+
+bm_loc_df = read_corenlp_location_files(bm_loc_file)
+```
+
+ ## Warning in fread(country_file): Detected 12 column names but the data has 13
+ ## columns (i.e. invalid file). Added 1 extra default column name for the first
+ ## column which is guessed to be row names or an index. Use setnames() afterwards
+ ## if this guess is not correct, or fix the file write command that created the
+ ## file to create a valid file.
+
+``` r
+# add the year annotation
+year_idx_file = paste(proj_dir,
+ "/data/benchmark_data/coreNLP_input/fileID_year.tsv",
+ sep="")
+year_df = data.frame(fread(year_idx_file))
+bm_loc_df = merge(year_df, bm_loc_df)
+
+
+head(bm_loc_df)
+```
+
+ ## file_id year est_country_code
+ ## 1 4641259a.html 2010 us
+ ## 2 4641259a.html 2010 us
+ ## 3 4641259a.html 2010 us
+ ## 4 4641259a.html 2010 us
+ ## 5 4641259a.html 2010 us
+ ## 6 4641259a.html 2010 us
+ ## text ner
+ ## 1 new mexico STATE_OR_PROVINCE
+ ## 2 connecticut STATE_OR_PROVINCE
+ ## 3 ms STATE_OR_PROVINCE
+ ## 4 national center for genome resources in santa fe ORGANIZATION
+ ## 5 us COUNTRY
+ ## 6 university of california ORGANIZATION
+ ## est_country est_un_region est_un_subregion
+ ## 1 United States Americas Northern America
+ ## 2 United States Americas Northern America
+ ## 3 United States Americas Northern America
+ ## 4 United States Americas Northern America
+ ## 5 United States Americas Northern America
+ ## 6 United States Americas Northern America
+
+Now we read in the full data for the same years.
+
+``` r
+# read in the full year quote table for 2010, 2015, and 2020
+full_loc_df = NA
+for(curr_year in c(2010, 2015:2020)){
+ loc_file = paste(proj_dir,
+ "/data/scraped_data/location_table_raw_", curr_year, ".tsv",
+ sep="")
+ loc_df = read_corenlp_location_files(loc_file)
+ loc_df$year = curr_year
+
+ full_loc_df = rbind(full_loc_df, loc_df)
+}
+```
+
+ ## Warning in fread(country_file): Detected 12 column names but the data has 13
+ ## columns (i.e. invalid file). Added 1 extra default column name for the first
+ ## column which is guessed to be row names or an index. Use setnames() afterwards
+ ## if this guess is not correct, or fix the file write command that created the
+ ## file to create a valid file.
+
+ ## Warning in fread(country_file): Detected 12 column names but the data has 13
+ ## columns (i.e. invalid file). Added 1 extra default column name for the first
+ ## column which is guessed to be row names or an index. Use setnames() afterwards
+ ## if this guess is not correct, or fix the file write command that created the
+ ## file to create a valid file.
+
+ ## Warning in fread(country_file): Detected 12 column names but the data has 13
+ ## columns (i.e. invalid file). Added 1 extra default column name for the first
+ ## column which is guessed to be row names or an index. Use setnames() afterwards
+ ## if this guess is not correct, or fix the file write command that created the
+ ## file to create a valid file.
+
+ ## Warning in fread(country_file): Detected 12 column names but the data has 13
+ ## columns (i.e. invalid file). Added 1 extra default column name for the first
+ ## column which is guessed to be row names or an index. Use setnames() afterwards
+ ## if this guess is not correct, or fix the file write command that created the
+ ## file to create a valid file.
+
+ ## Warning in fread(country_file): Detected 12 column names but the data has 13
+ ## columns (i.e. invalid file). Added 1 extra default column name for the first
+ ## column which is guessed to be row names or an index. Use setnames() afterwards
+ ## if this guess is not correct, or fix the file write command that created the
+ ## file to create a valid file.
+
+ ## Warning in fread(country_file): Detected 12 column names but the data has 13
+ ## columns (i.e. invalid file). Added 1 extra default column name for the first
+ ## column which is guessed to be row names or an index. Use setnames() afterwards
+ ## if this guess is not correct, or fix the file write command that created the
+ ## file to create a valid file.
+
+ ## Warning in fread(country_file): Detected 12 column names but the data has 13
+ ## columns (i.e. invalid file). Added 1 extra default column name for the first
+ ## column which is guessed to be row names or an index. Use setnames() afterwards
+ ## if this guess is not correct, or fix the file write command that created the
+ ## file to create a valid file.
+
+``` r
+full_loc_df = full_loc_df[-1,]
+
+full_loc_df = subset(full_loc_df, est_un_region != "" &
+ est_un_subregion != "" &
+ est_un_region != "NO_EST" &
+ est_un_subregion != "NO_EST")
+
+head(full_loc_df)
+```
+
+ ## est_country_code file_id text
+ ## 2 ae news.2010.647.html rochester institute of technology
+ ## 3 ae news.2010.491.html rochester institute of technology
+ ## 4 ae 468609a.html ias
+ ## 5 af 464014b.html afghanistan
+ ## 6 af news.2010.684.html afghanistan
+ ## 7 af 465990a.html afghanistan
+ ## ner est_country est_un_region est_un_subregion year
+ ## 2 ORGANIZATION United Arab Emirates Asia Western Asia 2010
+ ## 3 ORGANIZATION United Arab Emirates Asia Western Asia 2010
+ ## 4 ORGANIZATION United Arab Emirates Asia Western Asia 2010
+ ## 5 COUNTRY Afghanistan Asia Southern Asia 2010
+ ## 6 COUNTRY Afghanistan Asia Southern Asia 2010
+ ## 7 COUNTRY Afghanistan Asia Southern Asia 2010
+
+Now we join the tables together for comparison.
+
+``` r
+full_loc_df$is_benchmark = "full_data"
+bm_loc_df$is_benchmark = "benchmark"
+
+bm_full_loc_df = rbind(subset(full_loc_df, year %in% c("2010", "2015", "2020")),
+ bm_loc_df)
+bm_full_loc_df = subset(bm_full_loc_df, est_un_region != "" &
+ est_un_subregion != "" &
+ est_un_region != "NO_EST" &
+ est_un_subregion != "NO_EST")
+```
+
+### compare benchmark and non-benchmark data
+
+Now lets check how well the benchmark proportions match the full dataset proportions. The number of articles per year in each benchmark set is 10, the total number of articles in the year is between 400-1000. Since the number of articles in the benchmark set is very small, we don't expect exact consistency between the benchmark and total data sets.
+
+#### Lets look at the largest region definition first: UN region
+
+
+
+#### Lets look at the UN Subregion level
+
+
+
+#### Now Finally the Country Code level, except divided by subregion
+
+ ## $`1`
+
+
+
+ ##
+ ## $`2`
+
+
+
+ ##
+ ## $`3`
+
+
+
+ ##
+ ## $`4`
+
+
+
+ ##
+ ## $`5`
+
+
+
+ ##
+ ## $`6`
+
+
+
+ ##
+ ## $`7`
+
+
+
+ ##
+ ## $`8`
+
+
+
+ ##
+ ## attr(,"class")
+ ## [1] "list" "ggarrange"
+
+### Compare locations over all years
+
+Now lets see the proportion of articles that mention each UN Subregion.
+
+
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-1.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-1.png
new file mode 100644
index 000000000..090032496
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-1.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-2.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-2.png
new file mode 100644
index 000000000..115fde454
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-2.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-3.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-3.png
new file mode 100644
index 000000000..e0273eb21
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-4-3.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-1.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-1.png
new file mode 100644
index 000000000..326b13537
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-1.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-2.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-2.png
new file mode 100644
index 000000000..b072b60ac
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-5-2.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-1.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-1.png
new file mode 100644
index 000000000..0fcba63ac
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-1.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-10.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-10.png
new file mode 100644
index 000000000..8ff89aae9
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-10.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-11.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-11.png
new file mode 100644
index 000000000..b707ffadd
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-11.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-2.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-2.png
new file mode 100644
index 000000000..4feff6c42
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-2.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-3.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-3.png
new file mode 100644
index 000000000..9fed8e320
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-3.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-4.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-4.png
new file mode 100644
index 000000000..e44e9ca96
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-4.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-5.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-5.png
new file mode 100644
index 000000000..0154f185d
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-5.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-6.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-6.png
new file mode 100644
index 000000000..69382ca15
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-6.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-7.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-7.png
new file mode 100644
index 000000000..f3ea9c90a
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-7.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-8.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-8.png
new file mode 100644
index 000000000..75833827f
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-8.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-9.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-9.png
new file mode 100644
index 000000000..445773541
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-6-9.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-7-1.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-7-1.png
new file mode 100644
index 000000000..cf24fe1cb
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-7-1.png differ
diff --git a/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-7-2.png b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-7-2.png
new file mode 100644
index 000000000..97a164b04
Binary files /dev/null and b/analysis_scripts/analyze_quote_data/location-analysis_all_years_files/figure-markdown_github/unnamed-chunk-7-2.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc.Rmd b/analysis_scripts/qc_scripts/pipeline_qc.Rmd
index c8a0f4b55..bbd0c5a1d 100644
--- a/analysis_scripts/qc_scripts/pipeline_qc.Rmd
+++ b/analysis_scripts/qc_scripts/pipeline_qc.Rmd
@@ -346,6 +346,8 @@ for(curr_dir in pipeline_3_dir){
ner_df = get_ner(json_res)
if(length(ner_df) != 0){
+ ner_df$text = tolower(ner_df$text)
+
ner_locs_df = subset(ner_df, ner %in% c("ORGANIZATION",
"COUNTRY",
"STATE_OR_PROVINCE"))
@@ -512,7 +514,8 @@ loc_stats_df = data.frame(loc_stats_df)
#### plotting quote stats
Between pipeline step 3 and 4 we are predicting the genders of speakers using genderize.io.
-So we expect almost exactly the same number of quotes and length of quotes.
+So we expect exactly the same number of quotes and almost exactly the same length of quotes
+(unicode characters + whitespace editing happens in step 4).
We also expect that the number of UNKNOWN gendered speakers typically decrease,
and the number of MALE/FEMALE speakers may increase.
This is not a completely 1:1 measurement. Pipeline level 3 only identifies the
@@ -574,7 +577,7 @@ p4_sum_quotes = ggplot(sum_length_quotes, aes(x=year, y=diff)) +
# for the rest of the gender plots we will be filtering in the same way
# so lets make a function
-gender_summary <- function(in_df, filter_str, out_name, compare_df){
+diff_summary <- function(in_df, filter_str, out_name, compare_df){
filt_table = in_df %>%
filter(gender == filter_str) %>%
group_by(file_id, year) %>%
@@ -606,34 +609,34 @@ gender_summary <- function(in_df, filter_str, out_name, compare_df){
}
# num males
-num_males = gender_summary(quote_stats_df, "MALE", "num_males",
+num_males = diff_summary(quote_stats_df, "MALE", "num_males",
article_stats_step3_df)
p4_males = ggplot(num_males, aes(x=year.x, y=diff)) +
theme_bw() +
- geom_violin() + geom_jitter(alpha=0.2) +
+ geom_violin() + geom_jitter(alpha=0.2, height=0) +
xlab("Year of Article") + ylab("diff # male quotes") +
- ggtitle("number of male quotes per article in P4 - P3")
+ ggtitle("number of male quotes per article in P4 - P3 Male NERs")
# num females
-num_females = gender_summary(quote_stats_df, "FEMALE", "num_females",
+num_females = diff_summary(quote_stats_df, "FEMALE", "num_females",
article_stats_step3_df)
p4_females = ggplot(num_females, aes(x=year.x, y=diff)) +
theme_bw() +
- geom_violin() + geom_jitter(alpha=0.2) +
+ geom_violin() + geom_jitter(alpha=0.2, height=0) +
xlab("Year of Article") + ylab("diff # female quotes") +
- ggtitle("number of female quotes per article in P4 - P3")
+ ggtitle("number of female quotes per article in P4 - P3 Female NERs")
# num unknown
-num_unknown = gender_summary(quote_stats_df, "UNKNOWN", "num_unknown",
+num_unknown = diff_summary(quote_stats_df, "UNKNOWN", "num_unknown",
article_stats_step3_df)
p4_unknown = ggplot(num_unknown, aes(x=year.x, y=diff)) +
- geom_violin() + theme_bw() + geom_jitter(alpha=0.2) +
+ geom_violin() + theme_bw() + geom_jitter(alpha=0.2, height=0) +
xlab("Year of Article") + ylab("diff # unknown quotes") +
- ggtitle("number of unknown gender quotes per article in P4 - P3")
+ ggtitle("number of unknown gender quotes per article in P4 - P3 Unknown NERs")
@@ -654,51 +657,66 @@ p4_unknown
# now plot the stats
require(dplyr)
-
-# for the location plots we will be filtering in the same way
-# so lets make a function
-loc_summary <- function(in_df, filter_str, out_name, compare_df){
+diff_summary <- function(in_df, filter_str, out_name, compare_df){
filt_table = in_df %>%
filter(ner == filter_str) %>%
group_by(file_id, year) %>%
summarize(n())
filt_table = data.frame(filt_table)
- colnames(filt_table)[3] = out_name
+ out_name_p4 = paste(out_name, "p4", sep="_")
+ colnames(filt_table)[3] = out_name_p4
+
+ # now merge
+ filt_table$file_id_merge = filt_table$file_id
+ filt_table = merge(filt_table,
+ compare_df[, c("file_id_merge", "year", out_name)],
+ by=c("file_id_merge"), all=T)
+
+ # not found in p3
+ missing_p3 = which(is.na(filt_table[,c(out_name)]))
+ filt_table$year.y[missing_p3] = filt_table$year.x[missing_p3]
+ filt_table[missing_p3, out_name] = 0
+
+ # not found in p4
+ missing_p4 = which(is.na(filt_table[,out_name_p4]))
+ filt_table$year.x[missing_p4] = filt_table$year.y[missing_p4]
+ filt_table[missing_p4, out_name_p4] = 0
- filt_table$pipeline_step = "p4"
- filt_table = rbind(filt_table,
- compare_df[,colnames(filt_table)])
+ # calc diff
+ filt_table$diff = filt_table[,out_name_p4] - filt_table[,out_name]
return(filt_table)
}
# num orgs
-num_org = loc_summary(loc_stats_df, "ORGANIZATION", "num_org",
+num_org = diff_summary(loc_stats_df, "ORGANIZATION", "num_org",
article_stats_step3_df)
-p4_org = ggplot(num_org, aes(x=year, y=num_org, fill=pipeline_step)) +
- geom_boxplot() + theme_bw() +
- xlab("Year of Article") + ylab("# orgs mentioned") +
- ggtitle("number of orgs mentioned per article over time pipeline step 4")
+
+p4_org = ggplot(num_org, aes(x=year.x, y=diff)) +
+ geom_violin() + geom_jitter(alpha=0.2, height=0) +
+ theme_bw() + xlab("Year of Article") + ylab("# orgs mentioned") +
+ ggtitle("number of orgs mentioned per article over time P4-P3")
# num countries
-num_country = loc_summary(loc_stats_df, "COUNTRY", "num_country",
+num_country = diff_summary(loc_stats_df, "COUNTRY", "num_country",
article_stats_step3_df)
-p4_country = ggplot(num_country, aes(x=year, y=num_country, fill=pipeline_step)) +
- geom_boxplot() + theme_bw() +
+p4_country = ggplot(num_country, aes(x=year.x, y=diff)) +
+ geom_violin() + geom_jitter(alpha=0.2, height=0) +
+ theme_bw() +
xlab("Year of Article") + ylab("# countries mentioned") +
- ggtitle("number of countries mentioned per article over time pipeline step 4")
+ ggtitle("number of countries mentioned per article over time P4-P3")
# num states or provences
-num_state = loc_summary(loc_stats_df, "STATE_OR_PROVINCE", "num_state",
+num_state = diff_summary(loc_stats_df, "STATE_OR_PROVINCE", "num_state",
article_stats_step3_df)
-p4_state = ggplot(num_state, aes(x=year, y=num_state, fill=pipeline_step)) +
- geom_boxplot() + theme_bw() +
- xlab("Year of Article") + ylab("# states/provinces mentioned") +
+p4_state = ggplot(num_state, aes(x=year.x, y=diff)) +
+ geom_violin() + geom_jitter(alpha=0.2, height=0) +
+ theme_bw() + xlab("Year of Article") + ylab("# states/provinces mentioned") +
ggtitle("number of states/provinces mentioned per
- article over time pipeline step 4")
+ article over time P4-P3")
diff --git a/analysis_scripts/qc_scripts/pipeline_qc.md b/analysis_scripts/qc_scripts/pipeline_qc.md
index 7ec249c1d..f70c46d17 100644
--- a/analysis_scripts/qc_scripts/pipeline_qc.md
+++ b/analysis_scripts/qc_scripts/pipeline_qc.md
@@ -67,7 +67,9 @@ Now lets do a quick plot of article specific stats. So far in the pipeline, we o
#### plotting quote stats
-Between pipeline step 3 and 4 we are predicting the genders of speakers using genderize.io. So we expect almost exactly the same number of quotes and length of quotes. We also expect that the number of UNKNOWN gendered speakers typically decrease, and the number of MALE/FEMALE speakers may increase. This is not a completely 1:1 measurement. Pipeline level 3 only identifies the number of male/female/unknown named entities, there is no quote attribution checked at this stage. Quote attribution is in step 4.
+Between pipeline step 3 and 4 we are predicting the genders of speakers using genderize.io. So we expect almost exactly the same number of quotes and length of quotes. We also expect that the number of UNKNOWN gendered speakers typically decrease, and the number of MALE/FEMALE speakers may increase. This is not a completely 1:1 measurement. Pipeline level 3 only identifies the number of male/female/unknown named entities, there is no gender based quote attribution checked at this stage. Quote attribution is in step 4.
+
+
#### plotting location stats
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/figures-side-1.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/figures-side-1.png
index 7e4863016..4746d2d8a 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/figures-side-1.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/figures-side-1.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/figures-side-2.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/figures-side-2.png
index 943dd6e57..15695304b 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/figures-side-2.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/figures-side-2.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-3.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-3.png
index 64c5f2ce7..ae51188ef 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-3.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-3.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-4.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-4.png
index d3771f70e..8a433db33 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-4.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-4.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-5.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-5.png
index 1e029bfd1..a1010aa82 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-5.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-11-5.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-1.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-1.png
index 27d1a4512..a22df593e 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-1.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-1.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-2.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-2.png
index 5677d623d..576b36d52 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-2.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-2.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-3.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-3.png
index 18afee83d..a3e76fbdc 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-3.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-12-3.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-1.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-1.png
index 1a1875da2..6ebce3705 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-1.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-1.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-2.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-2.png
index 32f1c926a..b02de2312 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-2.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-2.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-3.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-3.png
index 727ef5b02..4a63623ed 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-3.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-2-3.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-3-1.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-3-1.png
index d8715e6d6..09b86e90a 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-3-1.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-3-1.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-3-2.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-3-2.png
index a98ac349d..ecfc2cd90 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-3-2.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-3-2.png differ
diff --git a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-9-2.png b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-9-2.png
index ac84f0283..f00c1ffb7 100644
Binary files a/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-9-2.png and b/analysis_scripts/qc_scripts/pipeline_qc_files/figure-markdown_github/unnamed-chunk-9-2.png differ
diff --git a/data/benchmark_data/benchmark_location_table_hand_annotated.tsv b/data/benchmark_data/benchmark_location_table_hand_annotated.tsv
index 7e0ba61f8..0296da0b2 100644
--- a/data/benchmark_data/benchmark_location_table_hand_annotated.tsv
+++ b/data/benchmark_data/benchmark_location_table_hand_annotated.tsv
@@ -1,348 +1,348 @@
-file_id text ner country un_region un_subregion
-4641259a.html National Center for Genome Resources in Santa Fe ORGANIZATION United States of America (USA) Americas Northern America
-4641259a.html University of California ORGANIZATION United States of America (USA) Americas Northern America
-4641259a.html Yale University ORGANIZATION United States of America (USA) Americas Northern America
-4641259a.html US COUNTRY United States of America (USA) Americas Northern America
-4641259a.html New Mexico STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-4641259a.html Connecticut STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-464472b.html Canada COUNTRY Canada Americas Northern America
-464472b.html Ontario STATE_OR_PROVINCE Canada Americas Northern America
-464472b.html Maryland STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-464472b.html Columbia University's Lamont-Doherty Earth Observatory ORGANIZATION United States of America (USA) Americas Northern America
-464472b.html American Geophysical Union ORGANIZATION United States of America (USA) Americas Northern America
-464472b.html NASA ORGANIZATION United States of America (USA) Americas Northern America
-464472b.html Goddard Space Flight Center ORGANIZATION United States of America (USA) Americas Northern America
-464472b.html Northern Illinois University in DeKalb ORGANIZATION United States of America (USA) Americas Northern America
-464472b.html Russia COUNTRY Russia Russia Russia
-464472b.html Antarctic Survey ORGANIZATION United Kingdom (UK) Europe Northern Europe
-464472b.html United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-464472b.html United States COUNTRY United States of America (USA) Americas Northern America
-464472b.html US COUNTRY United States of America (USA) Americas Northern America
-464472b.html New York STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-4661029a.html University of Alberta ORGANIZATION Canada Americas Northern America
-4661029a.html Canada COUNTRY Canada Americas Northern America
-4661029a.html Germany COUNTRY Germany Europe Western Europe
-4661029a.html Leiden University ORGANIZATION Netherlands Europe Western Europe
-4661029a.html Netherlands COUNTRY Netherlands Europe Western Europe
-4661029a.html University of Georgia ORGANIZATION United States of America (USA) Americas Northern America
-4661029a.html Max Planck Institute of Colloids and Interfaces ORGANIZATION Germany Europe Western Europe
-4661029a.html Ancora Pharmaceuticals ORGANIZATION United States of America (USA) Americas Northern America
-4661029a.html American Chemical Society ORGANIZATION United States of America (USA) Americas Northern America
-4661029a.html LuCella Biosciences ORGANIZATION United States of America (USA) Americas Northern America
-4661029a.html Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-4661029a.html Iowa State University ORGANIZATION United States of America (USA) Americas Northern America
-4661029a.html MASSACHUSETTS STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-bat-drinks-using-tongue-pump-trick-1.18434 Canada COUNTRY Canada Americas Northern America
-bat-drinks-using-tongue-pump-trick-1.18434 Germany COUNTRY Germany Europe Western Europe
-bat-drinks-using-tongue-pump-trick-1.18434 University of Ulm ORGANIZATION Germany Europe Western Europe
-bat-drinks-using-tongue-pump-trick-1.18434 St Lawrence River Institute of Environmental Sciences ORGANIZATION Canada Americas Northern America
-climatologists-to-physicists-your-planet-needs-you-1.17270 Monash University ORGANIZATION Australia Oceania Australia and New Zealand
-climatologists-to-physicists-your-planet-needs-you-1.17270 Australia COUNTRY Australia Oceania Australia and New Zealand
-climatologists-to-physicists-your-planet-needs-you-1.17270 Catholic University of Leuven ORGANIZATION Belgium Europe Western Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 Belgium COUNTRY Belgium Europe Western Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 Germany COUNTRY Germany Europe Western Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 Maryland STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-climatologists-to-physicists-your-planet-needs-you-1.17270 Laboratory of Dynamic Meteorology ORGANIZATION France Europe Western Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 American Institute of Physics in College Park ORGANIZATION United States of America (USA) Americas Northern America
-climatologists-to-physicists-your-planet-needs-you-1.17270 Max Planck Institute for Meteorology ORGANIZATION Germany Europe Western Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 UK COUNTRY United Kingdom (UK) Europe Northern Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 University of Leeds ORGANIZATION United Kingdom (UK) Europe Northern Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 University of Cambridge ORGANIZATION United Kingdom (UK) Europe Northern Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-00166-6 University of New South Wales ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-00166-6 Australia COUNTRY Australia Oceania Australia and New Zealand
-d41586-020-00166-6 China COUNTRY China China China
-d41586-020-00166-6 Pasteur Institute ORGANIZATION France Europe Western Europe
-d41586-020-00166-6 National Health Commission ORGANIZATION China China China
-d41586-020-00166-6 WHO ORGANIZATION NA NA NA
-d41586-020-00166-6 National Engineering Research Center for the Emergence Drugs ORGANIZATION China China China
-d41586-020-00166-6 Yunnan STATE_OR_PROVINCE China China China
-d41586-020-00166-6 World Health Organization ORGANIZATION NA NA NA
-d41586-020-00166-6 Thailand COUNTRY Thailand Asia South-Eastern Asia
-d41586-020-00166-6 University of Nottingham ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 University of Cambridge ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 University of Edinburgh ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 University of Glasgow ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 Imperial College London ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 UK COUNTRY United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 Fred Hutchinson Cancer Research Center ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00166-6 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-00166-6 Washington STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00365-1 European Space Agency ORGANIZATION NA Europe NA
-d41586-020-00365-1 Netherlands COUNTRY Netherlands Europe Western Europe
-d41586-020-00365-1 ESA ORGANIZATION NA Europe NA
-d41586-020-00365-1 Florida STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00365-1 Maryland STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00365-1 Science Mission Directorate ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00365-1 NASA ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00365-1 ESA's European Space Research and Technology Centre ORGANIZATION NA Europe NA
-d41586-020-00365-1 Johns Hopkins University Applied Physics Laboratory ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00365-1 Imperial College London ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00889-6 Women's Hospital ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Roche ORGANIZATION Switzerland Europe Western Europe
-d41586-020-00889-6 US National Institutes of Health ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Addex Therapeutics ORGANIZATION Switzerland Europe Western Europe
-d41586-020-00889-6 US Food and Drug Administration ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 US National Cancer Institute ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Oregon Health & Science University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 SWOG Cancer Research Network ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Switzerland COUNTRY Switzerland Europe Western Europe
-d41586-020-00889-6 Yale University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Connecticut STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00889-6 Harvard ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Yale ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Eli Lilly ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00889-6 Nebraska STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00889-6 Indiana STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00941-5 China COUNTRY China China China
-d41586-020-00941-5 India COUNTRY India Asia Southern Asia
-d41586-020-00941-5 Italy COUNTRY Italy Europe Southern Europe
-d41586-020-00941-5 US Environmental Protection Agency ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00941-5 Center for International Climate Research ORGANIZATION NA NA NA
-d41586-020-00941-5 ICAO ORGANIZATION NA NA NA
-d41586-020-00941-5 Eurasia Group ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00941-5 United Nations International Civil Aviation Organization ORGANIZATION NA NA NA
-d41586-020-00941-5 World Resources Institute ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00941-5 US COUNTRY United States of America (USA) Americas Northern America
-d41586-020-00941-5 Environmental Defense Fund ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00941-5 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01114-0 European Space Agency ORGANIZATION NA Europe NA
-d41586-020-01114-0 ESA ORGANIZATION NA Europe NA
-d41586-020-01114-0 NASA ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01114-0 California Institute of Technology ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01587-z Brazil COUNTRY Brazil Brazil Brazil
-d41586-020-01587-z University of Northern British Columbia ORGANIZATION Canada Americas Northern America
-d41586-020-01587-z Canada COUNTRY Canada Americas Northern America
-d41586-020-01587-z Costa Rica COUNTRY Costa Rica Americas Central America
-d41586-020-01587-z Germany COUNTRY Germany Europe Western Europe
-d41586-020-01587-z Honduras COUNTRY Honduras Americas Central America
-d41586-020-01587-z Italy COUNTRY Italy Europe Southern Europe
-d41586-020-01587-z Netherlands COUNTRY Netherlands Europe Western Europe
-d41586-020-01587-z University of Groningen ORGANIZATION Netherlands Europe Western Europe
-d41586-020-01587-z University of Auckland ORGANIZATION New Zealand Oceania Australia and New Zealand
-d41586-020-01587-z New Zealand COUNTRY New Zealand Oceania Australia and New Zealand
-d41586-020-01587-z Nicaragua COUNTRY Nicaragua Americas Central America
-d41586-020-01587-z Heidelberg University ORGANIZATION Germany Europe Western Europe
-d41586-020-01587-z Centers for Disease Control and Prevention ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01587-z Association of American Universities ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01587-z University of Central America ORGANIZATION Nicaragua Americas Central America
-d41586-020-01587-z University of Padua ORGANIZATION Italy Europe Southern Europe
-d41586-020-01587-z WHO ORGANIZATION NA NA NA
-d41586-020-01587-z United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-d41586-020-01587-z United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01587-z University of California ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01587-z America COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01587-z Yale University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01587-z Connecticut STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-01756-0 Argentina COUNTRY Argentina Americas South America
-d41586-020-01756-0 University of São Paulo ORGANIZATION Brazil Brazil Brazil
-d41586-020-01756-0 Brazil COUNTRY Brazil Brazil Brazil
-d41586-020-01756-0 Chile COUNTRY Chile Americas South America
-d41586-020-01756-0 Pontifical Catholic University of Chile ORGANIZATION Chile Americas South America
-d41586-020-01756-0 China COUNTRY China China China
-d41586-020-01756-0 National Autonomous University of Mexico ORGANIZATION Mexico Americas Central America
-d41586-020-01756-0 Mexico COUNTRY Mexico Americas Central America
-d41586-020-01756-0 FARVET ORGANIZATION Peru Americas South America
-d41586-020-01756-0 Monterrey Institute of Technology and Higher Education ORGANIZATION Mexico Americas Central America
-d41586-020-01756-0 Sinergium Biotech ORGANIZATION Argentina Americas South America
-d41586-020-01756-0 Butantan Institute ORGANIZATION Brazil Brazil Brazil
-d41586-020-01756-0 Cayetano Heredia University ORGANIZATION Peru Americas South America
-d41586-020-01756-0 Peru COUNTRY Peru Americas South America
-d41586-020-01756-0 Duke University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01756-0 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01756-0 America COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01756-0 Baylor College of Medicine ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01756-0 Texas STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-01756-0 North Carolina STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-02821-4 Belgium COUNTRY Belgium Europe Western Europe
-d41586-020-02821-4 New Brunswick STATE_OR_PROVINCE Canada Americas Northern America
-d41586-020-02821-4 Maryland STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-02821-4 US National Institute of Allergy ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-02821-4 Royal Free Hospital ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 UK Medicines and Healthcare Regulatory Agency ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 MHRA ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 University of Maryland School of Medicine ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-02821-4 NIAID ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-02821-4 Rutgers University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-02821-4 Lurie Children's Hospital and Northwestern University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-02821-4 Colorado State University in Fort Collins ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-02821-4 Imperial College London ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 London School of Hygiene and Tropical Medicine ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 UK COUNTRY United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 New Jersey STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-02821-4 Illinois STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-02835-y Australian Nuclear Science and Technology Organisation ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Commonwealth Scientific and Industrial Research Organisation ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y University of Sydney ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y James Cook University ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Australian National University ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y CSIRO ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Australia COUNTRY Australia Oceania Australia and New Zealand
-d41586-020-02835-y Senate ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Victoria University ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Australian Research Council ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y National Health and Medical Research Council ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Australian Institute of Marine Sciences ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Australian Academy of Science ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Research Support Program ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Group of Eight ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Australian Renewable Energy Agency ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-03495-8 Senate ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Food and Drug Administration ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 California STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-03495-8 Department of Health and Human Services ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 US Centers for Disease Control and Prevention ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 CDC ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Yale School of Medicine ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Harvard T.H. Chan School of Public Health ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Massachusetts General Hospital ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Harvard Medical School ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Joint United Nations Programme ORGANIZATION NA NA NA
-d41586-020-03495-8 Harris County Public Health ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Equity Task Force ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 World Health Organization ORGANIZATION NA NA NA
-d41586-020-03495-8 George Mason University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Twitter ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Arizona STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-03495-8 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-03495-8 National Institutes of Health ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-03495-8 Texas STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-03495-8 US COUNTRY United States of America (USA) Americas Northern America
-d41586-020-03495-8 Connecticut STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-03495-8 Washington STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 University of Sydney ORGANIZATION Australia Oceania Australia and New Zealand
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 Australia COUNTRY Australia Oceania Australia and New Zealand
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 Liberia COUNTRY Liberia Africa Western Africa
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 United Nations ORGANIZATION NA NA NA
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 US National Academy of Medicine ORGANIZATION United States of America (USA) Americas Northern America
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 WHO ORGANIZATION NA NA NA
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 World Health Organization ORGANIZATION NA NA NA
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 London School of Hygiene and Tropical Medicine ORGANIZATION United Kingdom (UK) Europe Northern Europe
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 Harvard University ORGANIZATION United States of America (USA) Americas Northern America
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Imperial College London ORGANIZATION United Kingdom (UK) Europe Northern Europe
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 University of California ORGANIZATION United States of America (USA) Americas Northern America
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Harvard University ORGANIZATION United States of America (USA) Americas Northern America
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 US COUNTRY United States of America (USA) Americas Northern America
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-news.2010.179.html RI ORGANIZATION United Kingdom (UK) Europe Northern Europe
-news.2010.179.html Queen Mary University London ORGANIZATION United Kingdom (UK) Europe Northern Europe
-news.2010.179.html University of Oxford ORGANIZATION United Kingdom (UK) Europe Northern Europe
-news.2010.179.html United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-news.2010.278.html NASA ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.278.html California Institute of Technology ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.278.html University of Arizona ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.365.html University of Reims ORGANIZATION France Europe Western Europe
-news.2010.365.html France COUNTRY France Europe Western Europe
-news.2010.365.html the research department of Moët & Chandon ORGANIZATION France Europe Western Europe
-news.2010.365.html University of California ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.377.html Indonesia COUNTRY Indonesia Asia South-Eastern Asia
-news.2010.377.html Netherlands COUNTRY Netherlands Europe Western Europe
-news.2010.377.html Institute of Technology Bandung ORGANIZATION Indonesia Asia South-Eastern Asia
-news.2010.377.html Rutgers University ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.377.html Republic of Georgia COUNTRY Republic of Georgia Republic of Georgia Republic of Georgia
-news.2010.377.html University of Iowa ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.377.html University of Texas at Austin ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.377.html New Jersey STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-news.2010.377.html Georgia STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-news.2010.377.html United States COUNTRY United States of America (USA) Americas Northern America
-news.2010.402.html MIT ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.402.html Harvard University ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.402.html Georgia Institute of Technology ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.402.html Massachusetts Institute of Technology ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.404.html University of Freiburg ORGANIZATION Germany Europe Western Europe
-news.2010.404.html Germany COUNTRY Germany Europe Western Europe
-news.2010.404.html Max Planck Institute for Chemistry ORGANIZATION Germany Europe Western Europe
-news.2010.404.html Greenpeace Russia ORGANIZATION Russia Russia Russia
-news.2010.404.html ITAR TASS ORGANIZATION NOT_FOUND NA NA
-news.2010.404.html GFMC ORGANIZATION NOT_FOUND NA NA
-news.2010.404.html Russia COUNTRY Russia Russia Russia
-news.2010.404.html Russian Federation COUNTRY Russia Russia Russia
-news.2010.404.html University of Portsmouth ORGANIZATION United Kingdom (UK) Europe Northern Europe
-news.2010.404.html UK COUNTRY United Kingdom (UK) Europe Northern Europe
-news.2010.585.html Guatemala COUNTRY Guatemala Americas Central America
-news.2010.585.html Mexico COUNTRY Mexico Americas Central America
-news.2010.585.html US Environmental Protection Agency ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.585.html Pink Bollworm Rearing Facility ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.585.html University of Arizona ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.585.html North Carolina State University ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.585.html University of Minnesota ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.585.html United States COUNTRY United States of America (USA) Americas Northern America
-news.2010.585.html America COUNTRY United States of America (USA) Americas Northern America
-news.2010.585.html Arizona STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 University of Trieste ORGANIZATION Italy Europe Southern Europe
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 Italy COUNTRY Italy Europe Southern Europe
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 University of Geneva ORGANIZATION Switzerland Europe Western Europe
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 Switzerland COUNTRY Switzerland Europe Western Europe
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 University of Illinois ORGANIZATION United States of America (USA) Americas Northern America
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 Urbana-Champaign ORGANIZATION United States of America (USA) Americas Northern America
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 American Physical Society ORGANIZATION United States of America (USA) Americas Northern America
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 Ohio STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-russian-secret-service-to-vet-research-papers-1.18602 A. N. Belozersky Institute of Physico-Chemical Biology ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Federal Security Service ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Belozersky Institute ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 First Department ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Lomonosov Moscow State University ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 FSB ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Russian Academy of Sciences ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Skolkovo Institute of Science and Technology ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Russia COUNTRY Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 MSU ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Spain COUNTRY Spain Europe Southern Europe
-russian-secret-service-to-vet-research-papers-1.18602 Ukraine COUNTRY Ukraine Europe Eastern Europe
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Mexico COUNTRY Mexico Americas Central America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 California STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Environmental Research ORGANIZATION United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 US National Oceanic and Atmospheric Administration ORGANIZATION United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 National Center for Atmospheric Research ORGANIZATION United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Stanford University ORGANIZATION United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 United States COUNTRY United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 US COUNTRY United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 America COUNTRY United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Colorado STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-structural-biologist-named-president-of-uk-royal-society-1.17153 India COUNTRY India Asia Southern Asia
-structural-biologist-named-president-of-uk-royal-society-1.17153 Royal Society ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 Medical Research Council ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 Laboratory for Molecular Biology ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 Science Policy Centre ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 UK Research Councils ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 European Union ORGANIZATION NA Europe NA
-structural-biologist-named-president-of-uk-royal-society-1.17153 Campaign for Science and Engineering ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 MRC ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 University of Sussex ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 Francis Crick Institute ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 UK COUNTRY United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 United States COUNTRY United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 England COUNTRY England England England
-us-precision-medicine-proposal-sparks-questions-1.16774 NIH ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 House ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 California STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Congress ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 House of Representatives' Energy & Commerce Committee ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 US National Institutes of Health ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Genentech ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Biotechnology Industry Organization ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 US Department of Veterans Affairs ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Million Veteran Program ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 UK National Health Service ORGANIZATION United Kingdom (UK) Europe Northern Europe
-us-precision-medicine-proposal-sparks-questions-1.16774 National Children's Study ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Geisinger Health System ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Pennsylvania STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Boston University ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 US COUNTRY United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 White House ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 National Academy of Medicine ORGANIZATION United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 NAS ORGANIZATION United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 NAM ORGANIZATION United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 California STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 US National Academy of Sciences ORGANIZATION United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 Center for Genetics and Society ORGANIZATION United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 "University of California, Berkeley" ORGANIZATION United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 Stanford University ORGANIZATION United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 United States COUNTRY United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 US COUNTRY United States of America (USA) Americas Northern America
\ No newline at end of file
+address.country_code file_id text ner country un_region un_subregion
+ar d41586-020-01756-0 Argentina COUNTRY Argentina Americas South America
+ar d41586-020-01756-0 Sinergium Biotech ORGANIZATION Argentina Americas South America
+au climatologists-to-physicists-your-planet-needs-you-1.17270 Monash University ORGANIZATION Australia Oceania Australia and New Zealand
+au climatologists-to-physicists-your-planet-needs-you-1.17270 Australia COUNTRY Australia Oceania Australia and New Zealand
+au d41586-020-00166-6 University of New South Wales ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-00166-6 Australia COUNTRY Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Australian Nuclear Science and Technology Organisation ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Commonwealth Scientific and Industrial Research Organisation ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y University of Sydney ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y James Cook University ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Australian National University ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y CSIRO ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Australia COUNTRY Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Senate ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Victoria University ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Australian Research Council ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y National Health and Medical Research Council ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Australian Institute of Marine Sciences ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Australian Academy of Science ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Research Support Program ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Group of Eight ORGANIZATION Australia Oceania Australia and New Zealand
+au d41586-020-02835-y Australian Renewable Energy Agency ORGANIZATION Australia Oceania Australia and New Zealand
+au ebola-experience-leaves-world-no-less-vulnerable-1.18844 University of Sydney ORGANIZATION Australia Oceania Australia and New Zealand
+au ebola-experience-leaves-world-no-less-vulnerable-1.18844 Australia COUNTRY Australia Oceania Australia and New Zealand
+be climatologists-to-physicists-your-planet-needs-you-1.17270 Catholic University of Leuven ORGANIZATION Belgium Europe Western Europe
+be climatologists-to-physicists-your-planet-needs-you-1.17270 Belgium COUNTRY Belgium Europe Western Europe
+be d41586-020-02821-4 Belgium COUNTRY Belgium Europe Western Europe
+br d41586-020-01587-z Brazil COUNTRY Brasil Americas South America
+br d41586-020-01756-0 University of São Paulo ORGANIZATION Brasil Americas South America
+br d41586-020-01756-0 Brazil COUNTRY Brasil Americas South America
+br d41586-020-01756-0 Butantan Institute ORGANIZATION Brasil Americas South America
+ca 464472b.html Canada COUNTRY Canada Americas Northern America
+ca 464472b.html Ontario STATE_OR_PROVINCE Canada Americas Northern America
+ca 4661029a.html University of Alberta ORGANIZATION Canada Americas Northern America
+ca 4661029a.html Canada COUNTRY Canada Americas Northern America
+ca bat-drinks-using-tongue-pump-trick-1.18434 Canada COUNTRY Canada Americas Northern America
+ca bat-drinks-using-tongue-pump-trick-1.18434 St Lawrence River Institute of Environmental Sciences ORGANIZATION Canada Americas Northern America
+ca d41586-020-01587-z University of Northern British Columbia ORGANIZATION Canada Americas Northern America
+ca d41586-020-01587-z Canada COUNTRY Canada Americas Northern America
+ca d41586-020-02821-4 New Brunswick STATE_OR_PROVINCE Canada Americas Northern America
+ch d41586-020-00889-6 Roche ORGANIZATION Switzerland Europe Western Europe
+ch d41586-020-00889-6 Addex Therapeutics ORGANIZATION Switzerland Europe Western Europe
+ch d41586-020-00889-6 Switzerland COUNTRY Switzerland Europe Western Europe
+ch quantum-technology-probes-ultimate-limits-of-vision-1.17731 University of Geneva ORGANIZATION Switzerland Europe Western Europe
+ch quantum-technology-probes-ultimate-limits-of-vision-1.17731 Switzerland COUNTRY Switzerland Europe Western Europe
+cl d41586-020-01756-0 Chile COUNTRY Chile Americas South America
+cl d41586-020-01756-0 Pontifical Catholic University of Chile ORGANIZATION Chile Americas South America
+cn d41586-020-00166-6 China COUNTRY People's Republic of China Asia Eastern Asia
+cn d41586-020-00166-6 National Health Commission ORGANIZATION People's Republic of China Asia Eastern Asia
+cn d41586-020-00166-6 National Engineering Research Center for the Emergence Drugs ORGANIZATION People's Republic of China Asia Eastern Asia
+cn d41586-020-00166-6 Yunnan STATE_OR_PROVINCE People's Republic of China Asia Eastern Asia
+cn d41586-020-00941-5 China COUNTRY People's Republic of China Asia Eastern Asia
+cn d41586-020-01756-0 China COUNTRY People's Republic of China Asia Eastern Asia
+cr d41586-020-01587-z Costa Rica COUNTRY Costa Rica Americas Central America
+de 4661029a.html Germany COUNTRY Germany Europe Western Europe
+de 4661029a.html Max Planck Institute of Colloids and Interfaces ORGANIZATION Germany Europe Western Europe
+de bat-drinks-using-tongue-pump-trick-1.18434 Germany COUNTRY Germany Europe Western Europe
+de bat-drinks-using-tongue-pump-trick-1.18434 University of Ulm ORGANIZATION Germany Europe Western Europe
+de climatologists-to-physicists-your-planet-needs-you-1.17270 Germany COUNTRY Germany Europe Western Europe
+de climatologists-to-physicists-your-planet-needs-you-1.17270 Max Planck Institute for Meteorology ORGANIZATION Germany Europe Western Europe
+de d41586-020-01587-z Germany COUNTRY Germany Europe Western Europe
+de d41586-020-01587-z Heidelberg University ORGANIZATION Germany Europe Western Europe
+de news.2010.404.html University of Freiburg ORGANIZATION Germany Europe Western Europe
+de news.2010.404.html Germany COUNTRY Germany Europe Western Europe
+de news.2010.404.html Max Planck Institute for Chemistry ORGANIZATION Germany Europe Western Europe
+es russian-secret-service-to-vet-research-papers-1.18602 Spain COUNTRY Spain Europe Southern Europe
+fr climatologists-to-physicists-your-planet-needs-you-1.17270 Laboratory of Dynamic Meteorology ORGANIZATION France Europe Western Europe
+fr d41586-020-00166-6 Pasteur Institute ORGANIZATION France Europe Western Europe
+fr news.2010.365.html University of Reims ORGANIZATION France Europe Western Europe
+fr news.2010.365.html France COUNTRY France Europe Western Europe
+fr news.2010.365.html the research department of Moët & Chandon ORGANIZATION France Europe Western Europe
+gb us-precision-medicine-proposal-sparks-questions-1.16774 England COUNTRY United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 UK Research Councils ORGANIZATION United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 Campaign for Science and Engineering ORGANIZATION United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 MRC ORGANIZATION United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 University of Sussex ORGANIZATION United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 Francis Crick Institute ORGANIZATION United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 United Kingdom COUNTRY United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 UK COUNTRY United Kingdom Europe Northern Europe
+gb us-precision-medicine-proposal-sparks-questions-1.16774 UK National Health Service ORGANIZATION United Kingdom Europe Northern Europe
+gb 464472b.html Antarctic Survey ORGANIZATION United Kingdom Europe Northern Europe
+gb 464472b.html United Kingdom COUNTRY United Kingdom Europe Northern Europe
+gb climatologists-to-physicists-your-planet-needs-you-1.17270 UK COUNTRY United Kingdom Europe Northern Europe
+gb climatologists-to-physicists-your-planet-needs-you-1.17270 University of Leeds ORGANIZATION United Kingdom Europe Northern Europe
+gb climatologists-to-physicists-your-planet-needs-you-1.17270 University of Cambridge ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-00166-6 University of Nottingham ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-00166-6 University of Cambridge ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-00166-6 University of Edinburgh ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-00166-6 University of Glasgow ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-00166-6 Imperial College London ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-00166-6 UK COUNTRY United Kingdom Europe Northern Europe
+gb d41586-020-00365-1 Imperial College London ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-01587-z United Kingdom COUNTRY United Kingdom Europe Northern Europe
+gb d41586-020-02821-4 Royal Free Hospital ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-02821-4 UK Medicines and Healthcare Regulatory Agency ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-02821-4 MHRA ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-02821-4 Imperial College London ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-02821-4 London School of Hygiene and Tropical Medicine ORGANIZATION United Kingdom Europe Northern Europe
+gb d41586-020-02821-4 UK COUNTRY United Kingdom Europe Northern Europe
+gb d41586-020-02821-4 United Kingdom COUNTRY United Kingdom Europe Northern Europe
+gb ebola-experience-leaves-world-no-less-vulnerable-1.18844 London School of Hygiene and Tropical Medicine ORGANIZATION United Kingdom Europe Northern Europe
+gb mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Imperial College London ORGANIZATION United Kingdom Europe Northern Europe
+gb news.2010.179.html RI ORGANIZATION United Kingdom Europe Northern Europe
+gb news.2010.179.html Queen Mary University London ORGANIZATION United Kingdom Europe Northern Europe
+gb news.2010.179.html University of Oxford ORGANIZATION United Kingdom Europe Northern Europe
+gb news.2010.179.html United Kingdom COUNTRY United Kingdom Europe Northern Europe
+gb news.2010.404.html University of Portsmouth ORGANIZATION United Kingdom Europe Northern Europe
+gb news.2010.404.html UK COUNTRY United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 Royal Society ORGANIZATION United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 Medical Research Council ORGANIZATION United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 Laboratory for Molecular Biology ORGANIZATION United Kingdom Europe Northern Europe
+gb structural-biologist-named-president-of-uk-royal-society-1.17153 Science Policy Centre ORGANIZATION United Kingdom Europe Northern Europe
+ge news.2010.377.html Republic of Georgia COUNTRY Georgia Asia Western Asia
+gt news.2010.585.html Guatemala COUNTRY Guatemala Americas Central America
+hn d41586-020-01587-z Honduras COUNTRY Honduras Americas Central America
+id news.2010.377.html Indonesia COUNTRY Indonesia Asia South-Eastern Asia
+id news.2010.377.html Institute of Technology Bandung ORGANIZATION Indonesia Asia South-Eastern Asia
+in d41586-020-00941-5 India COUNTRY India Asia Southern Asia
+in structural-biologist-named-president-of-uk-royal-society-1.17153 India COUNTRY India Asia Southern Asia
+it d41586-020-00941-5 Italy COUNTRY Italy Europe Southern Europe
+it d41586-020-01587-z Italy COUNTRY Italy Europe Southern Europe
+it d41586-020-01587-z University of Padua ORGANIZATION Italy Europe Southern Europe
+it quantum-technology-probes-ultimate-limits-of-vision-1.17731 University of Trieste ORGANIZATION Italy Europe Southern Europe
+it quantum-technology-probes-ultimate-limits-of-vision-1.17731 Italy COUNTRY Italy Europe Southern Europe
+lr ebola-experience-leaves-world-no-less-vulnerable-1.18844 Liberia COUNTRY Liberia Africa Western Africa
+mx d41586-020-01756-0 National Autonomous University of Mexico ORGANIZATION Mexico Americas Central America
+mx d41586-020-01756-0 Mexico COUNTRY Mexico Americas Central America
+mx d41586-020-01756-0 Monterrey Institute of Technology and Higher Education ORGANIZATION Mexico Americas Central America
+mx news.2010.585.html Mexico COUNTRY Mexico Americas Central America
+mx severe-weather-linked-more-strongly-to-global-warming-1.17828 Mexico COUNTRY Mexico Americas Central America
+ni d41586-020-01587-z Nicaragua COUNTRY Nicaragua Americas Central America
+ni d41586-020-01587-z University of Central America ORGANIZATION Nicaragua Americas Central America
+nl 4661029a.html Leiden University ORGANIZATION Netherlands Europe Western Europe
+nl 4661029a.html Netherlands COUNTRY Netherlands Europe Western Europe
+nl d41586-020-01587-z University of Groningen ORGANIZATION Netherlands Europe Western Europe
+nl news.2010.377.html Netherlands COUNTRY Netherlands Europe Western Europe
+nl d41586-020-00365-1 Netherlands COUNTRY Netherlands Europe Western Europe
+nl d41586-020-01587-z Netherlands COUNTRY Netherlands Europe Western Europe
+nz d41586-020-01587-z University of Auckland ORGANIZATION New Zealand Oceania Australia and New Zealand
+nz d41586-020-01587-z New Zealand COUNTRY New Zealand Oceania Australia and New Zealand
+pe d41586-020-01756-0 FARVET ORGANIZATION Peru Americas South America
+pe d41586-020-01756-0 Cayetano Heredia University ORGANIZATION Peru Americas South America
+pe d41586-020-01756-0 Peru COUNTRY Peru Americas South America
+ru 464472b.html Russia COUNTRY Russia Europe Eastern Europe
+ru news.2010.404.html Greenpeace Russia ORGANIZATION Russia Europe Eastern Europe
+ru news.2010.404.html Russia COUNTRY Russia Europe Eastern Europe
+ru news.2010.404.html Russian Federation COUNTRY Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 A. N. Belozersky Institute of Physico-Chemical Biology ORGANIZATION Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 Federal Security Service ORGANIZATION Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 Belozersky Institute ORGANIZATION Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 First Department ORGANIZATION Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 Lomonosov Moscow State University ORGANIZATION Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 FSB ORGANIZATION Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 Russian Academy of Sciences ORGANIZATION Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 Skolkovo Institute of Science and Technology ORGANIZATION Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 Russia COUNTRY Russia Europe Eastern Europe
+ru russian-secret-service-to-vet-research-papers-1.18602 MSU ORGANIZATION Russia Europe Eastern Europe
+th d41586-020-00166-6 Thailand COUNTRY Thailand Asia South-Eastern Asia
+ua russian-secret-service-to-vet-research-papers-1.18602 Ukraine COUNTRY Ukraine Europe Eastern Europe
+us 4641259a.html National Center for Genome Resources in Santa Fe ORGANIZATION United States Americas Northern America
+us 4641259a.html University of California ORGANIZATION United States Americas Northern America
+us 4641259a.html Yale University ORGANIZATION United States Americas Northern America
+us 4641259a.html US COUNTRY United States Americas Northern America
+us 4641259a.html New Mexico STATE_OR_PROVINCE United States Americas Northern America
+us 4641259a.html Connecticut STATE_OR_PROVINCE United States Americas Northern America
+us 464472b.html Maryland STATE_OR_PROVINCE United States Americas Northern America
+us 464472b.html Columbia University's Lamont-Doherty Earth Observatory ORGANIZATION United States Americas Northern America
+us 464472b.html American Geophysical Union ORGANIZATION United States Americas Northern America
+us 464472b.html NASA ORGANIZATION United States Americas Northern America
+us 464472b.html Goddard Space Flight Center ORGANIZATION United States Americas Northern America
+us 464472b.html Northern Illinois University in DeKalb ORGANIZATION United States Americas Northern America
+us 464472b.html United States COUNTRY United States Americas Northern America
+us 464472b.html US COUNTRY United States Americas Northern America
+us 464472b.html New York STATE_OR_PROVINCE United States Americas Northern America
+us 4661029a.html University of Georgia ORGANIZATION United States Americas Northern America
+us 4661029a.html Ancora Pharmaceuticals ORGANIZATION United States Americas Northern America
+us 4661029a.html American Chemical Society ORGANIZATION United States Americas Northern America
+us 4661029a.html LuCella Biosciences ORGANIZATION United States Americas Northern America
+us 4661029a.html Massachusetts STATE_OR_PROVINCE United States Americas Northern America
+us 4661029a.html Iowa State University ORGANIZATION United States Americas Northern America
+us 4661029a.html MASSACHUSETTS STATE_OR_PROVINCE United States Americas Northern America
+us climatologists-to-physicists-your-planet-needs-you-1.17270 Maryland STATE_OR_PROVINCE United States Americas Northern America
+us climatologists-to-physicists-your-planet-needs-you-1.17270 American Institute of Physics in College Park ORGANIZATION United States Americas Northern America
+us climatologists-to-physicists-your-planet-needs-you-1.17270 United States COUNTRY United States Americas Northern America
+us d41586-020-00166-6 Fred Hutchinson Cancer Research Center ORGANIZATION United States Americas Northern America
+us d41586-020-00166-6 United States COUNTRY United States Americas Northern America
+us d41586-020-00166-6 Washington STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-00365-1 Florida STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-00365-1 Maryland STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-00365-1 Science Mission Directorate ORGANIZATION United States Americas Northern America
+us d41586-020-00365-1 NASA ORGANIZATION United States Americas Northern America
+us d41586-020-00365-1 Johns Hopkins University Applied Physics Laboratory ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 Women's Hospital ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 US National Institutes of Health ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 US Food and Drug Administration ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 US National Cancer Institute ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 Oregon Health & Science University ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 SWOG Cancer Research Network ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 Yale University ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 Connecticut STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-00889-6 Harvard ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 Yale ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 Eli Lilly ORGANIZATION United States Americas Northern America
+us d41586-020-00889-6 Massachusetts STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-00889-6 Nebraska STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-00889-6 Indiana STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-00941-5 US Environmental Protection Agency ORGANIZATION United States Americas Northern America
+us d41586-020-00941-5 Eurasia Group ORGANIZATION United States Americas Northern America
+us d41586-020-00941-5 World Resources Institute ORGANIZATION United States Americas Northern America
+us d41586-020-00941-5 US COUNTRY United States Americas Northern America
+us d41586-020-00941-5 Environmental Defense Fund ORGANIZATION United States Americas Northern America
+us d41586-020-00941-5 United States COUNTRY United States Americas Northern America
+us d41586-020-01114-0 NASA ORGANIZATION United States Americas Northern America
+us d41586-020-01114-0 California Institute of Technology ORGANIZATION United States Americas Northern America
+us d41586-020-01587-z Centers for Disease Control and Prevention ORGANIZATION United States Americas Northern America
+us d41586-020-01587-z Association of American Universities ORGANIZATION United States Americas Northern America
+us d41586-020-01587-z United States COUNTRY United States Americas Northern America
+us d41586-020-01587-z University of California ORGANIZATION United States Americas Northern America
+us d41586-020-01587-z America COUNTRY United States Americas Northern America
+us d41586-020-01587-z Yale University ORGANIZATION United States Americas Northern America
+us d41586-020-01587-z Connecticut STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-01756-0 Duke University ORGANIZATION United States Americas Northern America
+us d41586-020-01756-0 United States COUNTRY United States Americas Northern America
+us d41586-020-01756-0 America COUNTRY United States Americas Northern America
+us d41586-020-01756-0 Baylor College of Medicine ORGANIZATION United States Americas Northern America
+us d41586-020-01756-0 Texas STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-01756-0 North Carolina STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-02821-4 Maryland STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-02821-4 US National Institute of Allergy ORGANIZATION United States Americas Northern America
+us d41586-020-02821-4 University of Maryland School of Medicine ORGANIZATION United States Americas Northern America
+us d41586-020-02821-4 NIAID ORGANIZATION United States Americas Northern America
+us d41586-020-02821-4 Rutgers University ORGANIZATION United States Americas Northern America
+us d41586-020-02821-4 Lurie Children's Hospital and Northwestern University ORGANIZATION United States Americas Northern America
+us d41586-020-02821-4 Colorado State University in Fort Collins ORGANIZATION United States Americas Northern America
+us d41586-020-02821-4 New Jersey STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-02821-4 Illinois STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-03495-8 Senate ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Food and Drug Administration ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 California STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-03495-8 Department of Health and Human Services ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 US Centers for Disease Control and Prevention ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 CDC ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Yale School of Medicine ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Harvard T.H. Chan School of Public Health ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Massachusetts General Hospital ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Harvard Medical School ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Harris County Public Health ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Equity Task Force ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 George Mason University ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Twitter ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Arizona STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-03495-8 United States COUNTRY United States Americas Northern America
+us d41586-020-03495-8 National Institutes of Health ORGANIZATION United States Americas Northern America
+us d41586-020-03495-8 Massachusetts STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-03495-8 Texas STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-03495-8 US COUNTRY United States Americas Northern America
+us d41586-020-03495-8 Connecticut STATE_OR_PROVINCE United States Americas Northern America
+us d41586-020-03495-8 Washington STATE_OR_PROVINCE United States Americas Northern America
+us ebola-experience-leaves-world-no-less-vulnerable-1.18844 US National Academy of Medicine ORGANIZATION United States Americas Northern America
+us ebola-experience-leaves-world-no-less-vulnerable-1.18844 Harvard University ORGANIZATION United States Americas Northern America
+us mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 University of California ORGANIZATION United States Americas Northern America
+us mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Harvard University ORGANIZATION United States Americas Northern America
+us mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 US COUNTRY United States Americas Northern America
+us mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Massachusetts STATE_OR_PROVINCE United States Americas Northern America
+us news.2010.278.html NASA ORGANIZATION United States Americas Northern America
+us news.2010.278.html California Institute of Technology ORGANIZATION United States Americas Northern America
+us news.2010.278.html University of Arizona ORGANIZATION United States Americas Northern America
+us news.2010.365.html University of California ORGANIZATION United States Americas Northern America
+us news.2010.377.html Rutgers University ORGANIZATION United States Americas Northern America
+us news.2010.377.html University of Iowa ORGANIZATION United States Americas Northern America
+us news.2010.377.html University of Texas at Austin ORGANIZATION United States Americas Northern America
+us news.2010.377.html New Jersey STATE_OR_PROVINCE United States Americas Northern America
+us news.2010.377.html Georgia STATE_OR_PROVINCE United States Americas Northern America
+us news.2010.377.html United States COUNTRY United States Americas Northern America
+us news.2010.402.html MIT ORGANIZATION United States Americas Northern America
+us news.2010.402.html Harvard University ORGANIZATION United States Americas Northern America
+us news.2010.402.html Georgia Institute of Technology ORGANIZATION United States Americas Northern America
+us news.2010.402.html Massachusetts Institute of Technology ORGANIZATION United States Americas Northern America
+us news.2010.585.html US Environmental Protection Agency ORGANIZATION United States Americas Northern America
+us news.2010.585.html Pink Bollworm Rearing Facility ORGANIZATION United States Americas Northern America
+us news.2010.585.html University of Arizona ORGANIZATION United States Americas Northern America
+us news.2010.585.html North Carolina State University ORGANIZATION United States Americas Northern America
+us news.2010.585.html University of Minnesota ORGANIZATION United States Americas Northern America
+us news.2010.585.html United States COUNTRY United States Americas Northern America
+us news.2010.585.html America COUNTRY United States Americas Northern America
+us news.2010.585.html Arizona STATE_OR_PROVINCE United States Americas Northern America
+us quantum-technology-probes-ultimate-limits-of-vision-1.17731 University of Illinois ORGANIZATION United States Americas Northern America
+us quantum-technology-probes-ultimate-limits-of-vision-1.17731 Urbana-Champaign ORGANIZATION United States Americas Northern America
+us quantum-technology-probes-ultimate-limits-of-vision-1.17731 American Physical Society ORGANIZATION United States Americas Northern America
+us quantum-technology-probes-ultimate-limits-of-vision-1.17731 Ohio STATE_OR_PROVINCE United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 California STATE_OR_PROVINCE United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 Environmental Research ORGANIZATION United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 US National Oceanic and Atmospheric Administration ORGANIZATION United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 National Center for Atmospheric Research ORGANIZATION United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 Stanford University ORGANIZATION United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 United States COUNTRY United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 US COUNTRY United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 America COUNTRY United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 Colorado STATE_OR_PROVINCE United States Americas Northern America
+us severe-weather-linked-more-strongly-to-global-warming-1.17828 Massachusetts STATE_OR_PROVINCE United States Americas Northern America
+us structural-biologist-named-president-of-uk-royal-society-1.17153 United States COUNTRY United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 NIH ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 House ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 California STATE_OR_PROVINCE United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 Congress ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 House of Representatives' Energy & Commerce Committee ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 US National Institutes of Health ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 Genentech ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 Biotechnology Industry Organization ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 US Department of Veterans Affairs ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 Million Veteran Program ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 National Children's Study ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 Geisinger Health System ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 Pennsylvania STATE_OR_PROVINCE United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 Boston University ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 US COUNTRY United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 White House ORGANIZATION United States Americas Northern America
+us us-precision-medicine-proposal-sparks-questions-1.16774 Massachusetts STATE_OR_PROVINCE United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 National Academy of Medicine ORGANIZATION United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 NAS ORGANIZATION United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 NAM ORGANIZATION United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 California STATE_OR_PROVINCE United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 US National Academy of Sciences ORGANIZATION United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 Center for Genetics and Society ORGANIZATION United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 University of California, Berkeley ORGANIZATION United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 Stanford University ORGANIZATION United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 United States COUNTRY United States Americas Northern America
+us us-science-academies-take-on-human-genome-editing-1.17581 US COUNTRY United States Americas Northern America
+NAN d41586-020-00166-6 WHO ORGANIZATION NA NA NA
+NAN d41586-020-00166-6 World Health Organization ORGANIZATION NA NA NA
+NAN d41586-020-00365-1 European Space Agency ORGANIZATION NA NA NA
+NAN d41586-020-00365-1 ESA ORGANIZATION NA NA NA
+NAN d41586-020-00365-1 ESA's European Space Research and Technology Centre ORGANIZATION NA NA NA
+NAN d41586-020-00941-5 Center for International Climate Research ORGANIZATION NA NA NA
+NAN d41586-020-00941-5 ICAO ORGANIZATION NA NA NA
+NAN d41586-020-00941-5 United Nations International Civil Aviation Organization ORGANIZATION NA NA NA
+NAN d41586-020-01114-0 European Space Agency ORGANIZATION NA NA NA
+NAN d41586-020-01114-0 ESA ORGANIZATION NA NA NA
+NAN d41586-020-01587-z WHO ORGANIZATION NA NA NA
+NAN d41586-020-03495-8 Joint United Nations Programme ORGANIZATION NA NA NA
+NAN d41586-020-03495-8 World Health Organization ORGANIZATION NA NA NA
+NAN ebola-experience-leaves-world-no-less-vulnerable-1.18844 United Nations ORGANIZATION NA NA NA
+NAN ebola-experience-leaves-world-no-less-vulnerable-1.18844 WHO ORGANIZATION NA NA NA
+NAN ebola-experience-leaves-world-no-less-vulnerable-1.18844 World Health Organization ORGANIZATION NA NA NA
+NAN structural-biologist-named-president-of-uk-royal-society-1.17153 European Union ORGANIZATION NA NA NA
+NAN news.2010.404.html ITAR TASS ORGANIZATION NA NA NA
+NAN news.2010.404.html GFMC ORGANIZATION NA NA NA
diff --git a/data/benchmark_data/benchmark_location_table_raw.tsv b/data/benchmark_data/benchmark_location_table_raw.tsv
index 9a5134c0e..138bae5f7 100644
--- a/data/benchmark_data/benchmark_location_table_raw.tsv
+++ b/data/benchmark_data/benchmark_location_table_raw.tsv
@@ -1,370 +1,373 @@
-file_id text ner country un_region un_subregion
-4641259a.html MS STATE_OR_PROVINCE NOT_CLEAR NA NA
-4641259a.html National Center for Genome Resources in Santa Fe ORGANIZATION NOT_FOUND NA NA
-4641259a.html University of California ORGANIZATION United States of America (USA) Americas Northern America
-4641259a.html Yale University ORGANIZATION United States of America (USA) Americas Northern America
-4641259a.html US COUNTRY United States of America (USA) Americas Northern America
-4641259a.html New Mexico STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-4641259a.html Connecticut STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-464472b.html Canada COUNTRY Canada Americas Northern America
-464472b.html Ontario STATE_OR_PROVINCE Canada Americas Northern America
-464472b.html Maryland STATE_OR_PROVINCE NOT_CLEAR NA NA
-464472b.html Columbia University's Lamont-Doherty Earth Observatory ORGANIZATION NOT_FOUND NA NA
-464472b.html American Geophysical Union ORGANIZATION NOT_FOUND NA NA
-464472b.html NASA ORGANIZATION NOT_FOUND NA NA
-464472b.html Goddard Space Flight Center ORGANIZATION NOT_FOUND NA NA
-464472b.html Ross Ice Shelf ORGANIZATION NOT_FOUND NA NA
-464472b.html Northern Illinois University in DeKalb ORGANIZATION NOT_FOUND NA NA
-464472b.html Russia COUNTRY Russia Russia Russia
-464472b.html Antarctic Survey ORGANIZATION United Kingdom (UK) Europe Northern Europe
-464472b.html United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-464472b.html United States COUNTRY United States of America (USA) Americas Northern America
-464472b.html US COUNTRY United States of America (USA) Americas Northern America
-464472b.html New York STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-4661029a.html University of Alberta ORGANIZATION Canada Americas Northern America
-4661029a.html Canada COUNTRY Canada Americas Northern America
-4661029a.html Germany COUNTRY Germany Europe Western Europe
-4661029a.html Leiden University ORGANIZATION Netherlands Europe Western Europe
-4661029a.html Netherlands COUNTRY Netherlands Europe Western Europe
-4661029a.html University of Georgia ORGANIZATION NOT_CLEAR NA NA
-4661029a.html Max Planck Institute of Colloids and Interfaces ORGANIZATION NOT_FOUND NA NA
-4661029a.html Ancora Pharmaceuticals ORGANIZATION NOT_FOUND NA NA
-4661029a.html American Chemical Society ORGANIZATION NOT_FOUND NA NA
-4661029a.html LuCella Biosciences ORGANIZATION NOT_FOUND NA NA
-4661029a.html Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-4661029a.html Iowa State University ORGANIZATION United States of America (USA) Americas Northern America
-4661029a.html MASSACHUSETTS STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-bat-drinks-using-tongue-pump-trick-1.18434 Canada COUNTRY Canada Americas Northern America
-bat-drinks-using-tongue-pump-trick-1.18434 Germany COUNTRY Germany Europe Western Europe
-bat-drinks-using-tongue-pump-trick-1.18434 University of Ulm ORGANIZATION NOT_FOUND NA NA
-bat-drinks-using-tongue-pump-trick-1.18434 St Lawrence River Institute of Environmental Sciences ORGANIZATION NOT_FOUND NA NA
-climatologists-to-physicists-your-planet-needs-you-1.17270 Monash University ORGANIZATION Australia Oceania Australia and New Zealand
-climatologists-to-physicists-your-planet-needs-you-1.17270 Australia COUNTRY Australia Oceania Australia and New Zealand
-climatologists-to-physicists-your-planet-needs-you-1.17270 Catholic University of Leuven ORGANIZATION Belgium Europe Western Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 Belgium COUNTRY Belgium Europe Western Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 Germany COUNTRY Germany Europe Western Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 Maryland STATE_OR_PROVINCE NOT_CLEAR NA NA
-climatologists-to-physicists-your-planet-needs-you-1.17270 Laboratory of Dynamic Meteorology ORGANIZATION NOT_FOUND NA NA
-climatologists-to-physicists-your-planet-needs-you-1.17270 Nature Geoscience ORGANIZATION NOT_FOUND NA NA
-climatologists-to-physicists-your-planet-needs-you-1.17270 American Institute of Physics in College Park ORGANIZATION NOT_FOUND NA NA
-climatologists-to-physicists-your-planet-needs-you-1.17270 Max Planck Institute for Meteorology ORGANIZATION NOT_FOUND NA NA
-climatologists-to-physicists-your-planet-needs-you-1.17270 UK COUNTRY United Kingdom (UK) Europe Northern Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 University of Leeds ORGANIZATION United Kingdom (UK) Europe Northern Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 University of Cambridge ORGANIZATION United Kingdom (UK) Europe Northern Europe
-climatologists-to-physicists-your-planet-needs-you-1.17270 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-00166-6 University of New South Wales ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-00166-6 Australia COUNTRY Australia Oceania Australia and New Zealand
-d41586-020-00166-6 China COUNTRY China China China
-d41586-020-00166-6 Pasteur Institute ORGANIZATION France Europe Western Europe
-d41586-020-00166-6 National Health Commission ORGANIZATION NOT_FOUND NA NA
-d41586-020-00166-6 WHO ORGANIZATION NOT_FOUND NA NA
-d41586-020-00166-6 Bedford ORGANIZATION NOT_FOUND NA NA
-d41586-020-00166-6 National Engineering Research Center for the Emergence Drugs ORGANIZATION NOT_FOUND NA NA
-d41586-020-00166-6 Yunnan STATE_OR_PROVINCE NOT_FOUND NA NA
-d41586-020-00166-6 World Health Organization ORGANIZATION Switzerland Europe Western Europe
-d41586-020-00166-6 Thailand COUNTRY Thailand Asia South-Eastern Asia
-d41586-020-00166-6 University of Nottingham ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 University of Cambridge ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 University of Edinburgh ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 University of Glasgow ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 Imperial College London ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 UK COUNTRY United Kingdom (UK) Europe Northern Europe
-d41586-020-00166-6 Fred Hutchinson Cancer Research Center ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00166-6 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-00166-6 Washington STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00365-1 European Space Agency ORGANIZATION France Europe Western Europe
-d41586-020-00365-1 Netherlands COUNTRY Netherlands Europe Western Europe
-d41586-020-00365-1 ESA ORGANIZATION NOT_CLEAR NA NA
-d41586-020-00365-1 Florida STATE_OR_PROVINCE NOT_CLEAR NA NA
-d41586-020-00365-1 Maryland STATE_OR_PROVINCE NOT_CLEAR NA NA
-d41586-020-00365-1 Science Mission Directorate ORGANIZATION NOT_FOUND NA NA
-d41586-020-00365-1 NASA ORGANIZATION NOT_FOUND NA NA
-d41586-020-00365-1 ESA's European Space Research and Technology Centre ORGANIZATION NOT_FOUND NA NA
-d41586-020-00365-1 Solar Orbiter ORGANIZATION NOT_FOUND NA NA
-d41586-020-00365-1 Johns Hopkins University Applied Physics Laboratory ORGANIZATION NOT_FOUND NA NA
-d41586-020-00365-1 Imperial College London ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-00889-6 Women's Hospital ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-00889-6 Roche ORGANIZATION NOT_CLEAR NA NA
-d41586-020-00889-6 US National Institutes of Health ORGANIZATION NOT_FOUND NA NA
-d41586-020-00889-6 Addex Therapeutics ORGANIZATION NOT_FOUND NA NA
-d41586-020-00889-6 US Food and Drug Administration ORGANIZATION NOT_FOUND NA NA
-d41586-020-00889-6 US National Cancer Institute ORGANIZATION NOT_FOUND NA NA
-d41586-020-00889-6 Oregon Health & Science University ORGANIZATION NOT_FOUND NA NA
-d41586-020-00889-6 SWOG Cancer Research Network ORGANIZATION NOT_FOUND NA NA
-d41586-020-00889-6 Switzerland COUNTRY Switzerland Europe Western Europe
-d41586-020-00889-6 Yale University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Connecticut STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00889-6 Harvard ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Yale ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Eli Lilly ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00889-6 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00889-6 Nebraska STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00889-6 Indiana STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-00941-5 China COUNTRY China China China
-d41586-020-00941-5 India COUNTRY India Asia Southern Asia
-d41586-020-00941-5 Italy COUNTRY Italy Europe Southern Europe
-d41586-020-00941-5 Congress ORGANIZATION NOT_FOUND NA NA
-d41586-020-00941-5 House of Representatives ORGANIZATION NOT_FOUND NA NA
-d41586-020-00941-5 US Environmental Protection Agency ORGANIZATION NOT_FOUND NA NA
-d41586-020-00941-5 Center for International Climate Research ORGANIZATION NOT_FOUND NA NA
-d41586-020-00941-5 ICAO ORGANIZATION NOT_FOUND NA NA
-d41586-020-00941-5 Eurasia Group ORGANIZATION NOT_FOUND NA NA
-d41586-020-00941-5 United Nations International Civil Aviation Organization ORGANIZATION NOT_FOUND NA NA
-d41586-020-00941-5 World Resources Institute ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00941-5 US COUNTRY United States of America (USA) Americas Northern America
-d41586-020-00941-5 Environmental Defense Fund ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-00941-5 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01114-0 European Space Agency ORGANIZATION France Europe Western Europe
-d41586-020-01114-0 ESA ORGANIZATION NOT_CLEAR NA NA
-d41586-020-01114-0 NASA ORGANIZATION NOT_FOUND NA NA
-d41586-020-01114-0 California Institute of Technology ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01587-z Brazil COUNTRY Brazil Brazil Brazil
-d41586-020-01587-z University of Northern British Columbia ORGANIZATION Canada Americas Northern America
-d41586-020-01587-z Canada COUNTRY Canada Americas Northern America
-d41586-020-01587-z Costa Rica COUNTRY Costa Rica Americas Central America
-d41586-020-01587-z Germany COUNTRY Germany Europe Western Europe
-d41586-020-01587-z Honduras COUNTRY Honduras Americas Central America
-d41586-020-01587-z Italy COUNTRY Italy Europe Southern Europe
-d41586-020-01587-z Netherlands COUNTRY Netherlands Europe Western Europe
-d41586-020-01587-z University of Groningen ORGANIZATION Netherlands Europe Western Europe
-d41586-020-01587-z University of Auckland ORGANIZATION New Zealand Oceania Australia and New Zealand
-d41586-020-01587-z New Zealand COUNTRY New Zealand Oceania Australia and New Zealand
-d41586-020-01587-z Nicaragua COUNTRY Nicaragua Americas Central America
-d41586-020-01587-z Heidelberg University ORGANIZATION NOT_CLEAR NA NA
-d41586-020-01587-z Centers for Disease Control and Prevention ORGANIZATION NOT_FOUND NA NA
-d41586-020-01587-z Association of American Universities ORGANIZATION NOT_FOUND NA NA
-d41586-020-01587-z University of Central America ORGANIZATION NOT_FOUND NA NA
-d41586-020-01587-z University of Padua ORGANIZATION NOT_FOUND NA NA
-d41586-020-01587-z WHO ORGANIZATION NOT_FOUND NA NA
-d41586-020-01587-z United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-d41586-020-01587-z United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01587-z University of California ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01587-z America COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01587-z Yale University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01587-z Connecticut STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-01756-0 Argentina COUNTRY Argentina Americas South America
-d41586-020-01756-0 University of São Paulo ORGANIZATION Brazil Brazil Brazil
-d41586-020-01756-0 Brazil COUNTRY Brazil Brazil Brazil
-d41586-020-01756-0 Chile COUNTRY Chile Americas South America
-d41586-020-01756-0 Pontifical Catholic University of Chile ORGANIZATION Chile Americas South America
-d41586-020-01756-0 China COUNTRY China China China
-d41586-020-01756-0 National Autonomous University of Mexico ORGANIZATION Mexico Americas Central America
-d41586-020-01756-0 Mexico COUNTRY Mexico Americas Central America
-d41586-020-01756-0 FARVET ORGANIZATION NOT_FOUND NA NA
-d41586-020-01756-0 Monterrey Institute of Technology and Higher Education ORGANIZATION NOT_FOUND NA NA
-d41586-020-01756-0 Sinergium Biotech ORGANIZATION NOT_FOUND NA NA
-d41586-020-01756-0 Butantan Institute ORGANIZATION NOT_FOUND NA NA
-d41586-020-01756-0 Cayetano Heredia University ORGANIZATION Peru Americas South America
-d41586-020-01756-0 Peru COUNTRY Peru Americas South America
-d41586-020-01756-0 Duke University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01756-0 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01756-0 America COUNTRY United States of America (USA) Americas Northern America
-d41586-020-01756-0 Baylor College of Medicine ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-01756-0 Texas STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-01756-0 North Carolina STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-02821-4 Belgium COUNTRY Belgium Europe Western Europe
-d41586-020-02821-4 New Brunswick STATE_OR_PROVINCE Canada Americas Northern America
-d41586-020-02821-4 Maryland STATE_OR_PROVINCE NOT_CLEAR NA NA
-d41586-020-02821-4 US National Institute of Allergy ORGANIZATION NOT_FOUND NA NA
-d41586-020-02821-4 Royal Free Hospital ORGANIZATION NOT_FOUND NA NA
-d41586-020-02821-4 UK Medicines and Healthcare Regulatory Agency ORGANIZATION NOT_FOUND NA NA
-d41586-020-02821-4 MHRA ORGANIZATION NOT_FOUND NA NA
-d41586-020-02821-4 University of Maryland School of Medicine ORGANIZATION NOT_FOUND NA NA
-d41586-020-02821-4 NIAID ORGANIZATION NOT_FOUND NA NA
-d41586-020-02821-4 Rutgers University ORGANIZATION NOT_FOUND NA NA
-d41586-020-02821-4 Lurie Children's Hospital and Northwestern University ORGANIZATION NOT_FOUND NA NA
-d41586-020-02821-4 Colorado State University in Fort Collins ORGANIZATION NOT_FOUND NA NA
-d41586-020-02821-4 Imperial College London ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 London School of Hygiene and Tropical Medicine ORGANIZATION United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 UK COUNTRY United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-d41586-020-02821-4 New Jersey STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-02821-4 Illinois STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-02835-y Australian Nuclear Science and Technology Organisation ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Commonwealth Scientific and Industrial Research Organisation ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y University of Sydney ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y James Cook University ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Australian National University ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y CSIRO ORGANIZATION Australia Oceania Australia and New Zealand
-d41586-020-02835-y Australia COUNTRY Australia Oceania Australia and New Zealand
-d41586-020-02835-y Senate ORGANIZATION India Asia Southern Asia
-d41586-020-02835-y Victoria University ORGANIZATION NOT_CLEAR NA NA
-d41586-020-02835-y Australian Research Council ORGANIZATION NOT_FOUND NA NA
-d41586-020-02835-y National Health and Medical Research Council ORGANIZATION NOT_FOUND NA NA
-d41586-020-02835-y Australian Institute of Marine Sciences ORGANIZATION NOT_FOUND NA NA
-d41586-020-02835-y Australian Academy of Science ORGANIZATION NOT_FOUND NA NA
-d41586-020-02835-y Research Support Program ORGANIZATION NOT_FOUND NA NA
-d41586-020-02835-y Group of Eight ORGANIZATION NOT_FOUND NA NA
-d41586-020-02835-y CCS ORGANIZATION NOT_FOUND NA NA
-d41586-020-02835-y Australian Renewable Energy Agency ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 Senate ORGANIZATION India Asia Southern Asia
-d41586-020-03495-8 Food and Drug Administration ORGANIZATION NOT_CLEAR NA NA
-d41586-020-03495-8 California STATE_OR_PROVINCE NOT_CLEAR NA NA
-d41586-020-03495-8 Department of Health and Human Services ORGANIZATION NOT_CLEAR NA NA
-d41586-020-03495-8 US Centers for Disease Control and Prevention ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 CDC ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 Yale School of Medicine ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 Harvard T.H. Chan School of Public Health ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 Massachusetts General Hospital ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 Harvard Medical School ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 Joint United Nations Programme ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 Harris County Public Health ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 Equity Task Force ORGANIZATION NOT_FOUND NA NA
-d41586-020-03495-8 World Health Organization ORGANIZATION Switzerland Europe Western Europe
-d41586-020-03495-8 George Mason University ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Twitter ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Arizona STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-03495-8 United States COUNTRY United States of America (USA) Americas Northern America
-d41586-020-03495-8 National Institutes of Health ORGANIZATION United States of America (USA) Americas Northern America
-d41586-020-03495-8 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-03495-8 Texas STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-03495-8 US COUNTRY United States of America (USA) Americas Northern America
-d41586-020-03495-8 Connecticut STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-d41586-020-03495-8 Washington STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 University of Sydney ORGANIZATION Australia Oceania Australia and New Zealand
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 Australia COUNTRY Australia Oceania Australia and New Zealand
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 Liberia COUNTRY Liberia Africa Western Africa
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 United Nations ORGANIZATION NOT_CLEAR NA NA
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 Lancet ORGANIZATION NOT_FOUND NA NA
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 US National Academy of Medicine ORGANIZATION NOT_FOUND NA NA
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 WHO ORGANIZATION NOT_FOUND NA NA
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 World Health Organization ORGANIZATION Switzerland Europe Western Europe
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 London School of Hygiene and Tropical Medicine ORGANIZATION United Kingdom (UK) Europe Northern Europe
-ebola-experience-leaves-world-no-less-vulnerable-1.18844 Harvard University ORGANIZATION United States of America (USA) Americas Northern America
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Crisanti ORGANIZATION NOT_FOUND NA NA
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Imperial College London ORGANIZATION United Kingdom (UK) Europe Northern Europe
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 University of California ORGANIZATION United States of America (USA) Americas Northern America
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Harvard University ORGANIZATION United States of America (USA) Americas Northern America
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 US COUNTRY United States of America (USA) Americas Northern America
-mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-news.2010.179.html RI ORGANIZATION NOT_CLEAR NA NA
-news.2010.179.html RI STATE_OR_PROVINCE NOT_CLEAR NA NA
-news.2010.179.html Greenfield ORGANIZATION NOT_FOUND NA NA
-news.2010.179.html Queen Mary University London ORGANIZATION NOT_FOUND NA NA
-news.2010.179.html Di Ferranti ORGANIZATION NOT_FOUND NA NA
-news.2010.179.html University of Oxford ORGANIZATION United Kingdom (UK) Europe Northern Europe
-news.2010.179.html United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-news.2010.278.html NASA ORGANIZATION NOT_FOUND NA NA
-news.2010.278.html Johnson Space Center ORGANIZATION NOT_FOUND NA NA
-news.2010.278.html Spirit ORGANIZATION NOT_FOUND NA NA
-news.2010.278.html California Institute of Technology ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.278.html University of Arizona ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.365.html University of Reims ORGANIZATION France Europe Western Europe
-news.2010.365.html France COUNTRY France Europe Western Europe
-news.2010.365.html CO ORGANIZATION NOT_CLEAR NA NA
-news.2010.365.html CO STATE_OR_PROVINCE NOT_CLEAR NA NA
-news.2010.365.html Journal of Agricultural and Food Chemistry ORGANIZATION NOT_FOUND NA NA
-news.2010.365.html the research department of Moët & Chandon ORGANIZATION NOT_FOUND NA NA
-news.2010.365.html University of California ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.377.html Indonesia COUNTRY Indonesia Asia South-Eastern Asia
-news.2010.377.html Netherlands COUNTRY Netherlands Europe Western Europe
-news.2010.377.html Institute of Technology Bandung ORGANIZATION NOT_FOUND NA NA
-news.2010.377.html Rutgers University ORGANIZATION NOT_FOUND NA NA
-news.2010.377.html Republic of Georgia COUNTRY Republic of Georgia Republic of Georgia Republic of Georgia
-news.2010.377.html University of Iowa ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.377.html University of Texas at Austin ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.377.html New Jersey STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-news.2010.377.html Georgia STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-news.2010.377.html United States COUNTRY United States of America (USA) Americas Northern America
-news.2010.402.html MIT ORGANIZATION NOT_CLEAR NA NA
-news.2010.402.html Hertz ORGANIZATION NOT_FOUND NA NA
-news.2010.402.html Harvard University ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.402.html Georgia Institute of Technology ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.402.html Massachusetts Institute of Technology ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.404.html University of Freiburg ORGANIZATION Germany Europe Western Europe
-news.2010.404.html Germany COUNTRY Germany Europe Western Europe
-news.2010.404.html Max Planck Institute for Chemistry ORGANIZATION NOT_FOUND NA NA
-news.2010.404.html Greenpeace Russia ORGANIZATION NOT_FOUND NA NA
-news.2010.404.html ITAR TASS ORGANIZATION NOT_FOUND NA NA
-news.2010.404.html GFMC ORGANIZATION NOT_FOUND NA NA
-news.2010.404.html Russia COUNTRY Russia Russia Russia
-news.2010.404.html Russian Federation COUNTRY Russian Federation Russian Federation Russian Federation
-news.2010.404.html University of Portsmouth ORGANIZATION United Kingdom (UK) Europe Northern Europe
-news.2010.404.html UK COUNTRY United Kingdom (UK) Europe Northern Europe
-news.2010.585.html Guatemala COUNTRY Guatemala Americas Central America
-news.2010.585.html Mexico COUNTRY Mexico Americas Central America
-news.2010.585.html US Environmental Protection Agency ORGANIZATION NOT_FOUND NA NA
-news.2010.585.html Pink Bollworm Rearing Facility ORGANIZATION NOT_FOUND NA NA
-news.2010.585.html University of Arizona ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.585.html North Carolina State University ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.585.html University of Minnesota ORGANIZATION United States of America (USA) Americas Northern America
-news.2010.585.html United States COUNTRY United States of America (USA) Americas Northern America
-news.2010.585.html America COUNTRY United States of America (USA) Americas Northern America
-news.2010.585.html Arizona STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 University of Trieste ORGANIZATION Italy Europe Southern Europe
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 Italy COUNTRY Italy Europe Southern Europe
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 University of Geneva ORGANIZATION Switzerland Europe Western Europe
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 Switzerland COUNTRY Switzerland Europe Western Europe
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 University of Illinois ORGANIZATION United States of America (USA) Americas Northern America
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 Urbana-Champaign ORGANIZATION United States of America (USA) Americas Northern America
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 American Physical Society ORGANIZATION United States of America (USA) Americas Northern America
-quantum-technology-probes-ultimate-limits-of-vision-1.17731 Ohio STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-russian-secret-service-to-vet-research-papers-1.18602 A. N. Belozersky Institute of Physico-Chemical Biology ORGANIZATION NOT_FOUND NA NA
-russian-secret-service-to-vet-research-papers-1.18602 Federal Security Service ORGANIZATION NOT_FOUND NA NA
-russian-secret-service-to-vet-research-papers-1.18602 Belozersky Institute ORGANIZATION NOT_FOUND NA NA
-russian-secret-service-to-vet-research-papers-1.18602 First Department ORGANIZATION NOT_FOUND NA NA
-russian-secret-service-to-vet-research-papers-1.18602 Lomonosov Moscow State University ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 FSB ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Russian Academy of Sciences ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Skolkovo Institute of Science and Technology ORGANIZATION Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 Russia COUNTRY Russia Russia Russia
-russian-secret-service-to-vet-research-papers-1.18602 MSU ORGANIZATION South Korea South Korea South Korea
-russian-secret-service-to-vet-research-papers-1.18602 Spain COUNTRY Spain Europe Southern Europe
-russian-secret-service-to-vet-research-papers-1.18602 Ukraine COUNTRY Ukraine Europe Eastern Europe
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Mexico COUNTRY Mexico Americas Central America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 California STATE_OR_PROVINCE NOT_CLEAR NA NA
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Environmental Research ORGANIZATION NOT_CLEAR NA NA
-severe-weather-linked-more-strongly-to-global-warming-1.17828 US National Oceanic and Atmospheric Administration ORGANIZATION NOT_FOUND NA NA
-severe-weather-linked-more-strongly-to-global-warming-1.17828 National Center for Atmospheric Research ORGANIZATION United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Stanford University ORGANIZATION United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 United States COUNTRY United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 US COUNTRY United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 America COUNTRY United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Colorado STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-severe-weather-linked-more-strongly-to-global-warming-1.17828 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-structural-biologist-named-president-of-uk-royal-society-1.17153 India COUNTRY India Asia Southern Asia
-structural-biologist-named-president-of-uk-royal-society-1.17153 Nature ORGANIZATION NOT_CLEAR NA NA
-structural-biologist-named-president-of-uk-royal-society-1.17153 Royal Society ORGANIZATION NOT_CLEAR NA NA
-structural-biologist-named-president-of-uk-royal-society-1.17153 Medical Research Council ORGANIZATION NOT_CLEAR NA NA
-structural-biologist-named-president-of-uk-royal-society-1.17153 Laboratory for Molecular Biology ORGANIZATION NOT_FOUND NA NA
-structural-biologist-named-president-of-uk-royal-society-1.17153 Science Policy Centre ORGANIZATION NOT_FOUND NA NA
-structural-biologist-named-president-of-uk-royal-society-1.17153 UK Research Councils ORGANIZATION NOT_FOUND NA NA
-structural-biologist-named-president-of-uk-royal-society-1.17153 European Union ORGANIZATION NOT_FOUND NA NA
-structural-biologist-named-president-of-uk-royal-society-1.17153 Campaign for Science and Engineering ORGANIZATION NOT_FOUND NA NA
-structural-biologist-named-president-of-uk-royal-society-1.17153 MRC ORGANIZATION South Africa Africa Southern Africa
-structural-biologist-named-president-of-uk-royal-society-1.17153 University of Sussex ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 Francis Crick Institute ORGANIZATION United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 United Kingdom COUNTRY United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 UK COUNTRY United Kingdom (UK) Europe Northern Europe
-structural-biologist-named-president-of-uk-royal-society-1.17153 United States COUNTRY United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 England COUNTRY England England England
-us-precision-medicine-proposal-sparks-questions-1.16774 NIH ORGANIZATION NOT_CLEAR NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 House ORGANIZATION NOT_CLEAR NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 California STATE_OR_PROVINCE NOT_CLEAR NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 Congress ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 House of Representatives' Energy & Commerce Committee ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 US National Institutes of Health ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 Genentech ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 Biotechnology Industry Organization ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 US Department of Veterans Affairs ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 21st Century Cures ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 Million Veteran Program ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 UK National Health Service ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 Human Genome Project ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 National Children's Study ORGANIZATION NOT_FOUND NA NA
-us-precision-medicine-proposal-sparks-questions-1.16774 Geisinger Health System ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Pennsylvania STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Boston University ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 US COUNTRY United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 White House ORGANIZATION United States of America (USA) Americas Northern America
-us-precision-medicine-proposal-sparks-questions-1.16774 Massachusetts STATE_OR_PROVINCE United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 National Academy of Medicine ORGANIZATION Argentina Americas South America
-us-science-academies-take-on-human-genome-editing-1.17581 NAS ORGANIZATION NOT_CLEAR NA NA
-us-science-academies-take-on-human-genome-editing-1.17581 NAM ORGANIZATION NOT_CLEAR NA NA
-us-science-academies-take-on-human-genome-editing-1.17581 California STATE_OR_PROVINCE NOT_CLEAR NA NA
-us-science-academies-take-on-human-genome-editing-1.17581 US National Academy of Sciences ORGANIZATION NOT_FOUND NA NA
-us-science-academies-take-on-human-genome-editing-1.17581 Center for Genetics and Society ORGANIZATION NOT_FOUND NA NA
-us-science-academies-take-on-human-genome-editing-1.17581 University of California, Berkeley ORGANIZATION United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 Stanford University ORGANIZATION United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 United States COUNTRY United States of America (USA) Americas Northern America
-us-science-academies-take-on-human-genome-editing-1.17581 US COUNTRY United States of America (USA) Americas Northern America
+file_id text ner address.country_code
+4641259a.html connecticut STATE_OR_PROVINCE us
+4641259a.html ms STATE_OR_PROVINCE us
+4641259a.html national center for genome resources in santa fe ORGANIZATION us
+4641259a.html new mexico STATE_OR_PROVINCE us
+4641259a.html university of california ORGANIZATION us
+4641259a.html us COUNTRY us
+4641259a.html yale university ORGANIZATION us
+464472b.html american geophysical union ORGANIZATION us
+464472b.html antarctic survey ORGANIZATION gb
+464472b.html canada COUNTRY ca
+464472b.html columbia university's lamont-doherty earth observatory ORGANIZATION NONE
+464472b.html goddard space flight center ORGANIZATION us
+464472b.html maryland STATE_OR_PROVINCE us
+464472b.html nasa ORGANIZATION us
+464472b.html new york STATE_OR_PROVINCE us
+464472b.html northern illinois university in dekalb ORGANIZATION us
+464472b.html ontario STATE_OR_PROVINCE ca
+464472b.html ross ice shelf ORGANIZATION NOT_FOUND
+464472b.html russia COUNTRY ru
+464472b.html united kingdom COUNTRY gb
+464472b.html united states COUNTRY us
+464472b.html us COUNTRY us
+4661029a.html american chemical society ORGANIZATION us
+4661029a.html ancora pharmaceuticals ORGANIZATION NONE
+4661029a.html canada COUNTRY ca
+4661029a.html germany COUNTRY de
+4661029a.html iowa state university ORGANIZATION us
+4661029a.html leiden university ORGANIZATION nl
+4661029a.html lucella biosciences ORGANIZATION NONE
+4661029a.html massachusetts STATE_OR_PROVINCE us
+4661029a.html max planck institute of colloids and interfaces ORGANIZATION NONE
+4661029a.html netherlands COUNTRY nl
+4661029a.html university of alberta ORGANIZATION ca
+4661029a.html university of georgia ORGANIZATION us
+bat-drinks-using-tongue-pump-trick-1.18434 canada COUNTRY ca
+bat-drinks-using-tongue-pump-trick-1.18434 germany COUNTRY de
+bat-drinks-using-tongue-pump-trick-1.18434 st lawrence river institute of environmental sciences ORGANIZATION NONE
+bat-drinks-using-tongue-pump-trick-1.18434 university of ulm ORGANIZATION de
+climatologists-to-physicists-your-planet-needs-you-1.17270 american institute of physics in college park ORGANIZATION us
+climatologists-to-physicists-your-planet-needs-you-1.17270 australia COUNTRY au
+climatologists-to-physicists-your-planet-needs-you-1.17270 belgium COUNTRY be
+climatologists-to-physicists-your-planet-needs-you-1.17270 catholic university of leuven ORGANIZATION NONE
+climatologists-to-physicists-your-planet-needs-you-1.17270 germany COUNTRY de
+climatologists-to-physicists-your-planet-needs-you-1.17270 laboratory of dynamic meteorology ORGANIZATION NONE
+climatologists-to-physicists-your-planet-needs-you-1.17270 maryland STATE_OR_PROVINCE us
+climatologists-to-physicists-your-planet-needs-you-1.17270 max planck institute for meteorology ORGANIZATION NONE
+climatologists-to-physicists-your-planet-needs-you-1.17270 monash university ORGANIZATION au
+climatologists-to-physicists-your-planet-needs-you-1.17270 nature geoscience ORGANIZATION NONE
+climatologists-to-physicists-your-planet-needs-you-1.17270 uk COUNTRY gb
+climatologists-to-physicists-your-planet-needs-you-1.17270 united states COUNTRY us
+climatologists-to-physicists-your-planet-needs-you-1.17270 university of cambridge ORGANIZATION gb
+climatologists-to-physicists-your-planet-needs-you-1.17270 university of leeds ORGANIZATION gb
+d41586-020-00166-6 australia COUNTRY au
+d41586-020-00166-6 bedford ORGANIZATION gb
+d41586-020-00166-6 china COUNTRY cn
+d41586-020-00166-6 fred hutchinson cancer research center ORGANIZATION us
+d41586-020-00166-6 imperial college london ORGANIZATION gb
+d41586-020-00166-6 national engineering research center for the emergence drugs ORGANIZATION NONE
+d41586-020-00166-6 national health commission ORGANIZATION ca
+d41586-020-00166-6 pasteur institute ORGANIZATION fr
+d41586-020-00166-6 thailand COUNTRY th
+d41586-020-00166-6 uk COUNTRY gb
+d41586-020-00166-6 united states COUNTRY us
+d41586-020-00166-6 university of cambridge ORGANIZATION gb
+d41586-020-00166-6 university of edinburgh ORGANIZATION gb
+d41586-020-00166-6 university of glasgow ORGANIZATION gb
+d41586-020-00166-6 university of new south wales ORGANIZATION au
+d41586-020-00166-6 university of nottingham ORGANIZATION gb
+d41586-020-00166-6 washington STATE_OR_PROVINCE us
+d41586-020-00166-6 who ORGANIZATION MULTI
+d41586-020-00166-6 world health organization ORGANIZATION MULTI
+d41586-020-00166-6 yunnan STATE_OR_PROVINCE cn
+d41586-020-00365-1 esa ORGANIZATION MULTI
+d41586-020-00365-1 esa's european space research and technology centre ORGANIZATION NONE
+d41586-020-00365-1 european space agency ORGANIZATION MULTI
+d41586-020-00365-1 florida STATE_OR_PROVINCE us
+d41586-020-00365-1 imperial college london ORGANIZATION gb
+d41586-020-00365-1 johns hopkins university applied physics laboratory ORGANIZATION us
+d41586-020-00365-1 maryland STATE_OR_PROVINCE us
+d41586-020-00365-1 nasa ORGANIZATION us
+d41586-020-00365-1 netherlands COUNTRY nl
+d41586-020-00365-1 science mission directorate ORGANIZATION NONE
+d41586-020-00365-1 solar orbiter ORGANIZATION NONE
+d41586-020-00889-6 addex therapeutics ORGANIZATION NONE
+d41586-020-00889-6 connecticut STATE_OR_PROVINCE us
+d41586-020-00889-6 eli lilly ORGANIZATION gb
+d41586-020-00889-6 harvard ORGANIZATION us
+d41586-020-00889-6 indiana STATE_OR_PROVINCE us
+d41586-020-00889-6 massachusetts STATE_OR_PROVINCE us
+d41586-020-00889-6 nebraska STATE_OR_PROVINCE us
+d41586-020-00889-6 oregon health & science university ORGANIZATION us
+d41586-020-00889-6 roche ORGANIZATION ch
+d41586-020-00889-6 switzerland COUNTRY ch
+d41586-020-00889-6 swog cancer research network ORGANIZATION NONE
+d41586-020-00889-6 us food and drug administration ORGANIZATION us
+d41586-020-00889-6 us national cancer institute ORGANIZATION us
+d41586-020-00889-6 us national institutes of health ORGANIZATION us
+d41586-020-00889-6 women's hospital ORGANIZATION gb
+d41586-020-00889-6 yale ORGANIZATION us
+d41586-020-00889-6 yale university ORGANIZATION us
+d41586-020-00941-5 center for international climate research ORGANIZATION NONE
+d41586-020-00941-5 china COUNTRY cn
+d41586-020-00941-5 congress ORGANIZATION NONE
+d41586-020-00941-5 environmental defense fund ORGANIZATION us
+d41586-020-00941-5 eurasia group ORGANIZATION NONE
+d41586-020-00941-5 house of representatives ORGANIZATION us
+d41586-020-00941-5 icao ORGANIZATION ca
+d41586-020-00941-5 india COUNTRY in
+d41586-020-00941-5 italy COUNTRY it
+d41586-020-00941-5 united nations international civil aviation organization ORGANIZATION NONE
+d41586-020-00941-5 united states COUNTRY us
+d41586-020-00941-5 us COUNTRY us
+d41586-020-00941-5 us environmental protection agency ORGANIZATION us
+d41586-020-00941-5 world resources institute ORGANIZATION us
+d41586-020-01114-0 california institute of technology ORGANIZATION us
+d41586-020-01114-0 esa ORGANIZATION MULTI
+d41586-020-01114-0 european space agency ORGANIZATION MULTI
+d41586-020-01114-0 nasa ORGANIZATION us
+d41586-020-01114-0 utah STATE_OR_PROVINCE us
+d41586-020-01587-z america COUNTRY NONE
+d41586-020-01587-z association of american universities ORGANIZATION MULTI
+d41586-020-01587-z brazil COUNTRY br
+d41586-020-01587-z canada COUNTRY ca
+d41586-020-01587-z centers for disease control and prevention ORGANIZATION us
+d41586-020-01587-z connecticut STATE_OR_PROVINCE us
+d41586-020-01587-z costa rica COUNTRY cr
+d41586-020-01587-z germany COUNTRY de
+d41586-020-01587-z heidelberg university ORGANIZATION us
+d41586-020-01587-z honduras COUNTRY hn
+d41586-020-01587-z italy COUNTRY it
+d41586-020-01587-z netherlands COUNTRY nl
+d41586-020-01587-z new zealand COUNTRY nz
+d41586-020-01587-z nicaragua COUNTRY ni
+d41586-020-01587-z united kingdom COUNTRY gb
+d41586-020-01587-z united states COUNTRY us
+d41586-020-01587-z university of auckland ORGANIZATION nz
+d41586-020-01587-z university of california ORGANIZATION us
+d41586-020-01587-z university of central america ORGANIZATION au
+d41586-020-01587-z university of groningen ORGANIZATION nl
+d41586-020-01587-z university of northern british columbia ORGANIZATION ca
+d41586-020-01587-z university of padua ORGANIZATION it
+d41586-020-01587-z who ORGANIZATION MULTI
+d41586-020-01587-z yale university ORGANIZATION us
+d41586-020-01756-0 america COUNTRY NONE
+d41586-020-01756-0 argentina COUNTRY ar
+d41586-020-01756-0 baylor college of medicine ORGANIZATION us
+d41586-020-01756-0 brazil COUNTRY br
+d41586-020-01756-0 butantan institute ORGANIZATION NONE
+d41586-020-01756-0 cayetano heredia university ORGANIZATION NONE
+d41586-020-01756-0 chile COUNTRY cl
+d41586-020-01756-0 china COUNTRY cn
+d41586-020-01756-0 duke university ORGANIZATION us
+d41586-020-01756-0 farvet ORGANIZATION pe
+d41586-020-01756-0 mexico COUNTRY mx
+d41586-020-01756-0 monterrey institute of technology and higher education ORGANIZATION NONE
+d41586-020-01756-0 national autonomous university of mexico ORGANIZATION mx
+d41586-020-01756-0 north carolina STATE_OR_PROVINCE us
+d41586-020-01756-0 peru COUNTRY pe
+d41586-020-01756-0 pontifical catholic university of chile ORGANIZATION NONE
+d41586-020-01756-0 sinergium biotech ORGANIZATION NONE
+d41586-020-01756-0 texas STATE_OR_PROVINCE us
+d41586-020-01756-0 united states COUNTRY us
+d41586-020-01756-0 university of são paulo ORGANIZATION br
+d41586-020-02821-4 belgium COUNTRY be
+d41586-020-02821-4 colorado state university in fort collins ORGANIZATION us
+d41586-020-02821-4 illinois STATE_OR_PROVINCE us
+d41586-020-02821-4 imperial college london ORGANIZATION gb
+d41586-020-02821-4 london school of hygiene and tropical medicine ORGANIZATION gb
+d41586-020-02821-4 lurie children's hospital and northwestern university ORGANIZATION NONE
+d41586-020-02821-4 maryland STATE_OR_PROVINCE us
+d41586-020-02821-4 mhra ORGANIZATION NONE
+d41586-020-02821-4 new brunswick STATE_OR_PROVINCE ca
+d41586-020-02821-4 new jersey STATE_OR_PROVINCE us
+d41586-020-02821-4 niaid ORGANIZATION us
+d41586-020-02821-4 royal free hospital ORGANIZATION gb
+d41586-020-02821-4 rutgers university ORGANIZATION us
+d41586-020-02821-4 uk COUNTRY gb
+d41586-020-02821-4 uk medicines and healthcare regulatory agency ORGANIZATION NONE
+d41586-020-02821-4 united kingdom COUNTRY gb
+d41586-020-02821-4 university of maryland school of medicine ORGANIZATION NONE
+d41586-020-02821-4 us national institute of allergy ORGANIZATION us
+d41586-020-02835-y australia COUNTRY au
+d41586-020-02835-y australian academy of science ORGANIZATION au
+d41586-020-02835-y australian institute of marine sciences ORGANIZATION NONE
+d41586-020-02835-y australian national university ORGANIZATION au
+d41586-020-02835-y australian nuclear science and technology organisation ORGANIZATION NONE
+d41586-020-02835-y australian renewable energy agency ORGANIZATION NONE
+d41586-020-02835-y australian research council ORGANIZATION au
+d41586-020-02835-y ccs ORGANIZATION ve
+d41586-020-02835-y commonwealth scientific and industrial research organisation ORGANIZATION au
+d41586-020-02835-y csiro ORGANIZATION au
+d41586-020-02835-y group of eight ORGANIZATION NONE
+d41586-020-02835-y james cook university ORGANIZATION au
+d41586-020-02835-y national health and medical research council ORGANIZATION NONE
+d41586-020-02835-y research support program ORGANIZATION NONE
+d41586-020-02835-y senate ORGANIZATION NONE
+d41586-020-02835-y university of sydney ORGANIZATION au
+d41586-020-02835-y victoria university ORGANIZATION ca
+d41586-020-03495-8 arizona STATE_OR_PROVINCE us
+d41586-020-03495-8 california STATE_OR_PROVINCE us
+d41586-020-03495-8 cdc ORGANIZATION us
+d41586-020-03495-8 connecticut STATE_OR_PROVINCE us
+d41586-020-03495-8 department of health and human services ORGANIZATION us
+d41586-020-03495-8 equity task force ORGANIZATION NONE
+d41586-020-03495-8 food and drug administration ORGANIZATION us
+d41586-020-03495-8 george mason university ORGANIZATION us
+d41586-020-03495-8 harris county public health ORGANIZATION us
+d41586-020-03495-8 harvard medical school ORGANIZATION us
+d41586-020-03495-8 harvard t.h. chan school of public health ORGANIZATION NONE
+d41586-020-03495-8 joint united nations programme ORGANIZATION NONE
+d41586-020-03495-8 massachusetts STATE_OR_PROVINCE us
+d41586-020-03495-8 massachusetts general hospital ORGANIZATION us
+d41586-020-03495-8 national institutes of health ORGANIZATION us
+d41586-020-03495-8 senate ORGANIZATION NONE
+d41586-020-03495-8 texas STATE_OR_PROVINCE us
+d41586-020-03495-8 twitter ORGANIZATION us
+d41586-020-03495-8 united states COUNTRY us
+d41586-020-03495-8 us COUNTRY us
+d41586-020-03495-8 us centers for disease control and prevention ORGANIZATION us
+d41586-020-03495-8 washington STATE_OR_PROVINCE us
+d41586-020-03495-8 world health organization ORGANIZATION MULTI
+d41586-020-03495-8 yale school of medicine ORGANIZATION NONE
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 australia COUNTRY au
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 harvard university ORGANIZATION us
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 lancet ORGANIZATION pl
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 liberia COUNTRY lr
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 london school of hygiene and tropical medicine ORGANIZATION gb
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 united nations ORGANIZATION MULTI
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 university of sydney ORGANIZATION au
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 us national academy of medicine ORGANIZATION us
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 who ORGANIZATION MULTI
+ebola-experience-leaves-world-no-less-vulnerable-1.18844 world health organization ORGANIZATION MULTI
+mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 crisanti ORGANIZATION it
+mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 harvard university ORGANIZATION us
+mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 imperial college london ORGANIZATION gb
+mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 massachusetts STATE_OR_PROVINCE us
+mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 university of california ORGANIZATION us
+mosquitoes-engineered-to-pass-down-genes-that-would-wipe-out-their-species-1.18974 us COUNTRY us
+news.2010.179.html di ferranti ORGANIZATION it
+news.2010.179.html greenfield ORGANIZATION us
+news.2010.179.html queen mary university london ORGANIZATION NONE
+news.2010.179.html ri STATE_OR_PROVINCE it
+news.2010.179.html ri ORGANIZATION it
+news.2010.179.html united kingdom COUNTRY gb
+news.2010.179.html university of oxford ORGANIZATION gb
+news.2010.278.html california institute of technology ORGANIZATION us
+news.2010.278.html columbia STATE_OR_PROVINCE co
+news.2010.278.html johnson space center ORGANIZATION us
+news.2010.278.html nasa ORGANIZATION us
+news.2010.278.html spirit ORGANIZATION us
+news.2010.278.html texas STATE_OR_PROVINCE us
+news.2010.278.html university of arizona ORGANIZATION us
+news.2010.365.html co STATE_OR_PROVINCE co
+news.2010.365.html co ORGANIZATION co
+news.2010.365.html france COUNTRY fr
+news.2010.365.html journal of agricultural and food chemistry ORGANIZATION NONE
+news.2010.365.html the research department of moët & chandon ORGANIZATION NONE
+news.2010.365.html university of california ORGANIZATION us
+news.2010.365.html university of reims ORGANIZATION fr
+news.2010.377.html georgia STATE_OR_PROVINCE us
+news.2010.377.html indonesia COUNTRY id
+news.2010.377.html institute of technology bandung ORGANIZATION NONE
+news.2010.377.html netherlands COUNTRY nl
+news.2010.377.html new jersey STATE_OR_PROVINCE us
+news.2010.377.html republic of georgia COUNTRY ge
+news.2010.377.html rutgers university ORGANIZATION us
+news.2010.377.html united states COUNTRY us
+news.2010.377.html university of iowa ORGANIZATION us
+news.2010.377.html university of texas at austin ORGANIZATION us
+news.2010.402.html georgia institute of technology ORGANIZATION us
+news.2010.402.html harvard university ORGANIZATION us
+news.2010.402.html hertz ORGANIZATION us
+news.2010.402.html massachusetts STATE_OR_PROVINCE us
+news.2010.402.html massachusetts institute of technology ORGANIZATION us
+news.2010.402.html mit ORGANIZATION us
+news.2010.404.html germany COUNTRY de
+news.2010.404.html gfmc ORGANIZATION NONE
+news.2010.404.html greenpeace russia ORGANIZATION ru
+news.2010.404.html itar tass ORGANIZATION ru
+news.2010.404.html max planck institute for chemistry ORGANIZATION de
+news.2010.404.html russia COUNTRY ru
+news.2010.404.html russian federation COUNTRY ru
+news.2010.404.html uk COUNTRY gb
+news.2010.404.html university of freiburg ORGANIZATION NONE
+news.2010.404.html university of portsmouth ORGANIZATION gb
+news.2010.585.html america COUNTRY NONE
+news.2010.585.html arizona STATE_OR_PROVINCE us
+news.2010.585.html guatemala COUNTRY gt
+news.2010.585.html mexico COUNTRY mx
+news.2010.585.html north carolina state university ORGANIZATION us
+news.2010.585.html pink bollworm rearing facility ORGANIZATION NONE
+news.2010.585.html united states COUNTRY us
+news.2010.585.html university of arizona ORGANIZATION us
+news.2010.585.html university of minnesota ORGANIZATION us
+news.2010.585.html us environmental protection agency ORGANIZATION us
+quantum-technology-probes-ultimate-limits-of-vision-1.17731 american physical society ORGANIZATION us
+quantum-technology-probes-ultimate-limits-of-vision-1.17731 italy COUNTRY it
+quantum-technology-probes-ultimate-limits-of-vision-1.17731 ohio STATE_OR_PROVINCE us
+quantum-technology-probes-ultimate-limits-of-vision-1.17731 switzerland COUNTRY ch
+quantum-technology-probes-ultimate-limits-of-vision-1.17731 university of geneva ORGANIZATION ch
+quantum-technology-probes-ultimate-limits-of-vision-1.17731 university of illinois ORGANIZATION us
+quantum-technology-probes-ultimate-limits-of-vision-1.17731 university of trieste ORGANIZATION pk
+quantum-technology-probes-ultimate-limits-of-vision-1.17731 urbana-champaign ORGANIZATION us
+russian-secret-service-to-vet-research-papers-1.18602 a. n. belozersky institute of physico-chemical biology ORGANIZATION NONE
+russian-secret-service-to-vet-research-papers-1.18602 belozersky institute ORGANIZATION NONE
+russian-secret-service-to-vet-research-papers-1.18602 federal security service ORGANIZATION us
+russian-secret-service-to-vet-research-papers-1.18602 first department ORGANIZATION bo
+russian-secret-service-to-vet-research-papers-1.18602 fsb ORGANIZATION ru
+russian-secret-service-to-vet-research-papers-1.18602 lomonosov moscow state university ORGANIZATION ru
+russian-secret-service-to-vet-research-papers-1.18602 msu ORGANIZATION us
+russian-secret-service-to-vet-research-papers-1.18602 russia COUNTRY ru
+russian-secret-service-to-vet-research-papers-1.18602 russian academy of sciences ORGANIZATION ru
+russian-secret-service-to-vet-research-papers-1.18602 skolkovo institute of science and technology ORGANIZATION NONE
+russian-secret-service-to-vet-research-papers-1.18602 spain COUNTRY es
+russian-secret-service-to-vet-research-papers-1.18602 ukraine COUNTRY ua
+severe-weather-linked-more-strongly-to-global-warming-1.17828 america COUNTRY NONE
+severe-weather-linked-more-strongly-to-global-warming-1.17828 california STATE_OR_PROVINCE us
+severe-weather-linked-more-strongly-to-global-warming-1.17828 colorado STATE_OR_PROVINCE us
+severe-weather-linked-more-strongly-to-global-warming-1.17828 environmental research ORGANIZATION us
+severe-weather-linked-more-strongly-to-global-warming-1.17828 massachusetts STATE_OR_PROVINCE us
+severe-weather-linked-more-strongly-to-global-warming-1.17828 mexico COUNTRY mx
+severe-weather-linked-more-strongly-to-global-warming-1.17828 national center for atmospheric research ORGANIZATION us
+severe-weather-linked-more-strongly-to-global-warming-1.17828 stanford university ORGANIZATION us
+severe-weather-linked-more-strongly-to-global-warming-1.17828 united states COUNTRY us
+severe-weather-linked-more-strongly-to-global-warming-1.17828 us COUNTRY us
+severe-weather-linked-more-strongly-to-global-warming-1.17828 us national oceanic and atmospheric administration ORGANIZATION us
+structural-biologist-named-president-of-uk-royal-society-1.17153 campaign for science and engineering ORGANIZATION NONE
+structural-biologist-named-president-of-uk-royal-society-1.17153 european union ORGANIZATION MULTI
+structural-biologist-named-president-of-uk-royal-society-1.17153 francis crick institute ORGANIZATION gb
+structural-biologist-named-president-of-uk-royal-society-1.17153 india COUNTRY in
+structural-biologist-named-president-of-uk-royal-society-1.17153 laboratory for molecular biology ORGANIZATION gb
+structural-biologist-named-president-of-uk-royal-society-1.17153 medical research council ORGANIZATION NONE
+structural-biologist-named-president-of-uk-royal-society-1.17153 mrc ORGANIZATION NONE
+structural-biologist-named-president-of-uk-royal-society-1.17153 nature ORGANIZATION NONE
+structural-biologist-named-president-of-uk-royal-society-1.17153 royal society ORGANIZATION gb
+structural-biologist-named-president-of-uk-royal-society-1.17153 science policy centre ORGANIZATION gb
+structural-biologist-named-president-of-uk-royal-society-1.17153 uk COUNTRY gb
+structural-biologist-named-president-of-uk-royal-society-1.17153 uk research councils ORGANIZATION gb
+structural-biologist-named-president-of-uk-royal-society-1.17153 united kingdom COUNTRY gb
+structural-biologist-named-president-of-uk-royal-society-1.17153 united states COUNTRY us
+structural-biologist-named-president-of-uk-royal-society-1.17153 university of sussex ORGANIZATION gb
+us-precision-medicine-proposal-sparks-questions-1.16774 21st century cures ORGANIZATION NONE
+us-precision-medicine-proposal-sparks-questions-1.16774 biotechnology industry organization ORGANIZATION NONE
+us-precision-medicine-proposal-sparks-questions-1.16774 boston university ORGANIZATION us
+us-precision-medicine-proposal-sparks-questions-1.16774 california STATE_OR_PROVINCE us
+us-precision-medicine-proposal-sparks-questions-1.16774 congress ORGANIZATION NONE
+us-precision-medicine-proposal-sparks-questions-1.16774 england COUNTRY gb
+us-precision-medicine-proposal-sparks-questions-1.16774 geisinger health system ORGANIZATION NONE
+us-precision-medicine-proposal-sparks-questions-1.16774 genentech ORGANIZATION us
+us-precision-medicine-proposal-sparks-questions-1.16774 house ORGANIZATION NONE
+us-precision-medicine-proposal-sparks-questions-1.16774 house of representatives' energy & commerce committee ORGANIZATION NONE
+us-precision-medicine-proposal-sparks-questions-1.16774 human genome project ORGANIZATION NONE
+us-precision-medicine-proposal-sparks-questions-1.16774 massachusetts STATE_OR_PROVINCE us
+us-precision-medicine-proposal-sparks-questions-1.16774 million veteran program ORGANIZATION NONE
+us-precision-medicine-proposal-sparks-questions-1.16774 national children's study ORGANIZATION NONE
+us-precision-medicine-proposal-sparks-questions-1.16774 nih ORGANIZATION us
+us-precision-medicine-proposal-sparks-questions-1.16774 pennsylvania STATE_OR_PROVINCE us
+us-precision-medicine-proposal-sparks-questions-1.16774 uk national health service ORGANIZATION gb
+us-precision-medicine-proposal-sparks-questions-1.16774 us COUNTRY us
+us-precision-medicine-proposal-sparks-questions-1.16774 us department of veterans affairs ORGANIZATION us
+us-precision-medicine-proposal-sparks-questions-1.16774 us national institutes of health ORGANIZATION us
+us-precision-medicine-proposal-sparks-questions-1.16774 white house ORGANIZATION us
+us-science-academies-take-on-human-genome-editing-1.17581 california STATE_OR_PROVINCE us
+us-science-academies-take-on-human-genome-editing-1.17581 center for genetics and society ORGANIZATION NONE
+us-science-academies-take-on-human-genome-editing-1.17581 nam ORGANIZATION ao
+us-science-academies-take-on-human-genome-editing-1.17581 nas ORGANIZATION bs
+us-science-academies-take-on-human-genome-editing-1.17581 national academy of medicine ORGANIZATION us
+us-science-academies-take-on-human-genome-editing-1.17581 stanford university ORGANIZATION us
+us-science-academies-take-on-human-genome-editing-1.17581 united states COUNTRY us
+us-science-academies-take-on-human-genome-editing-1.17581 university of california, berkeley ORGANIZATION us
+us-science-academies-take-on-human-genome-editing-1.17581 us COUNTRY us
+us-science-academies-take-on-human-genome-editing-1.17581 us national academy of sciences ORGANIZATION us
diff --git a/data/reference_data/osm_cache.tsv b/data/reference_data/osm_cache.tsv
new file mode 100644
index 000000000..5725d825a
--- /dev/null
+++ b/data/reference_data/osm_cache.tsv
@@ -0,0 +1,10758 @@
+query address.country_code un_region un_subregion hand_edited Freq query_date place_id osm_type display_name class type importance address.country reviewed
+uk gb Europe Northern Europe FALSE 1201 2021-02-03 258411454 relation United Kingdom boundary administrative 0.872378013283733 United Kingdom TRUE
+us us Americas Northern America FALSE 1173 2021-02-03 257984054 relation United States boundary administrative 0.935691367457589 United States TRUE
+california us Americas Northern America FALSE 1068 2021-02-03 258350986 relation "California, United States" boundary administrative 0.912136384157707 United States TRUE
+united states us Americas Northern America FALSE 1060 2021-02-03 257984054 relation United States boundary administrative 1.13569136745759 United States TRUE
+massachusetts us Americas Northern America FALSE 770 2021-02-03 258278823 relation "Massachusetts, United States" boundary administrative 0.836449761303479 United States TRUE
+germany de Europe Western Europe FALSE 697 2021-02-03 257692299 relation Deutschland boundary administrative 0.889681489172255 Deutschland TRUE
+china cn Asia Eastern Asia FALSE 674 2021-02-03 257605389 relation ä¸å›½ boundary administrative 0.87882659637803 ä¸å›½ TRUE
+maryland us Americas Northern America FALSE 528 2021-02-03 258170637 relation "Maryland, United States" boundary administrative 0.824620353023131 United States TRUE
+nasa us Americas Northern America FALSE 524 2021-02-03 99133114 way "Lyndon B. Johnson Space Center, 2101, NASA Parkway, Houston, Harris County, Texas, 77058, United States" tourism attraction 0.618056742388072 United States TRUE
+canada ca Americas Northern America FALSE 513 2021-02-03 258158704 relation Canada boundary administrative 0.966125910965408 Canada TRUE
+new york us Americas Northern America FALSE 479 2021-02-03 258355858 relation "New York, United States" boundary administrative 1.01757661145185 United States TRUE
+australia au Oceania Australia and New Zealand FALSE 423 2021-02-03 257740098 relation Australia boundary administrative 0.952135063915111 Australia TRUE
+japan jp Asia Eastern Asia FALSE 406 2021-02-03 258446007 relation 日本 boundary administrative 0.871013326546246 日本 TRUE
+university of california us Americas Northern America FALSE 404 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 0.948194378261701 United States TRUE
+united kingdom gb Europe Northern Europe FALSE 353 2021-02-03 258411454 relation United Kingdom boundary administrative 1.07237801328373 United Kingdom TRUE
+switzerland ch Europe Western Europe FALSE 344 2021-02-03 257695656 relation Schweiz/Suisse/Svizzera/Svizra boundary administrative 0.826485171575252 Schweiz/Suisse/Svizzera/Svizra TRUE
+france fr Europe Western Europe FALSE 339 2021-02-03 258401904 relation France boundary administrative 1.01332644373965 France TRUE
+european union MULTI Europe MULTI TRUE 279 2021-02-03 NA NA NA NA NA NA NA TRUE
+netherlands nl Europe Western Europe FALSE 270 2021-02-03 258635389 relation Nederland boundary administrative 0.829416895369094 Nederland TRUE
+italy it Europe Southern Europe FALSE 262 2021-02-03 258444203 relation Italia boundary administrative 0.883101903144055 Italia TRUE
+congress NONE NA NA TRUE 258 2021-02-03 NA NA NA NA NA NA NA TRUE
+india in Asia Southern Asia FALSE 254 2021-02-03 298116298 relation India boundary administrative 0.947689135880987 India TRUE
+washington us Americas Northern America FALSE 240 2021-02-03 259037983 relation "Washington, District of Columbia, United States" boundary administrative 0.849288898611582 United States TRUE
+america NONE NA NA TRUE 239 2021-02-03 NA NA NA NA NA NA NA TRUE
+us national institutes of health us Americas Northern America FALSE 230 2021-02-03 102178084 way "National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, United States" landuse commercial 0.6 United States TRUE
+illinois us Americas Northern America FALSE 229 2021-02-03 257440201 relation "Illinois, United States" boundary administrative 0.843803112037364 United States TRUE
+massachusetts institute of technology us Americas Northern America FALSE 221 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 1.04674262776464 United States TRUE
+texas us Americas Northern America FALSE 212 2021-02-03 257418219 relation "Texas, United States" boundary administrative 0.858052139534058 United States TRUE
+nih us Americas Northern America TRUE 210 2021-02-03 102178084 way "National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, United States" landuse commercial 0.6 United States TRUE
+world health organization MULTI MULTI MULTI TRUE 210 2021-02-03 NA NA NA NA NA NA NA TRUE
+new jersey us Americas Northern America FALSE 207 2021-02-03 257885980 relation "New Jersey, United States" boundary administrative 0.952055513496666 United States TRUE
+university of oxford gb Europe Northern Europe FALSE 205 2021-02-03 96249903 way "Oxford University Museum of Natural History, Parks Road, City Centre, Oxford, Oxfordshire, South East, England, OX1 3PW, United Kingdom" tourism museum 0.690225650640271 United Kingdom TRUE
+european space agency MULTI Europe MULTI TRUE 204 2021-02-03 NA NA NA NA NA NA NA TRUE
+mexico mx Americas Central America FALSE 194 2021-02-03 257065613 relation México boundary administrative 0.839923932441765 México TRUE
+colorado us Americas Northern America FALSE 193 2021-02-03 258349416 relation "Colorado, United States" boundary administrative 0.816010061654908 United States TRUE
+brazil br Americas South America FALSE 193 2021-02-03 256950327 relation Brasil boundary administrative 0.845577342306117 Brasil TRUE
+united nations MULTI MULTI MULTI TRUE 188 2021-02-03 159967172 way "United Nations, Taft Avenue, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" railway station 0.529847857867275 Luzon TRUE
+harvard university us Americas Northern America FALSE 187 2021-02-03 258370425 relation "Harvard University, Kingsley Street, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134-1420, United States" amenity university 0.977190722653673 United States TRUE
+eu MULTI Europe MULTI TRUE 182 2021-02-03 258377753 relation "Eu, Dieppe, Seine-Maritime, Normandie, France métropolitaine, 76260, France" boundary administrative 0.659192634426485 France TRUE
+stanford university us Americas Northern America FALSE 181 2021-02-03 97833344 way "Stanford University, 408, Panama Mall, Stanford, Santa Clara County, California, 94305, United States" amenity university 0.855492545367418 United States TRUE
+us food and drug administration us Americas Northern America FALSE 176 2021-02-03 27293848 node "US Food & Drug Administration, 5162, Valleypointe Parkway, Thornecrest, Roanoke County, Virginia, 24019, United States" office government 0.401 United States TRUE
+russia ru Europe Eastern Europe FALSE 172 2021-02-03 258410737 relation РоÑ<81>Ñ<81>иÑ<8f> boundary administrative 0.852192362078589 РоÑ<81>Ñ<81>иÑ<8f> TRUE
+"university of california, berkeley" us Americas Northern America FALSE 162 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.0481943782617 United States TRUE
+virginia us Americas Northern America FALSE 162 2021-02-03 257877023 relation "Virginia, United States" boundary administrative 0.837428557079075 United States TRUE
+south africa za Africa Southern Africa FALSE 159 2021-02-03 258310948 relation South Africa boundary administrative 0.982907627703066 South Africa TRUE
+spain es Europe Southern Europe FALSE 158 2021-02-03 258583824 relation España boundary administrative 0.865552504518026 España TRUE
+european commission MULTI Europe MULTI TRUE 156 2021-02-03 80449876 node "EC, 200, Rue de la Loi - Wetstraat, Quartier européen - Europese Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1040, België / Belgique / Belgien" office government 0.636019418289309 België / Belgique / Belgien TRUE
+sweden se Europe Northern Europe FALSE 152 2021-02-03 257716320 relation Sverige boundary administrative 0.84163245433824 Sverige TRUE
+connecticut us Americas Northern America FALSE 151 2021-02-03 258171713 relation "Connecticut, United States" boundary administrative 0.818771933111505 United States TRUE
+britain gb Europe Northern Europe FALSE 149 2021-02-03 258411454 relation United Kingdom boundary administrative 0.872378013283733 United Kingdom TRUE
+north carolina us Americas Northern America FALSE 144 2021-02-03 258457663 relation "North Carolina, United States" boundary administrative 0.920364397898499 United States TRUE
+university of cambridge gb Europe Northern Europe FALSE 144 2021-02-03 85738792 way "Fitzwilliam Museum, Trumpington Street, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 1RB, United Kingdom" tourism museum 0.667686595449203 United Kingdom TRUE
+florida us Americas Northern America FALSE 142 2021-02-03 257824147 relation "Florida, United States" boundary administrative 0.851213972798062 United States TRUE
+university of washington us Americas Northern America FALSE 142 2021-02-03 258779744 relation "University of Washington, Burke-Gilman Trail, University District, Seattle, King County, Washington, 98105, United States" amenity university 0.898418423079257 United States TRUE
+senate NONE NA NA TRUE 138 2021-02-03 367209 node "Senate, Jack County, Texas, United States" place hamlet 0.35 United States TRUE
+pennsylvania us Americas Northern America FALSE 133 2021-02-03 295875619 relation "Pennsylvania, United States" boundary administrative 0.857742643241961 United States TRUE
+la NONE NA NA FALSE 131 2021-02-03 NA NA NA NA NA NA NA TRUE
+university college london gb Europe Northern Europe FALSE 129 2021-02-03 259450693 relation "University College London, Endsleigh Gardens, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0EB, United Kingdom" amenity university 0.615434238632773 United Kingdom TRUE
+imperial college london gb Europe Northern Europe FALSE 128 2021-02-03 301718758 relation "Imperial College London, Exhibition Road, Knightsbridge, City of Westminster, London, Greater London, England, SW7 2AZ, United Kingdom" amenity university 0.795213557010066 United Kingdom TRUE
+chile cl Americas South America FALSE 128 2021-02-03 257831844 relation Chile boundary administrative 0.87834210834697 Chile TRUE
+fda us Americas Northern America TRUE 127 2021-02-03 259031793 relation "FDA, Zone 6, Tchien, Grand Gedeh County, Liberia" boundary administrative 0.35 Liberia TRUE
+us national science foundation us Americas Northern America TRUE 122 2021-02-03 189156816 way "National Science Foundation, Vidya Road, Independace Squre, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office research 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை TRUE
+south korea kr Asia Eastern Asia FALSE 122 2021-02-03 258235947 relation ëŒ€í•œë¯¼êµ boundary administrative 0.802419592147396 ëŒ€í•œë¯¼êµ TRUE
+harvard medical school us Americas Northern America FALSE 120 2021-02-03 146981708 way "Harvard Medical School, Longwood Avenue, Roxbury, Boston, Suffolk County, Massachusetts, 02120, United States" amenity university 0.301 United States TRUE
+california institute of technology us Americas Northern America FALSE 117 2021-02-03 97237039 way "California Institute of Technology, East Del Mar Boulevard, Pasadena, Los Angeles County, California, 91106, United States" amenity university 0.98591368499579 United States TRUE
+white house us Americas Northern America FALSE 116 2021-02-03 147370893 way "White House, 1600, Pennsylvania Avenue Northwest, Washington, District of Columbia, 20500, United States" historic castle 0.83472115416811 United States TRUE
+nature NONE NA NA TRUE 116 2021-02-03 106841545 way "Nature, Woodbury Lane, Woodbury, Irvine, Orange County, California, 92620, United States" highway residential 0.2 United States TRUE
+hawaii us Americas Northern America FALSE 108 2021-02-03 258372128 relation "Hawaii, United States" boundary administrative 0.820432643396309 United States TRUE
+national institutes of health us Americas Northern America FALSE 108 2021-02-03 102178084 way "National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, United States" landuse commercial 0.6 United States TRUE
+nsf us Americas Northern America TRUE 108 2021-02-03 80933809 node "An NiÅŸf, غبيش, ولاية غرب كردÙ<81>ان, السودان" place hamlet 0.25 السودان TRUE
+yale university us Americas Northern America FALSE 108 2021-02-03 258788418 relation "Yale University, West Haven, New Haven County, Connecticut, 06516, United States" amenity university 0.859636160157988 United States TRUE
+georgia us Americas Northern America FALSE 107 2021-02-03 258375785 relation "Georgia, United States" boundary administrative 0.829577897122545 United States TRUE
+cern MULTI Europe MULTI TRUE 107 2021-02-03 257664292 relation "CERN - Site de Meyrin, Route de Meyrin, Prévessin, Prévessin-Moëns, Gex, Ain, Auvergne-Rhône-Alpes, France métropolitaine, 01280, France" office research 0.658916271379286 France TRUE
+columbia university us Americas Northern America FALSE 106 2021-02-03 235180475 way "Columbia University, Reunion Plaza, Morningside Heights, Manhattan Community Board 9, Manhattan, New York County, New York, United States" amenity university 0.872550278643288 United States TRUE
+google us Americas Northern America FALSE 106 2021-02-03 18812108 node "Google, 355, Main Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" office company 0.794935675921029 United States TRUE
+who MULTI MULTI MULTI TRUE 106 2021-02-03 91298032 way "Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra TRUE
+national science foundation us Americas Northern America TRUE 103 2021-02-03 189156816 way "National Science Foundation, Vidya Road, Independace Squre, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office research 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை TRUE
+israel il Asia Western Asia FALSE 100 2021-02-03 258074628 relation ישר×<90>ל boundary administrative 0.791602003658504 ישר×<90>ל TRUE
+harvard us Americas Northern America FALSE 98 2021-02-03 258370425 relation "Harvard University, Kingsley Street, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134-1420, United States" amenity university 0.877190722653673 United States TRUE
+new zealand nz Oceania Australia and New Zealand FALSE 96 2021-02-03 257922775 relation New Zealand / Aotearoa boundary administrative 0.991711172959347 New Zealand / Aotearoa TRUE
+princeton university us Americas Northern America FALSE 93 2021-02-03 259109522 relation "Princeton University, Brunswick Pike, Penns Neck, Princeton, Mercer County, New Jersey, 08540, United States" amenity university 0.846017552564293 United States TRUE
+johns hopkins university us Americas Northern America FALSE 91 2021-02-03 259066232 relation "Johns Hopkins University, 3400, North Charles Street, Charles Village, Baltimore, Maryland, 21218, United States" amenity university 0.891185823835172 United States TRUE
+norway no Europe Northern Europe FALSE 91 2021-02-03 258434833 relation Norge boundary administrative 0.814696521978471 Norge TRUE
+noaa us Americas Northern America TRUE 90 2021-02-03 47618740 node "ນາ, ເມືàºàº‡à»€àºŠà»‚ປນ, ສະຫວັນນະເຂດ, ປະເທດລາວ" place village 0.275 ປະເທດລາວ TRUE
+ohio us Americas Northern America FALSE 89 2021-02-03 295875618 relation "Ohio, United States" boundary administrative 0.8407357649767 United States TRUE
+un MULTI MULTI MULTI TRUE 89 2021-02-03 258337461 relation "Universidad de Navarra, Carretera de la Universidad, Pamplona/Iruña, Navarra - Nafarroa, 31007, España" amenity university 0.58086888056666 España TRUE
+co co Americas South America FALSE 89 2021-02-03 258355394 relation Colombia boundary administrative 0.879708646936571 Colombia TRUE
+house of representatives us Americas Northern America TRUE 88 2021-02-03 60617052 node "衆è°é™¢, 1, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0014, 日本" office government 0.570873380707553 日本 TRUE
+cornell university us Americas Northern America FALSE 86 2021-02-03 259012417 relation "Johnson Museum of Art, 114, Central Avenue, Ithaca, Ithaca Town, Tompkins County, New York, 14853, United States" tourism museum 0.378680902821112 United States TRUE
+louisiana us Americas Northern America FALSE 86 2021-02-03 257328554 relation "Louisiana, United States" boundary administrative 0.813184888367119 United States TRUE
+us environmental protection agency us Americas Northern America FALSE 82 2021-02-03 258100172 relation "Environmental Protection Agency, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20004, United States" office government 0.301 United States TRUE
+missouri us Americas Northern America FALSE 81 2021-02-03 258150217 relation "Missouri, United States" boundary administrative 0.832881344700329 United States TRUE
+university of michigan us Americas Northern America FALSE 79 2021-02-03 258570054 relation "University of Michigan, 500, South State Street, Ann Arbor, Washtenaw County, Michigan, 48109, United States" amenity university 0.942114967834941 United States TRUE
+belgium be Europe Western Europe FALSE 79 2021-02-03 258282932 relation België / Belgique / Belgien boundary administrative 0.819060552357301 België / Belgique / Belgien TRUE
+epa us Americas Northern America TRUE 78 2021-02-03 96252367 way "El Palomar, José Bianco, El Palomar, Partido de Morón, Buenos Aires, 1684, Argentina" aeroway aerodrome 0.351537799411788 Argentina TRUE
+university of pennsylvania us Americas Northern America FALSE 78 2021-02-03 258680341 relation "University of Pennsylvania, Market Street, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19139, United States" amenity university 0.926036457903365 United States TRUE
+national academy of sciences us Americas Northern America FALSE 75 2021-02-03 106787905 way "National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States" office ngo 1.00593943258948 United States TRUE
+tennessee us Americas Northern America FALSE 75 2021-02-03 257213963 relation "Tennessee, United States" boundary administrative 0.820268105343983 United States TRUE
+iran ir Asia Southern Asia FALSE 74 2021-02-03 258075432 relation ایران boundary administrative 0.824702703615226 ایران TRUE
+duke university us Americas Northern America FALSE 72 2021-02-03 259450641 relation "Duke University, 15th Street, 9th Street District, Durham, Durham County, North Carolina, 27705, United States" amenity university 0.793140337132867 United States TRUE
+indonesia id Asia South-Eastern Asia FALSE 72 2021-02-03 257918359 relation Indonesia boundary administrative 0.915582040548682 Indonesia TRUE
+facebook us Americas Northern America TRUE 70 2021-02-03 258236555 way "Facebook, Kawangware, Nairobi, Kenya" landuse recreation_ground 0.3 Kenya TRUE
+university of chicago us Americas Northern America FALSE 70 2021-02-03 123843818 way "The University of Chicago, 5801, South Ellis Avenue, Hyde Park, Chicago, Hyde Park Township, Cook County, Illinois, 60637, United States" amenity university 0.934698313895193 United States TRUE
+esa MULTI Europe MULTI TRUE 70 2021-02-03 258416750 relation "Yesa, Navarra - Nafarroa, España" boundary administrative 0.608906504927631 España TRUE
+england gb Europe Northern Europe FALSE 70 2021-02-03 257775513 relation "England, United Kingdom" boundary administrative 0.938748907051256 United Kingdom TRUE
+denmark dk Europe Northern Europe FALSE 70 2021-02-03 257253228 relation Danmark boundary administrative 0.806805864691751 Danmark TRUE
+us national oceanic and atmospheric administration us Americas Northern America FALSE 69 2021-02-03 301086165 way "1839, National Oceanic Atmospheric Administration, San Diego, San Diego County, California, 92101, United States" landuse industrial 0.6 United States TRUE
+royal society gb Europe Northern Europe FALSE 68 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.847225834784319 United Kingdom TRUE
+wellcome trust gb Europe Northern Europe FALSE 68 2021-02-03 165545925 way "Wellcome Trust, 215, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom" building yes 0.630084056292374 United Kingdom TRUE
+national oceanic and atmospheric administration us Americas Northern America FALSE 67 2021-02-03 301086165 way "1839, National Oceanic Atmospheric Administration, San Diego, San Diego County, California, 92101, United States" landuse industrial 0.6 United States TRUE
+new mexico us Americas Northern America FALSE 64 2021-02-03 258170453 relation "New Mexico, United States" boundary administrative 0.915456300696001 United States TRUE
+intergovernmental panel NONE NA NA FALSE 64 2021-02-03 NA NA NA NA NA NA NA TRUE
+kenya ke Africa Eastern Africa FALSE 64 2021-02-03 258031172 relation Kenya boundary administrative 0.826488598383626 Kenya TRUE
+twitter us Americas Northern America FALSE 62 2021-02-03 18817852 node "Twitter, 1355, Market Street, Civic Center, San Francisco, San Francisco City and County, California, 94102, United States" office company 0.798653680040316 United States TRUE
+university of illinois us Americas Northern America FALSE 62 2021-02-03 24997928 node "Gameday Spirit, 2028, North Prospect Avenue, Champaign, Champaign County, Illinois, 61822, United States" shop clothes 0.101 United States TRUE
+arizona us Americas Northern America FALSE 61 2021-02-03 257489274 relation "Arizona, United States" boundary administrative 0.823799492478004 United States TRUE
+house NONE NA NA TRUE 61 2021-02-03 258618125 relation "استان هرمزگان, ایران" boundary administrative 0.571634966054199 ایران TRUE
+university of edinburgh gb Europe Northern Europe FALSE 60 2021-02-03 87886135 way "University of Edinburgh, Windmill Place, Pleasance, Southside, City of Edinburgh, Scotland, EH8 9XQ, United Kingdom" amenity university 0.900742371444641 United Kingdom TRUE
+alaska us Americas Northern America FALSE 59 2021-02-03 258358045 relation "Alaska, United States" boundary administrative 0.821112507250872 United States TRUE
+swiss federal institute of technology ch Europe Western Europe TRUE 59 2021-02-03 3632573991 Node ETH Merchandise Store shop clothes NA Schweiz/Suisse/Svizzera/Svizra TRUE
+oregon us Americas Northern America FALSE 58 2021-02-03 257496023 relation "Oregon, United States" boundary administrative 0.824296037464145 United States TRUE
+pennsylvania state university us Americas Northern America FALSE 58 2021-02-03 147721263 way "Air Quality Learning and Demonstration Center, Air Quality Lane, Ferguson Township, Centre County, Pennsylvania, 16803, United States" tourism attraction 0.201 United States TRUE
+university of arizona us Americas Northern America FALSE 58 2021-02-03 117399379 way "University of Arizona, East Polk Street, Central City, Phoenix, Maricopa County, Arizona, 85004, United States" amenity university 0.301 United States TRUE
+us geological survey us Americas Northern America FALSE 58 2021-02-03 135946356 way "US Geological Survey, Wilson Avenue, Pasadena, Los Angeles County, California, 91125, United States" building yes 0.301 United States TRUE
+university of manchester gb Europe Northern Europe FALSE 57 2021-02-03 122339635 way "Pendulum Hotel, Sackville Street, City Centre, Manchester, Greater Manchester, North West England, England, M1 3BB, United Kingdom" tourism hotel 0.101 United Kingdom TRUE
+university of wisconsin us Americas Northern America FALSE 56 2021-02-03 53450184 node "UWRF Fast Copy, 410, South 3rd Street, River Falls, Pierce County, Wisconsin, 54022, United States" shop copyshop 0.101 United States TRUE
+singapore sg Asia South-Eastern Asia FALSE 56 2021-02-03 258556513 relation Singapore boundary administrative 0.843276755105906 Singapore TRUE
+american geophysical union us Americas Northern America FALSE 54 2021-02-03 34377963 node "American Geophysical Union, 2000, Florida Avenue Northwest, Washington, District of Columbia, 20009, United States" office research 0.765817363739393 United States TRUE
+indiana us Americas Northern America FALSE 54 2021-02-03 257993413 relation "Indiana, United States" boundary administrative 0.817836972596621 United States TRUE
+minnesota us Americas Northern America FALSE 54 2021-02-03 258377215 relation "Minnesota, United States" boundary administrative 0.831102000252045 United States TRUE
+mit us Americas Northern America FALSE 54 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 0.646742627764641 United States TRUE
+us centers for disease control and prevention us Americas Northern America FALSE 54 2021-02-03 96695743 way "Centers for Disease Control and Prevention Edward R. Roybal Campus, Clifton Heights Lane Northeast, Druid Hills, DeKalb County, Georgia, 1540, United States" office research 0.701 United States TRUE
+european research council MULTI Europe MULTI TRUE 54 2021-02-03 73122812 node "ERCEA, 16, Place Charles Rogier - Karel Rogierplein, Saint-Josse-ten-Noode - Sint-Joost-ten-Node, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1210, België / Belgique / Belgien" office government 0.429911496965354 België / Belgique / Belgien TRUE
+argentina ar Americas South America FALSE 54 2021-02-03 258404994 relation Argentina boundary administrative 0.910104194561691 Argentina TRUE
+american association for the advancement of science us Americas Northern America FALSE 53 2021-02-03 8123167 node "AAAS / Science, 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" tourism attraction 0.201 United States TRUE
+university of colorado boulder us Americas Northern America FALSE 53 2021-02-03 103270225 way "Museum of Natural History - Henderson Building, 1030, Broadway, The Hill, Boulder, Boulder County, Colorado, 80802, United States" tourism museum 0.556321943137092 United States TRUE
+turkey tr Asia Western Asia FALSE 53 2021-02-03 258445264 relation Türkiye boundary administrative 0.812289652418409 Türkiye TRUE
+lhc MULTI Europe MULTI TRUE 53 2021-02-03 208268818 way "LHC, Sai Nagar, Chamundeshwari Nagar, Hubballi, Hubballi taluku, Dharwad district, Karnataka, 580020, India" highway service 0.175 India TRUE
+university of toronto ca Americas Northern America FALSE 53 2021-02-03 86595017 way "University of Toronto, Wellesley-Hoskin Cycle Track, Bloor Street Culture Corridor, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5S 1C4, Canada" amenity university 0.905105918866445 Canada TRUE
+arizona state university us Americas Northern America FALSE 52 2021-02-03 258489814 relation "Arizona State University, East Apache Boulevard, Tempe Junction, Tempe, Maricopa County, Arizona, 85287, United States" amenity university 0.854736575831137 United States TRUE
+austria at Europe Western Europe FALSE 52 2021-02-03 257659808 relation Österreich boundary administrative 0.823043874164126 Österreich TRUE
+goddard space flight center us Americas Northern America FALSE 51 2021-02-03 258921089 relation "Goddard Space Flight Center, Greenbelt Road, Brookland, Glenn Dale, Prince George's County, Maryland, 20769, United States" amenity research_institute 0.900582931635345 United States TRUE
+new york university us Americas Northern America FALSE 51 2021-02-03 114164826 way "New York University, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States" amenity university 0.934621425344776 United States TRUE
+chinese academy of sciences cn Asia Eastern Asia FALSE 51 2021-02-03 163215118 way "ä¸å›½ç§‘å¦é™¢ç‰©ç<90>†ç ”究所, ä¸å…³æ<9d>‘å<8d>—一æ<9d>¡, 新科祥å›, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" amenity research_institute 0.249182950422608 ä¸å›½ TRUE
+southwest research institute us Americas Northern America FALSE 50 2021-02-03 258916067 relation "Southwest Research Institute, 6220, Culebra Road, San Antonio, Bexar County, Texas, 78228, United States" amenity research_institute 0.663793454953531 United States TRUE
+ipcc MULTI MULTI MULTI TRUE 50 2021-02-03 47368685 node "IPCC, San Ignacio, Santiago, Provincia de Santiago, Región Metropolitana de Santiago, 8330180, Chile" amenity university 0.101 Chile TRUE
+ethiopia et Africa Eastern Africa FALSE 49 2021-02-03 258197652 relation ኢትዮጵያ boundary administrative 0.719313654189281 ኢትዮጵያ TRUE
+democratic republic of the congo cd Africa Middle Africa FALSE 49 2021-02-03 258410829 relation République démocratique du Congo boundary administrative 0.822405117667525 République démocratique du Congo TRUE
+bill & melinda gates foundation us Americas Northern America FALSE 48 2021-02-03 177964409 way "Bill & Melinda Gates Foundation, 500, 5th Avenue North, Lower Queen Anne, Belltown, Seattle, King County, Washington, 98109, United States" office foundation 0.833000783214491 United States TRUE
+department of energy us Americas Northern America TRUE 48 2021-02-03 228853589 way "Department of Energy, 192, Visagie Street, Pretoria Central, Tshwane Ward 80, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0126, South Africa" office government 0.6004701084432 South Africa TRUE
+university of minnesota us Americas Northern America FALSE 48 2021-02-03 100997326 way "Bell Museum of Natural History, 10, Southeast Church Street, Minneapolis, Hennepin County, Minnesota, 55455, United States" tourism museum 0.523386683132434 United States TRUE
+columbia co Americas South America FALSE 48 2021-02-03 258355394 relation Colombia boundary administrative 0.779708646936571 Colombia TRUE
+ligo us Americas Northern America TRUE 47 2021-02-03 258170031 relation "Liège, Wallonie, 4000, België / Belgique / Belgien" boundary administrative 0.63660006822952 België / Belgique / Belgien TRUE
+parliament NONE NA NA TRUE 47 2021-02-03 127825361 way "Parliament, , Boe, Yaren, Naoero" office government 0.531052870313343 Naoero TRUE
+trump NONE NA NA TRUE 47 2021-02-03 445769 node "Trump, Baltimore County, Maryland, 21161, United States" place hamlet 0.375244632729739 United States TRUE
+australian national university au Oceania Australia and New Zealand FALSE 47 2021-02-03 158291441 way "Australian National University, Lawson Crescent, Acton, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia" amenity university 0.846355606540819 Australia TRUE
+university of maryland in college park us Americas Northern America FALSE 46 2021-02-03 198712103 way "University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States" amenity university 1.15966453785279 United States TRUE
+karolinska institute se Europe Northern Europe FALSE 46 2021-02-03 299960275 relation "Karolinska Institutet campus Flemingsberg, Hälsovägen, BRF. Grantorp, Visättra, Flemingsberg, Huddinge kommun, Stockholms län, 14157, Sverige" amenity university 0.679801406140393 Sverige TRUE
+guinea gn Africa Western Africa FALSE 46 2021-02-03 257301923 relation Guinée boundary administrative 0.674714358349369 Guinée TRUE
+broad institute of mit us Americas Northern America TRUE 45 2021-02-03 NA NA NA NA NA NA NA TRUE
+food and drug administration us Americas Northern America FALSE 45 2021-02-03 161684229 way "Food and Drug Administration, San Juan Antiguo, San Juan, Puerto Rico, United States" landuse industrial 0.6 United States TRUE
+pfizer us Americas Northern America TRUE 45 2021-02-03 258561463 relation "Pfizer, Trujui, Partido de Moreno, Buenos Aires, Argentina" boundary administrative 0.4 Argentina TRUE
+rutgers university us Americas Northern America FALSE 45 2021-02-03 153113578 way "Zimmerli Art Museum, 71, Hamilton Street, New Brunswick, Middlesex County, New Jersey, 08901-1248, United States" tourism museum 0.313940046679794 United States TRUE
+washington university us Americas Northern America FALSE 44 2021-02-03 35683102 node "Washington University, Institute for Public Health, 600, South Taylor Avenue, WashU, City of Saint Louis, Missouri, 63110, United States" office university 0.201 United States TRUE
+uganda ug Africa Eastern Africa FALSE 44 2021-02-03 257547928 relation Uganda boundary administrative 0.797020967844266 Uganda TRUE
+university of bristol gb Europe Northern Europe FALSE 44 2021-02-03 50251699 node "University of Bristol, Woodland Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS2, United Kingdom" tourism information 0.301 United Kingdom TRUE
+environmental protection agency us Americas Northern America FALSE 43 2021-02-03 118168847 way "Environmental Protection Agency, Veterans Memorial Drive, Florence, Boone County, Kentucky, 41042, United States" office government 0.301 United States TRUE
+utah us Americas Northern America FALSE 43 2021-02-03 257844025 relation "Utah, United States" boundary administrative 0.803765430740067 United States TRUE
+springer nature MULTI MULTI MULTI TRUE 43 2021-02-03 107703717 way "Springer Nature, The Warehouse Way, Northcote, KaipÄ<81>tiki, Auckland, 0627, New Zealand / Aotearoa" office company 0.201 New Zealand / Aotearoa TRUE
+drc cd Africa Middle Africa FALSE 43 2021-02-03 258410829 relation République démocratique du Congo boundary administrative 0.722405117667525 République démocratique du Congo TRUE
+ontario ca Americas Northern America FALSE 43 2021-02-03 258413471 relation "Ontario, Canada" boundary administrative 0.835597144214394 Canada TRUE
+cdc us Americas Northern America FALSE 42 2021-02-03 172987439 way "CDC, New Center, Detroit, Wayne County, Michigan, United States" landuse farmyard 0.3 United States TRUE
+us department of energy us Americas Northern America TRUE 42 2021-02-03 228853589 way "Department of Energy, 192, Visagie Street, Pretoria Central, Tshwane Ward 80, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0126, South Africa" office government 0.6004701084432 South Africa TRUE
+"university of california, santa cruz" us Americas Northern America FALSE 41 2021-02-03 75590962 node "University of California, Santa Cruz, Coolidge Drive, Santa Cruz, Santa Cruz County, California, 95064, United States" tourism information 0.501 United States TRUE
+nigeria ng Africa Western Africa FALSE 41 2021-02-03 258179403 relation Nigeria boundary administrative 0.837817167052956 Nigeria TRUE
+university of sheffield gb Europe Northern Europe FALSE 41 2021-02-03 258762437 relation "University of Sheffield, West Street, Saint George's, Sheffield, Yorkshire and the Humber, England, S1 4ET, United Kingdom" amenity university 0.816705192186971 United Kingdom TRUE
+mcgill university ca Americas Northern America FALSE 41 2021-02-03 93463053 way "McGill University, Avenue du Parc, Saint-Louis, Plateau Mont-Royal, Montréal, Agglomération de Montréal, Montréal (06), Québec, H2W 1S4, Canada" amenity university 0.201 Canada TRUE
+rhode island us Americas Northern America FALSE 40 2021-02-03 258435553 relation "Rhode Island, United States" boundary administrative 0.888026902639812 United States TRUE
+us senate us Americas Northern America FALSE 40 2021-02-03 367209 node "Senate, Jack County, Texas, United States" place hamlet 0.35 United States TRUE
+poland pl Europe Eastern Europe FALSE 40 2021-02-03 258357895 relation Polska boundary administrative 0.852585547719659 Polska TRUE
+british columbia ca Americas Northern America FALSE 40 2021-02-03 258447774 relation "British Columbia, Canada" boundary administrative 0.91215515233974 Canada TRUE
+university of british columbia ca Americas Northern America FALSE 40 2021-02-03 258186091 relation "University of British Columbia, Eagles Drive, Hawthorn Place, University of British Columbia, Electoral Area A, Metro Vancouver Regional District, British Columbia, V6T 1Z4, Canada" amenity university 0.962214165030468 Canada TRUE
+northwestern university us Americas Northern America FALSE 39 2021-02-03 258324584 relation "Northwestern University, 633, Clark Street, Downtown, Evanston, Evanston Township, Cook County, Illinois, 60208, United States" amenity university 0.78907157644275 United States TRUE
+"university of california, santa barbara" us Americas Northern America FALSE 39 2021-02-03 205319990 way "University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States" place locality 0.625 United States TRUE
+university of colorado us Americas Northern America FALSE 39 2021-02-03 167749471 way "University of Northern Colorado, 501, 20th Street, Jackson Field, Greeley, Weld County, Colorado, 80631, United States" amenity university 0.714405926306359 United States TRUE
+us department of agriculture us Americas Northern America FALSE 39 2021-02-03 48599253 node "US Department of Agriculture, Maine Avenue Southwest, Washington, District of Columbia, 20250, United States" office government 1.00973759439018 United States TRUE
+us national academies of sciences us Americas Northern America TRUE 39 2021-02-03 NA NA NA NA NA NA NA TRUE
+gm NONE NA NA TRUE 39 2021-02-03 258194808 relation Gambia boundary administrative 0.652242698231784 Gambia TRUE
+ireland ie Europe Northern Europe FALSE 39 2021-02-03 258361977 relation Éire / Ireland boundary administrative 0.873845787392843 Éire / Ireland TRUE
+university of east anglia gb Europe Northern Europe FALSE 39 2021-02-03 206300612 way "University of East Anglia, Wilberforce Road, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" amenity university 0.904172803149122 United Kingdom TRUE
+egypt eg Africa Northern Africa FALSE 39 2021-02-03 258188085 relation مصر boundary administrative 0.785163958233235 مصر TRUE
+university of copenhagen dk Europe Northern Europe FALSE 39 2021-02-03 97069646 way "Københavns Universitet, Nørregade, Vesterbro, København, Københavns Kommune, Region Hovedstaden, 1167, Danmark" amenity university 0.587152318095233 Danmark TRUE
+scripps institution of oceanography us Americas Northern America FALSE 38 2021-02-03 2864486 node "Scripps Institution of Oceanography, Kennel Way, San Diego, San Diego County, California, 92093, United States" amenity school 0.401 United States TRUE
+university of southern california us Americas Northern America FALSE 38 2021-02-03 128225751 way "University of Southern California, West Jefferson Boulevard, University Park, Los Angeles, Los Angeles County, California, 90089, United States" amenity university 1.01587616839984 United States TRUE
+pakistan pk Asia Southern Asia FALSE 38 2021-02-03 258223154 relation پاکستان boundary administrative 0.762909367264627 پاکستان TRUE
+peru pe Americas South America FALSE 38 2021-02-03 258422900 relation Perú boundary administrative 0.762405923925327 Perú TRUE
+american physical society us Americas Northern America TRUE 37 2021-02-03 NA NA NA NA NA NA NA TRUE
+broad institute us Americas Northern America FALSE 37 2021-02-03 97512477 way "Broad Institute, Charles Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02141, United States" building university 0.593012981942171 United States TRUE
+us national academy of sciences us Americas Northern America FALSE 37 2021-02-03 106787905 way "National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States" office ngo 1.00593943258948 United States TRUE
+supreme court NONE NA NA TRUE 37 2021-02-03 258928765 relation "Supreme Court, Tilak Marg, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India" amenity courthouse 0.700289443464696 India TRUE
+astrazeneca gb Europe Northern Europe TRUE 37 2021-02-03 205568985 way "AstraZeneca, Petite-Synthe, Dunkerque, Nord, Hauts-de-France, France métropolitaine, 59640, France" landuse industrial 0.3 France TRUE
+francis crick institute gb Europe Northern Europe FALSE 37 2021-02-03 121182065 way "The Francis Crick Institute, 1, Midland Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 1AT, United Kingdom" amenity research_institute 0.684723197268746 United Kingdom TRUE
+glaxosmithkline gb Europe Northern Europe FALSE 37 2021-02-03 153515967 way "GlaxoSmithKline, Elmbridge, Surrey, South East, England, KT13 0DE, United Kingdom" landuse commercial 0.3 United Kingdom TRUE
+university of glasgow gb Europe Northern Europe FALSE 37 2021-02-03 96372396 way "University of Glasgow, Byres Road, Yorkhill, Dowanhill, Glasgow, Glasgow City, Scotland, G12 8TD, United Kingdom" amenity university 0.862549854310082 United Kingdom TRUE
+iter fr Europe Western Europe FALSE 37 2021-02-03 115946244 way "ITER Platform, Saint-Paul-lès-Durance, Aix-en-Provence, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13115, France" natural sand 0.554322572212639 France TRUE
+american astronomical society us Americas Northern America TRUE 36 2021-02-03 NA NA NA NA NA NA NA TRUE
+ibm us Americas Northern America TRUE 36 2021-02-03 67786313 node "IBM, 11, ProtifaÅ¡istických bojovnÃkov, Stredné Mesto, KoÅ¡ice - mestská Ä<8d>asÅ¥ Staré Mesto, okres KoÅ¡ice I, KoÅ¡ice, KoÅ¡ický kraj, Východné Slovensko, 04291, Slovensko" office company 0.742881688686971 Slovensko TRUE
+indiana university us Americas Northern America FALSE 36 2021-02-03 125822977 way "William H. Mathers Museum of World Cultures, 601, East 8th Street, Bloomington, Monroe County, Indiana, 47408, United States" tourism museum 0.253150759043076 United States TRUE
+oklahoma us Americas Northern America FALSE 36 2021-02-03 258391951 relation "Oklahoma, United States" boundary administrative 0.814016195392348 United States TRUE
+oregon state university us Americas Northern America FALSE 36 2021-02-03 258801464 relation "Oregon State University, Northwest Van Buren Avenue, Corvallis, Benton County, Oregon, 97331, United States" amenity university 0.829529792748761 United States TRUE
+rockefeller university us Americas Northern America FALSE 36 2021-02-03 114891432 way "Rockefeller University, 1230, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity university 0.696458698335865 United States TRUE
+university of north carolina us Americas Northern America FALSE 36 2021-02-03 258459202 relation "University of North Carolina, South Columbia Street, Downtown, Chapel Hill, Orange County, North Carolina, 27516, United States" amenity university 0.982889212190386 United States TRUE
+university of texas us Americas Northern America FALSE 36 2021-02-03 175807465 way "Sam Rayburn Museum, West 5th Street, Bonham, Fannin County, Texas, 75418, United States" tourism museum 0.101 United States TRUE
+us national institute of allergy us Americas Northern America TRUE 36 2021-02-03 NA NA NA NA NA NA NA TRUE
+hungary hu Europe Eastern Europe FALSE 36 2021-02-03 257662998 relation Magyarország boundary administrative 0.808284595263048 Magyarország TRUE
+boston university us Americas Northern America FALSE 35 2021-02-03 258894158 relation "Boston University, Brighton Avenue, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134, United States" amenity university 0.782119069629869 United States TRUE
+merck us Americas Northern America TRUE 35 2021-02-03 218371594 way "Merck, ã<81>„ã‚<8f>ã<81><8d>市, ç¦<8f>島県, 日本" landuse industrial 0.3 日本 TRUE
+michigan us Americas Northern America FALSE 35 2021-02-03 258403790 relation "Michigan, United States" boundary administrative 0.837851453380433 United States TRUE
+university of texas at austin us Americas Northern America FALSE 35 2021-02-03 57760018 node "University of Texas at Austin, 2152, San Jacinto Boulevard, Eastwoods, Austin, Travis County, Texas, 78712, United States" amenity college 0.501 United States TRUE
+university of utah us Americas Northern America FALSE 35 2021-02-03 149037043 way "University of Utah, 201, Presidents Circle, Salt Lake City, Salt Lake County, Utah, 84112, United States" amenity university 0.845769418466942 United States TRUE
+urbana-champaign us Americas Northern America FALSE 35 2021-02-03 258133881 relation "Urbana, Champaign County, Illinois, United States" boundary administrative 0.737432720198099 United States TRUE
+international union for conservation of nature MULTI MULTI MULTI TRUE 35 2021-02-03 46296307 node "International Union for Conservation of Nature, ຮ່àºàº¡ 8, ສີບຸນເຮືàºàº‡, ວຽງຈັນ, ເມືàºàº‡àºˆàº±àº™àº—ະບູລີ, ນະຄàºàº™àº«àº¼àº§àº‡àº§àº½àº‡àºˆàº±àº™, 01009, ປະເທດລາວ" office ngo 0.601 ປະເທດລາວ TRUE
+japan aerospace exploration agency jp Asia Eastern Asia FALSE 35 2021-02-03 104684391 way "å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本" amenity research_institute 0.534103782224402 日本 TRUE
+alabama us Americas Northern America FALSE 34 2021-02-03 257215122 relation "Alabama, United States" boundary administrative 0.819961141220614 United States TRUE
+georgia institute of technology us Americas Northern America FALSE 34 2021-02-03 258761291 relation "Georgia Institute of Technology, West Peachtree Street Northwest, Atlanta, Fulton County, Georgia, 30309, United States" amenity university 0.951690746237686 United States TRUE
+world bank MULTI MULTI MULTI TRUE 34 2021-02-03 120702584 way "World Bank, Ward 180, Zone 13 Adyar, Chennai, Chennai District, Tamil Nadu, India" landuse commercial 0.617582068811379 India TRUE
+max planck institute for evolutionary anthropology de Europe Western Europe TRUE 34 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of alberta ca Americas Northern America FALSE 34 2021-02-03 259278235 relation "University of Alberta, 115 Street NW, University of Alberta Neighbourhood, Greater Strathcona, Edmonton, Edmonton (city), Alberta, T6G 0N1, Canada" amenity university 0.835188313007839 Canada TRUE
+lawrence berkeley national laboratory us Americas Northern America FALSE 33 2021-02-03 201093023 way "Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States" amenity research_institute 0.401 United States TRUE
+university of florida us Americas Northern America FALSE 33 2021-02-03 119795320 way "University of Florida, Southwest 20th Street, Idylwild, Gainesville, Alachua County, Florida, 32611, United States" amenity university 0.890538725277712 United States TRUE
+vanderbilt university us Americas Northern America FALSE 33 2021-02-03 119946667 way "Vanderbilt University, Belcourt Avenue, Hillsboro Village, Nashville-Davidson, Davidson County, Tennessee, 37212, United States" amenity university 0.75130624340886 United States TRUE
+european parliament MULTI Europe MULTI TRUE 33 2021-02-03 258825741 relation "Parlement européen - Europees Parlement, 60, Rue Wiertz - Wiertzstraat, Espace Léopold - Leopoldruimte, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1047, België / Belgique / Belgien" office government 0.676444237673387 België / Belgique / Belgien TRUE
+university of southampton gb Europe Northern Europe TRUE 33 2021-02-03 136568212 way "University of Southampton, 3, Persiaran Canselor 1, EduCity Iskandar Malaysia, Iskandar Puteri, Johor Bahru, Iskandar Malaysia, Johor, 79200, Malaysia" amenity university 0.301 Malaysia TRUE
+colombia co Americas South America FALSE 33 2021-02-03 258355394 relation Colombia boundary administrative 0.879708646936571 Colombia TRUE
+johns hopkins university applied physics laboratory us Americas Northern America TRUE 32 2021-02-03 NA NA NA NA NA NA NA TRUE
+microsoft us Americas Northern America TRUE 32 2021-02-03 64154406 node "Microsoft Development Center Norway, 2, Torggata, Hammersborg, St. Hanshaugen, Oslo, 0181, Norge" office company 0.485675067916633 Norge TRUE
+north carolina state university us Americas Northern America FALSE 32 2021-02-03 258870586 relation "North Carolina State University, Trinity Road, Westover, Raleigh, Wake County, North Carolina, 27607, United States" amenity university 0.639862222899095 United States TRUE
+university of hawaii us Americas Northern America FALSE 32 2021-02-03 158423062 way "University of Hawaiʻi, Lower Campus, Woodlawn Drive, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" amenity parking 0.301 United States TRUE
+tanzania tz Africa Eastern Africa FALSE 32 2021-02-03 257254156 relation Tanzania boundary administrative 0.806848122384939 Tanzania TRUE
+taiwan tw Asia Eastern Asia FALSE 32 2021-02-03 257930770 relation 臺ç<81>£ boundary administrative 0.749419791781313 臺ç<81>£ TRUE
+uppsala university se Europe Northern Europe TRUE 32 2021-02-03 NA NA NA NA NA NA NA TRUE
+hubble space telescope NONE NA NA FALSE 32 2021-02-03 NA NA NA NA NA NA NA TRUE
+iceland is Europe Northern Europe FALSE 32 2021-02-03 258407939 relation Ã<8d>sland boundary administrative 0.735687578250399 Ã<8d>sland TRUE
+iraq iq Asia Western Asia FALSE 32 2021-02-03 257951804 relation العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© boundary administrative 0.746511820604847 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© TRUE
+greece gr Europe Southern Europe FALSE 32 2021-02-03 258453061 relation Ελλάδα boundary administrative 0.798996101984371 Ελλάδα TRUE
+cnrs fr Europe Western Europe FALSE 32 2021-02-03 109776204 way "CNRS, 3, Rue Michel-Ange, Hameau Boileau, Quartier d'Auteuil, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" building college 0.651410616675756 France TRUE
+emory university us Americas Northern America FALSE 31 2021-02-03 104443074 way "Emory University, Healthgate Drive, Emory Highlands, Druid Hills, DeKalb County, Georgia, 30322, United States" amenity university 0.722006836447408 United States TRUE
+james webb space telescope us Americas Northern America TRUE 31 2021-02-03 NA NA NA NA NA NA NA TRUE
+ohio state university us Americas Northern America FALSE 31 2021-02-03 258076404 relation "The Ohio State University, Columbus, Franklin, Ohio, 43210, United States" amenity university 0.891055260053775 United States TRUE
+stony brook university us Americas Northern America FALSE 31 2021-02-03 104502319 way "Stony Brook University, 100, Nicolls Road, Suffolk County, New York, 11794, United States" amenity university 0.803198357564167 United States TRUE
+syria sy Asia Western Asia FALSE 31 2021-02-03 257279539 relation سوريا boundary administrative 0.752519619259582 سوريا TRUE
+sudan sd Africa Northern Africa FALSE 31 2021-02-03 258367505 relation السودان boundary administrative 0.696406722929938 السودان TRUE
+bp us Americas Northern America TRUE 30 2021-02-03 82642393 node "BP, Azalea Street, Lenasia South, Johannesburg Ward 120, City of Johannesburg Metropolitan Municipality, Gauteng, 1835, South Africa" amenity fuel 0.65852441040192 South Africa TRUE
+brown university us Americas Northern America FALSE 30 2021-02-03 101690172 way "Brown University, South Main Street, Fox Point, Providence, Providence County, Rhode Island, 02912, United States" amenity university 0.786479374942082 United States TRUE
+department of health and human services us Americas Northern America FALSE 30 2021-02-03 197997224 way "Department of Health and Human Services, 242, State Street, Augusta, Kennebec County, Maine, 04330, United States" building yes 0.601 United States TRUE
+jet propulsion laboratory us Americas Northern America FALSE 30 2021-02-03 178071948 way "Jet Propulsion Laboratory, 4800, Oak Grove Drive, Pasadena, Los Angeles County, California, 91109, United States" office research 0.997556545369086 United States TRUE
+european medicines agency MULTI Europe MULTI TRUE 30 2021-02-03 302037271 node "European Medicines Agency, 6, Domenico Scarlattilaan, Drentepark, Zuid, Amsterdam, Noord-Holland, Nederland, 1083HS, Nederland" office government 0.79651736792561 Nederland TRUE
+nature communications MULTI MULTI MULTI TRUE 30 2021-02-03 NA NA NA NA NA NA NA TRUE
+london school of hygiene and tropical medicine gb Europe Northern Europe FALSE 30 2021-02-03 185180502 way "London School of Hygiene and Tropical Medicine, Gower Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7HT, United Kingdom" amenity university 1.14105233650125 United Kingdom TRUE
+university of sussex gb Europe Northern Europe FALSE 30 2021-02-03 99822511 way "University of Sussex, East Street, Falmer, Lewes, East Sussex, South East, England, BN1 9PB, United Kingdom" amenity university 0.814277218171963 United Kingdom TRUE
+finland fi Europe Northern Europe FALSE 30 2021-02-03 257282877 relation Suomi / Finland boundary administrative 0.907327503568528 Suomi / Finland TRUE
+peking university cn Asia Eastern Asia FALSE 30 2021-02-03 259319792 relation "北京大å¦, 5å<8f>·, é¢<90>å’Œå›è·¯, 万柳地区, 海淀区, 北京市, 100871, ä¸å›½" amenity university 0.557740373274367 ä¸å›½ TRUE
+new brunswick ca Americas Northern America FALSE 30 2021-02-03 258084050 relation "New Brunswick / Nouveau-Brunswick, Canada" boundary administrative 0.83371652883794 Canada TRUE
+baylor college of medicine us Americas Northern America FALSE 29 2021-02-03 145245721 way "Baylor College of Medicine, 1, Baylor Plaza, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" building college 0.801517374360847 United States TRUE
+george washington university us Americas Northern America FALSE 29 2021-02-03 106978219 way "George Washington University, I Street Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States" amenity university 0.861031504404982 United States TRUE
+scripps research institute us Americas Northern America FALSE 29 2021-02-03 2879141 node "Scripps Research Institute, 10666, Coast Highway, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States" office research 0.301 United States TRUE
+university of maryland us Americas Northern America FALSE 29 2021-02-03 198712103 way "University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States" amenity university 0.859664537852789 United States TRUE
+federation of american societies for experimental biology us Americas Northern America TRUE 28 2021-02-03 NA NA NA NA NA NA NA TRUE
+new york times us Americas Northern America FALSE 28 2021-02-03 138755486 way "The New York Times, Woodbridge Avenue, Bonhamtown, Edison, Middlesex County, New Jersey, 08818, United States" building warehouse 0.301 United States TRUE
+stanford us Americas Northern America FALSE 28 2021-02-03 258528651 relation "Stanford, Palo Alto, Santa Clara County, California, United States" boundary census 0.627221804640549 United States TRUE
+thailand th Asia South-Eastern Asia FALSE 28 2021-02-03 258620831 relation ประเทศไทย boundary administrative 0.76262728915554 ประเทศไทย TRUE
+saudi arabia sa Asia Western Asia FALSE 28 2021-02-03 258074051 relation السعودية boundary administrative 0.735262517159872 السعودية TRUE
+philippines ph Asia South-Eastern Asia FALSE 28 2021-02-03 258179528 relation Philippines boundary administrative 0.869521465880606 Philippines TRUE
+doe NONE NA NA TRUE 28 2021-02-03 257680231 relation República Dominicana boundary administrative 0.708236599440443 República Dominicana TRUE
+natural history museum NONE NA NA TRUE 28 2021-02-03 94551563 way "Natural History Museum, Cromwell Road, Brompton, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW7 5BD, United Kingdom" tourism museum 0.901298316780421 United Kingdom TRUE
+leiden university nl Europe Western Europe FALSE 28 2021-02-03 259157980 relation "Universiteit Leiden, Einsteinweg, Leiden Bio Science Park, Leiden, Zuid-Holland, Nederland, 2333CE, Nederland" amenity university 0.688163620893378 Nederland TRUE
+weizmann institute of science il Asia Western Asia FALSE 28 2021-02-03 207850603 way "מכון ויצמן למדע, כרמל, ×<90>חוזות ×”× ×©×™×<90>, רחובות, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל" amenity university 0.482730278313856 ישר×<90>ל TRUE
+wellcome gb Europe Northern Europe TRUE 28 2021-02-03 11400763 node "æƒ åº· Wellcome, 40, 馬é 角é<81>“ Ma Tau Kok Road, é<9d> 背壟 Kau Pui Lung, 馬é åœ<8d> Ma Tau Wai, ä¹<9d>é¾<8d>城å<8d>€ Kowloon City District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" shop supermarket 0.101 ä¸å›½ TRUE
+university of sydney au Oceania Australia and New Zealand FALSE 28 2021-02-03 258428008 relation "The University of Sydney, Sparkes Street, Camperdown, Sydney, Council of the City of Sydney, New South Wales, 2006, Australia" amenity university 0.859671553892341 Australia TRUE
+georgetown university us Americas Northern America FALSE 27 2021-02-03 105725399 way "Georgetown University, 3700, O Street Northwest, Georgetown, Washington, District of Columbia, 20057, United States" amenity university 0.787586492717596 United States TRUE
+laser interferometer gravitational-wave observatory us Americas Northern America TRUE 27 2021-02-03 NA NA NA NA NA NA NA TRUE
+space telescope science institute us Americas Northern America FALSE 27 2021-02-03 52509642 node "Space Telescope Science Institute, 3700, San Martin Drive, Wyman Park, Baltimore, Maryland, 21218, United States" office administrative 0.401 United States TRUE
+white house office of science and technology policy us Americas Northern America TRUE 27 2021-02-03 NA NA NA NA NA NA NA TRUE
+campaign for science and engineering NONE NA NA FALSE 27 2021-02-03 NA NA NA NA NA NA NA TRUE
+european southern observatory MULTI Europe MULTI TRUE 27 2021-02-03 229063373 way "Europäische Südsternwarte, 2, Karl-Schwarzschild-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.001 Deutschland TRUE
+ames research center us Americas Northern America FALSE 26 2021-02-03 101560700 way "Ames Research Center, Santa Clara County, California, 94035-0016, United States" landuse industrial 0.767592905439716 United States TRUE
+maine us Americas Northern America FALSE 26 2021-02-03 257996253 relation "Maine, United States" boundary administrative 0.80496250046223 United States TRUE
+massachusetts general hospital us Americas Northern America FALSE 26 2021-02-03 117945499 way "Massachusetts General Hospital, 55, Fruit Street, Beacon Hill, Boston, Suffolk County, Massachusetts, 02114, United States" amenity hospital 0.76012624965149 United States TRUE
+michigan state university us Americas Northern America FALSE 26 2021-02-03 94305089 way "Michigan State University, Short Street, Bailey, East Lansing, Ingham County, Michigan, 48823, United States" amenity university 0.869602686432449 United States TRUE
+ukraine ua Europe Eastern Europe FALSE 26 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна TRUE
+kyoto university jp Asia Eastern Asia FALSE 26 2021-02-03 1318672 node "京都大å¦, æ<9d>±å¤§è·¯é€š;京都市é<81>“181å<8f>·äº¬éƒ½ç’°çŠ¶ç·š, è<81>–è·é™¢å±±çŽ‹ç”º, 左京区, 京都市, 京都府, 606-8391, 日本" amenity university 0.57959701929309 日本 TRUE
+amazon br Americas South America FALSE 26 2021-02-03 258080318 relation "Amazonas, Região Norte, Brasil" boundary administrative 0.700882727324139 Brasil TRUE
+university of new south wales au Oceania Australia and New Zealand FALSE 26 2021-02-03 102614348 way "University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia" amenity university 1.01490411729019 Australia TRUE
+iowa us Americas Northern America FALSE 25 2021-02-03 258149110 relation "Iowa, United States" boundary administrative 0.821883953901863 United States TRUE
+nevada us Americas Northern America FALSE 25 2021-02-03 258160832 relation "Nevada, United States" boundary administrative 0.808101044486331 United States TRUE
+purdue university us Americas Northern America FALSE 25 2021-02-03 107976847 way "Purdue University, South River Road, West Lafayette, Tippecanoe County, Indiana, 47907, United States" amenity university 0.759762689800642 United States TRUE
+spacex us Americas Northern America TRUE 25 2021-02-03 24857819 node "Spacex, 45, Preston Street, St Thomas, Exeter, Devon, South West England, England, EX1 1DF, United Kingdom" amenity arts_centre 0.258083983169266 United Kingdom TRUE
+king's college london gb Europe Northern Europe FALSE 25 2021-02-03 258760701 relation "King's College London, Strand Campus, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 2LS, United Kingdom" amenity university 0.967778517860205 United Kingdom TRUE
+scotland gb Europe Northern Europe FALSE 25 2021-02-03 257273413 relation "Scotland, United Kingdom" boundary administrative 0.878974525409939 United Kingdom TRUE
+novartis ch Europe Western Europe TRUE 25 2021-02-03 168483166 way "211, Novartis, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" landuse industrial 0.3 United States TRUE
+commonwealth scientific and industrial research organisation au Oceania Australia and New Zealand FALSE 25 2021-02-03 208662403 way "Commonwealth Scientific and Industrial Research Organisation (Floreat Site), 147, Underwood Avenue, Floreat, Town Of Cambridge, City of Nedlands, Western Australia, 6014, Australia" amenity research_institute 1.06308792913159 Australia TRUE
+monash university au Oceania Australia and New Zealand FALSE 25 2021-02-03 95076092 way "Monash University, Mile Lane, Parkville, City of Melbourne, Victoria, 3052, Australia" amenity university 0.449182950422608 Australia TRUE
+carnegie mellon university us Americas Northern America FALSE 24 2021-02-03 258357673 relation "Carnegie Mellon University, Warwick Terrace, Squirrel Hill North, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States" amenity university 0.861734322664205 United States TRUE
+us supreme court us Americas Northern America TRUE 24 2021-02-03 258928765 relation "Supreme Court, Tilak Marg, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India" amenity courthouse 0.700289443464696 India TRUE
+sierra leone sl Africa Western Africa FALSE 24 2021-02-03 257903966 relation Sierra Leone boundary administrative 0.866895719179607 Sierra Leone TRUE
+saturn NONE NA NA TRUE 24 2021-02-03 113007948 way "Saturn, 13, Berliner Straße, Senden, Landkreis Neu-Ulm, Bayern, 89250, Deutschland" shop electronics 0.496378365738396 Deutschland TRUE
+scopus NONE NA NA TRUE 24 2021-02-03 416620 node "Scopus, Bollinger County, Missouri, United States" place hamlet 0.35 United States TRUE
+intergovernmental panel on climate change MULTI MULTI MULTI TRUE 24 2021-02-03 NA NA NA NA NA NA NA TRUE
+madagascar mg Africa Eastern Africa FALSE 24 2021-02-03 258058840 relation Madagasikara boundary administrative 0.710032185300668 Madagasikara TRUE
+university of exeter gb Europe Northern Europe FALSE 24 2021-02-03 259019581 relation "University of Exeter, Blackboy Road, Newtown, Exeter, Devon, South West England, England, EX4 6TB, United Kingdom" amenity university 0.803356007669835 United Kingdom TRUE
+university of leicester gb Europe Northern Europe FALSE 24 2021-02-03 162085793 way "University of Leicester, University Road, Highfields, Leicester, City of Leicester, East Midlands, England, LE1 7RH, United Kingdom" amenity university 0.795552033321719 United Kingdom TRUE
+university of melbourne au Oceania Australia and New Zealand FALSE 24 2021-02-03 258899917 relation "University of Melbourne, Royal Parade, Parkville, City of Melbourne, Victoria, 3010, Australia" amenity university 0.849205724971094 Australia TRUE
+afghanistan af Asia Southern Asia FALSE 24 2021-02-03 258408076 relation اÙ<81>غانستان boundary administrative 0.747027482837314 اÙ<81>غانستان TRUE
+united arab emirates ae Asia Western Asia FALSE 24 2021-02-03 258427713 relation الإمارات العربية المتØدة boundary administrative 0.715277344543931 الإمارات العربية المتØدة TRUE
+mississippi us Americas Northern America FALSE 23 2021-02-03 258375642 relation "Mississippi, United States" boundary administrative 0.800391778545257 United States TRUE
+texas a&m university in college station us Americas Northern America FALSE 23 2021-02-03 259129741 relation "Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States" amenity university 1.25527727305854 United States TRUE
+university of virginia us Americas Northern America FALSE 23 2021-02-03 258891172 relation "University of Virginia, Albemarle County, Virginia, United States" amenity university 0.893364107518662 United States TRUE
+wisconsin us Americas Northern America FALSE 23 2021-02-03 257826400 relation "Wisconsin, United States" boundary administrative 0.830625593637679 United States TRUE
+morocco ma Africa Northern Africa FALSE 23 2021-02-03 258802367 relation Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب boundary administrative 0.781074717986943 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب TRUE
+korea kr Asia Eastern Asia FALSE 23 2021-02-03 258235947 relation ëŒ€í•œë¯¼êµ boundary administrative 0.802419592147396 ëŒ€í•œë¯¼êµ TRUE
+jaxa jp Asia Eastern Asia FALSE 23 2021-02-03 104684391 way "å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本" amenity research_institute 0.634103782224402 日本 TRUE
+jordan jo Asia Western Asia FALSE 23 2021-02-03 258022296 relation الأردن boundary administrative 0.716221771346838 الأردن TRUE
+ghana gh Africa Western Africa FALSE 23 2021-02-03 258409793 relation Ghana boundary administrative 0.812029140680526 Ghana TRUE
+newcastle university gb Europe Northern Europe FALSE 23 2021-02-03 129397314 way "Newcastle University, Queen Victoria Road, Haymarket, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE1 7RU, United Kingdom" amenity university 0.700454702492461 United Kingdom TRUE
+max planck society de Europe Western Europe TRUE 23 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of geneva ch Europe Western Europe FALSE 23 2021-02-03 79436448 node "Bioscope, Rue Michel Servet, Champel, Genève, 1206, Schweiz/Suisse/Svizzera/Svizra" tourism museum 0.001 Schweiz/Suisse/Svizzera/Svizra TRUE
+bangladesh bd Asia Southern Asia FALSE 23 2021-02-03 298155988 relation বাংলাদেশ boundary administrative 0.718005971623183 বাংলাদেশ TRUE
+university of queensland au Oceania Australia and New Zealand FALSE 23 2021-02-03 258259141 relation "The University of Queensland, Gladstone Road, St Lucia, Brisbane City, Queensland, 4072, Australia" amenity university 0.821330978816988 Australia TRUE
+university of cape town za Africa Southern Africa FALSE 22 2021-02-03 258385027 relation "University of Cape Town, Grotto Road, Rondebosch, Cape Town, City of Cape Town, Western Cape, 7700, South Africa" amenity university 0.902350677963883 South Africa TRUE
+vietnam vn Asia South-Eastern Asia FALSE 22 2021-02-03 258322044 relation Việt Nam boundary administrative 0.751194527333514 Việt Nam TRUE
+fermi national accelerator laboratory us Americas Northern America FALSE 22 2021-02-03 99059145 way "Fermi National Accelerator Laboratory, DuPage County, Illinois, United States" landuse industrial 0.863054296170656 United States TRUE
+harvard-smithsonian center for astrophysics us Americas Northern America TRUE 22 2021-02-03 NA NA NA NA NA NA NA TRUE
+memorial sloan kettering cancer center us Americas Northern America FALSE 22 2021-02-03 210339215 way "Memorial Sloan Kettering Cancer Center, 1275, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity hospital 0.894052338771708 United States TRUE
+new hampshire us Americas Northern America FALSE 22 2021-02-03 257734907 relation "New Hampshire, United States" boundary administrative 0.892788681067394 United States TRUE
+salk institute for biological studies us Americas Northern America TRUE 22 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of rochester us Americas Northern America FALSE 22 2021-02-03 114205376 way "Memorial Art Gallery, 500, University Avenue, East End, Rochester, Monroe County, New York, 14607, United States" tourism museum 0.53489332460211 United States TRUE
+us national cancer institute us Americas Northern America TRUE 22 2021-02-03 15618390 node "National Cancer Institute, شارع القصر العيني, Ù<81>م الخليج ودير النØاس, المنيل, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11241, مصر" amenity hospital 0.301 مصر TRUE
+republican NONE NA NA TRUE 22 2021-02-03 468223 node "Republican, Bertie County, North Carolina, United States" place hamlet 0.35 United States TRUE
+liberia lr Africa Western Africa FALSE 22 2021-02-03 257865924 relation Liberia boundary administrative 0.76493857339783 Liberia TRUE
+university of tokyo jp Asia Eastern Asia FALSE 22 2021-02-03 95061621 way "æ<9d>±äº¬å¤§å¦ æŸ<8f>ã‚ャンパス, å¦èž<8d>å<90>ˆã<81>®é<81>“, æŸ<8f>市, å<8d>ƒè‘‰çœŒ, 277-8583, 日本" amenity university 0.001 日本 TRUE
+university of nottingham gb Europe Northern Europe FALSE 22 2021-02-03 92101266 way "University of Nottingham, University Boulevard, Dunkirk, City of Nottingham, Nottinghamshire, East Midlands, England, NG7 2RD, United Kingdom" amenity university 0.828526304922465 United Kingdom TRUE
+tsinghua university cn Asia Eastern Asia FALSE 22 2021-02-03 259261903 relation "清å<8d>Žå¤§å¦, 30, å<8f>Œæ¸…è·¯, 五é<81>“å<8f>£, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100084, ä¸å›½" amenity university 0.540801021048672 ä¸å›½ TRUE
+centers for disease control and prevention us Americas Northern America FALSE 21 2021-02-03 96695743 way "Centers for Disease Control and Prevention Edward R. Roybal Campus, Clifton Heights Lane Northeast, Druid Hills, DeKalb County, Georgia, 1540, United States" office research 0.601 United States TRUE
+environmental defense fund us Americas Northern America TRUE 21 2021-02-03 NA NA NA NA NA NA NA TRUE
+montana us Americas Northern America FALSE 21 2021-02-03 258349675 relation "Montana, United States" boundary administrative 0.801736049923475 United States TRUE
+usa us Americas Northern America FALSE 21 2021-02-03 257984054 relation United States boundary administrative 0.935691367457589 United States TRUE
+rwanda rw Africa Eastern Africa FALSE 21 2021-02-03 257506373 relation Rwanda boundary administrative 0.766200826101714 Rwanda TRUE
+nepal np Asia Southern Asia FALSE 21 2021-02-03 298303229 relation नेपाल boundary administrative 0.709769815032436 नेपाल TRUE
+national research council NONE NA NA TRUE 21 2021-02-03 259257626 relation "1191, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, Canada" landuse commercial 0.71890455386909 Canada TRUE
+rosetta NONE NA NA TRUE 21 2021-02-03 6645175 node "رشيد, البØيرة, 22745, مصر" place town 0.433708896343545 مصر TRUE
+seoul national university kr Asia Eastern Asia FALSE 21 2021-02-03 3079877 node "서울대학êµ<90>, 서호ë<8f>™ë¡œ, ê¶Œì„ êµ¬, 수ì›<90>ì‹œ, 16614, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ TRUE
+north korea kp Asia Eastern Asia FALSE 21 2021-02-03 257555920 relation ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ boundary administrative 0.712625561293871 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ TRUE
+durham university gb Europe Northern Europe FALSE 21 2021-02-03 34350681 node "Palatine Reception, Palatine Centre, Stockton Road, City of Durham, Durham, County Durham, North East England, England, DH1 3LE, United Kingdom" tourism information 0.101 United Kingdom TRUE
+university of warwick gb Europe Northern Europe FALSE 21 2021-02-03 258669080 relation "University of Warwick, Evesham Walk, Cannon Park, Coventry, West Midlands Combined Authority, West Midlands, England, CV4 7DT, United Kingdom" amenity university 0.301 United Kingdom TRUE
+dfg de Europe Western Europe TRUE 21 2021-02-03 99534807 way "DFG Eingang Metzer Straße, Metzer Straße, Bellevue, Alt-Saarbrücken, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66117, Deutschland" amenity parking 0.101 Deutschland TRUE
+university of hong kong cn Asia Eastern Asia FALSE 21 2021-02-03 258613825 relation "é¦™æ¸¯å¤§å¸ The University of Hong Kong, åˆ—å ¤é “é<81>“ Lyttelton Road, 西å<8d>Šå±± Mid-Levels West, 西營盤 Sai Ying Pun, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity university 0.929678345929394 ä¸å›½ TRUE
+university of bern ch Europe Western Europe FALSE 21 2021-02-03 258566275 relation "Universität Bern, Falkenplatz, Länggasse, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.626372678886767 Schweiz/Suisse/Svizzera/Svizra TRUE
+brigham and women's hospital us Americas Northern America FALSE 20 2021-02-03 258770706 relation "Brigham and Women's Hospital, 75, Francis Street, Roxbury, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.87720861480317 United States TRUE
+hhs us Americas Northern America FALSE 20 2021-02-03 101633556 way "U.S. Department of Health and Human Services, Center Leg Freeway, Southwest Employment Area, Washington, District of Columbia, 20546, United States" office government 0.27381125651268 United States TRUE
+johns hopkins bloomberg school of public health us Americas Northern America FALSE 20 2021-02-03 258664201 relation "Johns Hopkins Bloomberg School of Public Health, McElderry Street, Butchers Hill, Baltimore, Maryland, 21205, United States" building yes 1.06277471441433 United States TRUE
+national center for atmospheric research us Americas Northern America FALSE 20 2021-02-03 47686315 node "NCAR Exhibits, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" tourism museum 0.501 United States TRUE
+usda us Americas Northern America FALSE 20 2021-02-03 257848060 relation "U.S. Department of Agriculture South Building, 12th Street Southwest, Southwest Employment Area, Washington, District of Columbia, 20013, United States" office government 0.609737594390182 United States TRUE
+world resources institute us Americas Northern America TRUE 20 2021-02-03 65742500 node "World Resources Institute, 83/1, Mühürdar Caddesi, Caferağa Mahallesi, Kadıköy, İstanbul, Marmara Bölgesi, 34710, Türkiye" office company 0.301 Türkiye TRUE
+new england journal of medicine NONE NA NA TRUE 20 2021-02-03 NA NA NA NA NA NA NA TRUE
+haiti ht Americas Caribbean FALSE 20 2021-02-03 257948040 relation Ayiti boundary administrative 0.689458681171941 Ayiti TRUE
+university of birmingham gb Europe Northern Europe FALSE 20 2021-02-03 70139772 node "University of Birmingham, Ring Road North, Bournbrook, Metchley, Birmingham, West Midlands Combined Authority, West Midlands, England, B15 2TN, United Kingdom" tourism information 0.301 United Kingdom TRUE
+wellcome trust sanger institute gb Europe Northern Europe FALSE 20 2021-02-03 259312934 relation "Wellcome Trust Sanger Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SA, United Kingdom" amenity research_institute 0.811524674526993 United Kingdom TRUE
+congo cg Africa Middle Africa FALSE 20 2021-02-03 257866268 relation Congo boundary administrative 0.767415764799089 Congo TRUE
+american chemical society us Americas Northern America TRUE 19 2021-02-03 NA NA NA NA NA NA NA TRUE
+case western reserve university us Americas Northern America FALSE 19 2021-02-03 259081536 relation "Case Western Reserve University, 10900, Euclid Avenue, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States" amenity university 0.914467419199317 United States TRUE
+genentech us Americas Northern America FALSE 19 2021-02-03 168391805 way "Genentech, 4625, Northeast Brookwood Parkway, Northeast Hillsboro, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, 97124, United States" building yes 0.101 United States TRUE
+georgia state university us Americas Northern America FALSE 19 2021-02-03 212195433 way "Georgia State University, 33, Gilmer Street Southeast, Five Points, Atlanta, Fulton County, Georgia, 30303, United States" amenity university 0.76661634303041 United States TRUE
+icahn school of medicine us Americas Northern America FALSE 19 2021-02-03 156253448 way "Icahn School of Medicine at Mount Sinai, 1184, 5th Avenue, Manhattan Community Board 11, Manhattan, New York County, New York, 10029, United States" building hospital 0.791742165798516 United States TRUE
+jpl us Americas Northern America FALSE 19 2021-02-03 178071948 way "Jet Propulsion Laboratory, 4800, Oak Grove Drive, Pasadena, Los Angeles County, California, 91109, United States" office research 0.697556545369086 United States TRUE
+national museum of natural history us Americas Northern America FALSE 19 2021-02-03 107528703 way "National Museum of Natural History, Smithsonian Pollinator Garden Path, Penn Quarter, Washington, District of Columbia, 20560, United States" tourism museum 0.992769930727232 United States TRUE
+the states us Americas Northern America FALSE 19 2021-02-03 257984054 relation United States boundary administrative 1.03569136745759 United States TRUE
+university of miami us Americas Northern America FALSE 19 2021-02-03 201200428 way "University of Miami, Fate Bridge, Coral Gables, Miami-Dade County, Florida, 33124, United States" amenity university 0.846468701525174 United States TRUE
+university of new mexico us Americas Northern America FALSE 19 2021-02-03 163763522 way "University of New Mexico, Las Lomas Road Northeast, Martinez Town, Albuquerque, Bernalillo County, New Mexico, 87102-2622, United States" amenity university 0.914482025763995 United States TRUE
+us department of health and human services us Americas Northern America FALSE 19 2021-02-03 176345296 way "Department of Health and Human Services, 221, State Street, Augusta, Kennebec County, Maine, 04330, United States" office government 0.701 United States TRUE
+portugal pt Europe Southern Europe FALSE 19 2021-02-03 257659868 relation Portugal boundary administrative 0.904004273464586 Portugal TRUE
+crispr NONE NA NA FALSE 19 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of leeds gb Europe Northern Europe FALSE 19 2021-02-03 107623156 way "University of Leeds, Woodhouse Lane, Woodhouse, Leeds, West Yorkshire, Yorkshire and the Humber, England, LS2 3ED, United Kingdom" amenity university 0.301 United Kingdom TRUE
+czech republic cz Europe Eastern Europe FALSE 19 2021-02-03 257259323 relation ÄŒesko boundary administrative 0.810148442865958 ÄŒesko TRUE
+fudan university cn Asia Eastern Asia FALSE 19 2021-02-03 258558662 relation "å¤<8d>旦大å¦, 220, 邯郸路, æ<9d>¨æµ¦åŒº, 200433, ä¸å›½" amenity university 0.510109744363923 ä¸å›½ TRUE
+alberta ca Americas Northern America FALSE 19 2021-02-03 257625587 relation "Alberta, Canada" boundary administrative 0.772431047420852 Canada TRUE
+university of são paulo br Americas South America FALSE 19 2021-02-03 258734158 relation "Cidade Universitária Armando de Salles Oliveira, Rua Francisco dos Santos, Butantã, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05587-050, Brasil" amenity university 0.743129165494252 Brasil TRUE
+aaas us Americas Northern America FALSE 18 2021-02-03 8123141 node "AAAS Art Gallery (public), 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" tourism artwork 0.101 United States TRUE
+kentucky us Americas Northern America FALSE 18 2021-02-03 257850228 relation "Kentucky, United States" boundary administrative 0.81140476114566 United States TRUE
+los alamos national laboratory us Americas Northern America FALSE 18 2021-02-03 259190746 relation "Los Alamos National Laboratory, Los Alamos, Los Alamos County, New Mexico, United States" boundary military 0.927683295435605 United States TRUE
+mayo clinic us Americas Northern America FALSE 18 2021-02-03 162861597 way "Mayo Clinic, Phoenix, Maricopa County, Arizona, 85054, United States" highway unclassified 0.3 United States TRUE
+monsanto us Americas Northern America FALSE 18 2021-02-03 336874 node "Monsanto, Contra Costa County, California, 94520, United States" place hamlet 0.457598476917669 United States TRUE
+university of georgia us Americas Northern America FALSE 18 2021-02-03 259130044 relation "University of Georgia, East Green Street, Athens-Clarke County Unified Government, Athens-Clarke County, Georgia, 30602, United States" amenity university 0.854309471737941 United States TRUE
+el niño NONE NA NA TRUE 18 2021-02-03 20287493 node "El Niño, Municipio de Tijuana, Baja California, 22254, México" place village 0.475 México TRUE
+nature geoscience NONE NA NA FALSE 18 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of amsterdam nl Europe Western Europe FALSE 18 2021-02-03 130755668 way "Amsterdam University College, Science Park, Oost, Amsterdam, Noord-Holland, Nederland, 1098 XG, Nederland" office educational_institution 0.458218474293395 Nederland TRUE
+association of american universities MULTI Americas Northern America TRUE 18 2021-02-03 NA NA NA NA NA NA NA TRUE
+iss MULTI MULTI MULTI TRUE 18 2021-02-03 127962809 way "ISS, Priorei, Eilpe/Dahl, Hagen, Nordrhein-Westfalen, 58091, Deutschland" landuse industrial 0.3 Deutschland TRUE
+cardiff university gb Europe Northern Europe FALSE 18 2021-02-03 226503456 way "Cardiff University, 5, The Parade, Tredegarville, Roath, Cardiff, Cymru / Wales, CF24 3AA, United Kingdom" building university 0.201 United Kingdom TRUE
+house of commons gb Europe Northern Europe FALSE 18 2021-02-03 201453802 way "House of Commons, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 0PW, United Kingdom" highway footway 0.375 United Kingdom TRUE
+thomson reuters gb Europe Northern Europe FALSE 18 2021-02-03 135775517 way "Thomson Reuters, 30, South Colonnade, Canary Wharf, Isle of Dogs, London Borough of Tower Hamlets, London, Greater London, England, E14 5EP, United Kingdom" building office 0.43181178765026 United Kingdom TRUE
+ucl gb Europe Northern Europe FALSE 18 2021-02-03 97008546 way "Petrie Museum of Egyptian Archeology, Malet Place, St Pancras, London Borough of Camden, London, Greater London, England, WC1E 6BT, United Kingdom" tourism museum 0.404546165234516 United Kingdom TRUE
+university of zurich ch Europe Western Europe FALSE 18 2021-02-03 114961958 way "Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.354152289914814 Schweiz/Suisse/Svizzera/Svizra TRUE
+university of montreal ca Americas Northern America FALSE 18 2021-02-03 113982632 way "Concordia University (SGW Campus), Rue Saint-Mathieu, Montagne, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3H 2P4, Canada" amenity university 0.592769930727231 Canada TRUE
+federal university of rio de janeiro br Americas South America FALSE 18 2021-02-03 NA NA NA NA NA NA NA TRUE
+american association for cancer research us Americas Northern America TRUE 17 2021-02-03 NA NA NA NA NA NA NA TRUE
+cms us Americas Northern America FALSE 17 2021-02-03 118801821 way "Centers for Medicare & Medicaid Services, Baltimore County, Maryland, United States" landuse commercial 0.384962546693336 United States TRUE
+howard hughes medical institute us Americas Northern America TRUE 17 2021-02-03 NA NA NA NA NA NA NA TRUE
+louisiana state university us Americas Northern America FALSE 17 2021-02-03 100338394 way "Louisiana State University, West Lakeshore Drive, College Town, Baton Rouge, East Baton Rouge Parish, Louisiana, 70802, United States" amenity university 0.850358843721885 United States TRUE
+us national institute of mental health us Americas Northern America TRUE 17 2021-02-03 140482817 way "Institute of Mental Health, Triumph Road, Wollaton Park, City of Nottingham, East Midlands, England, NG8 1FD, United Kingdom" building yes 0.401 United Kingdom TRUE
+us national research council us Americas Northern America TRUE 17 2021-02-03 259257626 relation "1191, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, Canada" landuse commercial 0.71890455386909 Canada TRUE
+usgs us Americas Northern America FALSE 17 2021-02-03 198081067 way "U.S. Geological Survey Great Lakes Science Center, Ann Arbor, Washtenaw County, Michigan, United States" landuse industrial 0.2 United States TRUE
+somalia so Africa Eastern Africa FALSE 17 2021-02-03 258390915 relation Soomaaliya الصومال boundary administrative 0.681239435622405 Soomaaliya الصومال TRUE
+cassini NONE NA NA TRUE 17 2021-02-03 3464485 node "Cassini, Barasso, Varese, Lombardia, 21025, Italia" place hamlet 0.35 Italia TRUE
+medical research council NONE NA NA TRUE 17 2021-02-03 69565154 node "Medical Research Council, South Bank Road, Basse Santa Su, Basse Fulladu East, Basse, Upper River, Gambia" amenity hospital 0.301 Gambia TRUE
+ministry of science and technology NONE NA NA TRUE 17 2021-02-03 144400913 way "משרד המדע ×•×”×˜×›× ×•×œ×•×’×™×”, ×”×<90>×•× ×™×‘×¨×¡×™×˜×” העברית, קרית ×ž× ×—×<9d> בגין, الشيخ جراØ, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" office government 0.001 ישר×<90>ל TRUE
+wildlife service NONE NA NA TRUE 17 2021-02-03 85634178 way "Wildlife, Choctaw County, Alabama, United States" highway residential 0.2 United States TRUE
+erc MULTI Europe MULTI TRUE 17 2021-02-03 73122812 node "ERCEA, 16, Place Charles Rogier - Karel Rogierplein, Saint-Josse-ten-Noode - Sint-Joost-ten-Node, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1210, België / Belgique / Belgien" office government 0.529911496965354 België / Belgique / Belgien TRUE
+world meteorological organization MULTI MULTI MULTI TRUE 17 2021-02-03 NA NA NA NA NA NA NA TRUE
+akatsuki jp Asia Eastern Asia FALSE 17 2021-02-03 46404960 node "æš<81>, 甲賀市, 滋賀県, 528-0012, 日本" place neighbourhood 0.25 日本 TRUE
+hokkaido university jp Asia Eastern Asia FALSE 17 2021-02-03 128417717 way "北海é<81>“大å¦, 環状通, 北14æ<9d>¡æ<9d>±7, æ<9d>±åŒº, æœå¹Œå¸‚, 石狩振興局, 北海é<81>“, 060-0808, 日本" amenity university 0.525438377157725 日本 TRUE
+gsk gb Europe Northern Europe TRUE 17 2021-02-03 226292997 way "GSK, Prangins, District de Nyon, Vaud, 1197, Schweiz/Suisse/Svizzera/Svizra" landuse industrial 0.3 Schweiz/Suisse/Svizzera/Svizra TRUE
+pasteur institute fr Europe Western Europe TRUE 17 2021-02-03 19127860 node "Institut Pasteur, Avenue de l'Indépendance, Bangî - Bangui, Ködörösêse tî Bêafrîka - République Centrafricaine" amenity hospital 0.101 Ködörösêse tî Bêafrîka - République Centrafricaine TRUE
+ecuador ec Americas South America FALSE 17 2021-02-03 258316020 relation Ecuador boundary administrative 0.839288603689881 Ecuador TRUE
+german aerospace center de Europe Western Europe FALSE 17 2021-02-03 258165325 relation "Deutsches Zentrum für Luft- und Raumfahrt, Grengel, Porz, Köln, Nordrhein-Westfalen, 51147, Deutschland" landuse industrial 0.419657429852984 Deutschland TRUE
+max planck institute for gravitational physics de Europe Western Europe FALSE 17 2021-02-03 96116691 way "Max-Planck-Institut für Gravitationsphysik, 1, Am Mühlenberg, Golm, Potsdam Nord, Potsdam, Brandenburg, 14476, Deutschland" office research 0.46851441835616 Deutschland TRUE
+cameroon cm Africa Middle Africa FALSE 17 2021-02-03 258195704 relation Cameroun boundary administrative 0.719266805257029 Cameroun TRUE
+queen's university ca Americas Northern America FALSE 17 2021-02-03 89031530 way "Queen's University, Stuart Street, University District, Kingston, Eastern Ontario, Ontario, K7L 3N6, Canada" amenity university 0.823019643336546 Canada TRUE
+australian academy of science au Oceania Australia and New Zealand FALSE 17 2021-02-03 143546668 way "Australian Academy of Science, Marcus Clarke Street, City, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia" amenity school 0.836617872091844 Australia TRUE
+fbi us Americas Northern America TRUE 16 2021-02-03 258367640 relation "Federacija Bosne i Hercegovine, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" boundary administrative 0.630855216331828 Bosna i Hercegovina / БоÑ<81>на и Херцеговина TRUE
+gates foundation us Americas Northern America FALSE 16 2021-02-03 177964409 way "Bill & Melinda Gates Foundation, 500, 5th Avenue North, Lower Queen Anne, Belltown, Seattle, King County, Washington, 98109, United States" office foundation 0.633000783214491 United States TRUE
+george mason university us Americas Northern America FALSE 16 2021-02-03 170416369 way "George Mason University, Cleveland Street, Maple Hills, Halemhurst, Fairfax, Fairfax (city), Virginia, 22030, United States" amenity university 0.804705676188448 United States TRUE
+national cancer institute us Americas Northern America TRUE 16 2021-02-03 15618390 node "National Cancer Institute, شارع القصر العيني, Ù<81>م الخليج ودير النØاس, المنيل, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11241, مصر" amenity hospital 0.301 مصر TRUE
+natural resources defense council us Americas Northern America FALSE 16 2021-02-03 48705927 node "Natural Resources Defense Council, 317, East Mendenhall Street, Bozeman, Gallatin County, Montana, 59715, United States" place house 0.401 United States TRUE
+planetary science institute us Americas Northern America TRUE 16 2021-02-03 NA NA NA NA NA NA NA TRUE
+south dakota us Americas Northern America FALSE 16 2021-02-03 258150382 relation "South Dakota, United States" boundary administrative 0.895271582116408 United States TRUE
+university of iowa us Americas Northern America FALSE 16 2021-02-03 258145487 relation "The University of Iowa, West Benton Street, Iowa City, Johnson County, Iowa, 52246, United States" amenity university 0.864487559394863 United States TRUE
+university of pittsburgh us Americas Northern America FALSE 16 2021-02-03 258622513 relation "University of Pittsburgh, Strip District, Pittsburgh, Allegheny County, Pennsylvania, United States" amenity university 0.870726964523873 United States TRUE
+west virginia us Americas Northern America FALSE 16 2021-02-03 257993887 relation "West Virginia, United States" boundary administrative 0.895386507122709 United States TRUE
+yale us Americas Northern America FALSE 16 2021-02-03 257391646 relation "Yale, Guthrie County, Iowa, United States" boundary administrative 0.531727684347105 United States TRUE
+senegal sn Africa Western Africa FALSE 16 2021-02-03 258367179 relation Sénégal boundary administrative 0.7011432334198 Sénégal TRUE
+utrecht university nl Europe Western Europe FALSE 16 2021-02-03 61984253 node "UU4U, Leuvenplein, Utrecht, Nederland, 3584LA, Nederland" tourism information 0.101 Nederland TRUE
+organisation for economic co-operation and development MULTI MULTI MULTI TRUE 16 2021-02-03 103637552 way "OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" office government 0.669924309656139 France TRUE
+kazakhstan kz Asia Central Asia FALSE 16 2021-02-03 258456913 relation ҚазақÑ<81>тан boundary administrative 0.762519577338093 ҚазақÑ<81>тан TRUE
+cambodia kh Asia South-Eastern Asia FALSE 16 2021-02-03 257250265 relation ព្រះរាជាណាចក្រ​កម្ពុជា boundary administrative 0.695583245164628 ព្រះរាជាណាចក្រ​កម្ពុជា TRUE
+university of milan it Europe Southern Europe TRUE 16 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان TRUE
+university of liverpool gb Europe Northern Europe FALSE 16 2021-02-03 139896766 way "University of Liverpool, Peach Street, Knowledge Quarter, Liverpool, North West England, England, L7, United Kingdom" amenity university 0.301 United Kingdom TRUE
+inserm fr Europe Western Europe FALSE 16 2021-02-03 109366785 way "Institut national de la santé et de la recherche médicale, 12, Avenue du Professeur Léon Bernard, Kennedy, Villejean, Villejean - Beauregard, Quartiers Nord-Ouest, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35000, France" building yes 0.412449177852278 France TRUE
+costa rica cr Americas Central America FALSE 16 2021-02-03 258402817 relation Costa Rica boundary administrative 0.916454807244672 Costa Rica TRUE
+zimbabwe zw Africa Eastern Africa FALSE 15 2021-02-03 257847347 relation Zimbabwe boundary administrative 0.797897126879187 Zimbabwe TRUE
+zambia zm Africa Eastern Africa FALSE 15 2021-02-03 257858630 relation Zambia boundary administrative 0.78492269201686 Zambia TRUE
+yemen ye Asia Western Asia FALSE 15 2021-02-03 258075923 relation اليمن boundary administrative 0.734163292678192 اليمن TRUE
+center for science and democracy us Americas Northern America TRUE 15 2021-02-03 NA NA NA NA NA NA NA TRUE
+dartmouth college us Americas Northern America FALSE 15 2021-02-03 236828980 way "Dartmouth College, River Road, Norwich, Windsor County, Vermont, 03755, United States" amenity college 0.769183253746589 United States TRUE
+delaware us Americas Northern America FALSE 15 2021-02-03 257993619 relation "Delaware, United States" boundary administrative 0.783550568235905 United States TRUE
+lawrence livermore national laboratory us Americas Northern America FALSE 15 2021-02-03 95865246 way "Lawrence Livermore National Laboratory, South Vasco Road, Livermore, Alameda County, California, 94550, United States" amenity science_park 0.893328255224182 United States TRUE
+melinda gates foundation us Americas Northern America FALSE 15 2021-02-03 177964409 way "Bill & Melinda Gates Foundation, 500, 5th Avenue North, Lower Queen Anne, Belltown, Seattle, King County, Washington, 98109, United States" office foundation 0.733000783214492 United States TRUE
+nist us Americas Northern America TRUE 15 2021-02-03 137975640 way "Ð<9d>иÑ<81>Ñ‚ÑŒ, ГайнÑ<81>кий муниципальный округ, ПермÑ<81>кий край, ПриволжÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" waterway river 0.275 РоÑ<81>Ñ<81>иÑ<8f> TRUE
+slac national accelerator laboratory us Americas Northern America FALSE 15 2021-02-03 299175282 way "Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States" amenity research_center 0.727082745074033 United States TRUE
+south carolina us Americas Northern America FALSE 15 2021-02-03 257325089 relation "South Carolina, United States" boundary administrative 0.90345926227768 United States TRUE
+state university of new york us Americas Northern America FALSE 15 2021-02-03 176996050 way "University at Albany, The State University of New York, Tricentenial Drive, Albany, Albany County, New York, 12203, United States" amenity university 0.941578907776644 United States TRUE
+union of concerned scientists us Americas Northern America TRUE 15 2021-02-03 NA NA NA NA NA NA NA TRUE
+weill cornell medical college us Americas Northern America FALSE 15 2021-02-03 2627269 node "Weill Cornell Medical College, 1300, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10128, United States" amenity university 0.773868796445932 United States TRUE
+wyoming us Americas Northern America FALSE 15 2021-02-03 257871658 relation "Wyoming, United States" boundary administrative 0.790706641027201 United States TRUE
+romania ro Europe Eastern Europe FALSE 15 2021-02-03 257807627 relation România boundary administrative 0.805346179828883 România TRUE
+society for neuroscience NONE NA NA FALSE 15 2021-02-03 NA NA NA NA NA NA NA TRUE
+namibia na NA NA FALSE 15 2021-02-03 258181441 relation Namibia boundary administrative 0.787423386363076 Namibia TRUE
+malaysia my Asia South-Eastern Asia FALSE 15 2021-02-03 258625503 relation Malaysia boundary administrative 0.867487508874317 Malaysia TRUE
+iucn MULTI MULTI MULTI TRUE 15 2021-02-03 197240496 way "IUCN, Rajapaksha Mawatha, TownHall, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity office 0.101 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை TRUE
+oecd MULTI MULTI MULTI TRUE 15 2021-02-03 103637552 way "OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" office government 0.669924309656139 France TRUE
+tel aviv university il Asia Western Asia FALSE 15 2021-02-03 37018800 node "תל ×<90>ביב ×<90>×•× ×™×‘×¨×¡×™×˜×”, ×<90>יילון דרו×<9d>, תל ×<90>ביב - יפו, ×<90>×•× ×™×‘×¨×¡×™×˜×ª ת""×<90>, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל" railway station 0.339805842395375 ישר×<90>ל TRUE
+bgi cn Asia Eastern Asia TRUE 15 2021-02-03 102608522 way "Grantley Adams International Airport, Tom Adams Highway, Charnocks, Fairy Valley, Christ Church, CHRIST CHURCH, Barbados" aeroway aerodrome 0.39332663350649 Barbados TRUE
+yunnan cn Asia Eastern Asia FALSE 15 2021-02-03 258085373 relation "云å<8d>—çœ<81>, ä¸å›½" boundary administrative 0.665684201955769 ä¸å›½ TRUE
+roche ch Europe Western Europe TRUE 15 2021-02-03 258342813 relation "Roche, La Tour-du-Pin, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38090, France" boundary administrative 0.632815701917223 France TRUE
+quebec ca Americas Northern America FALSE 15 2021-02-03 258336560 relation "Québec, Canada" boundary administrative 0.752720691937819 Canada TRUE
+university of vienna at Europe Western Europe FALSE 15 2021-02-03 258520179 relation "Universität Wien, 1, Universitätsring, Schottenviertel, Innere Stadt, Wien, 1010, Österreich" building university 0.282582546755277 Österreich TRUE
+university of pretoria za Africa Southern Africa FALSE 14 2021-02-03 162398262 way "Geography, Geoinformatics and Meteorology Building, Tukkie, Baileys Muckleneuk, Tshwane Ward 56, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0001, South Africa" building Campus 0.201 South Africa TRUE
+american society for microbiology us Americas Northern America TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+ct us Americas Northern America FALSE 14 2021-02-03 258171713 relation "Connecticut, United States" boundary administrative 0.818771933111505 United States TRUE
+dana-farber cancer institute us Americas Northern America FALSE 14 2021-02-03 145616376 way "Dana-Farber Cancer Institute, 450, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States" amenity hospital 0.71689306175332 United States TRUE
+goddard institute for space studies us Americas Northern America TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+idaho us Americas Northern America FALSE 14 2021-02-03 257490816 relation "Idaho, United States" boundary administrative 0.791516533107901 United States TRUE
+johnson & johnson us Americas Northern America TRUE 14 2021-02-03 120701063 way "Johnson & Johnson, Gemarkung Barmen, Wuppertal, Nordrhein-Westfalen, 42289, Deutschland" landuse industrial 0.4 Deutschland TRUE
+national institute of standards and technology us Americas Northern America FALSE 14 2021-02-03 103001988 way "National Institute of Standards and Technology, Montgomery County, Maryland, 20899, United States" landuse industrial 0.8 United States TRUE
+niaid us Americas Northern America TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+northeastern university us Americas Northern America FALSE 14 2021-02-03 163110509 way "Northeastern University, Ruggles Street, Roxbury Crossing, Roxbury, Boston, Suffolk County, Massachusetts, 02120, United States" amenity university 0.692915167891094 United States TRUE
+university of alabama us Americas Northern America FALSE 14 2021-02-03 110391765 way "University of Alabama, 9th Street, Tuscaloosa, Tuscaloosa County, Alabama, 35487, United States" amenity university 0.849900181888843 United States TRUE
+university of tennessee us Americas Northern America FALSE 14 2021-02-03 178444498 way "University of Tennessee, Alcoa Highway, Fort Sanders, Knoxville, Knox County, Tennessee, 37996, United States" amenity university 0.844319596061909 United States TRUE
+washington state university us Americas Northern America FALSE 14 2021-02-03 258940577 relation "Washington State University, Northeast Reaney Way, Pullman, Whitman County, Washington, 99164, United States" amenity university 0.81377697632841 United States TRUE
+conservative party NONE NA NA TRUE 14 2021-02-03 150193380 way "Conservative Party, Glenlea Road, Well Hall, Royal Borough of Greenwich, London, Greater London, England, SE9 1DZ, United Kingdom" office political 0.201 United Kingdom TRUE
+ministry of education NONE NA NA TRUE 14 2021-02-03 154002767 way "Ministry of Education, 33, Bowen Street, Wellington Central, Wellington, Wellington City, Wellington, 6140, New Zealand / Aotearoa" office government 0.715942243699873 New Zealand / Aotearoa TRUE
+national autonomous university of mexico mx Americas Central America FALSE 14 2021-02-03 96671012 way "Universidad Nacional Autónoma de México, Circuito Exterior, Ciudad Universitaria, Coyoacán, Ciudad de México, 04360, México" amenity university 0.562409087444079 México TRUE
+unesco MULTI MULTI MULTI TRUE 14 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 0.808162869304848 Palestinian Territory TRUE
+institute of physics gb Europe Northern Europe FALSE 14 2021-02-03 141162734 way "Institute of Physics, 76, Portland Place, Marylebone, City of Westminster, London, Greater London, England, W1B 1NT, United Kingdom" office ngo 0.721993534059618 United Kingdom TRUE
+oxford gb Europe Northern Europe TRUE 14 2021-02-03 468374 node "Oxford, Chester County, Pennsylvania, 19363, United States" place suburb 0.760604041060727 United States TRUE
+university of york gb Europe Northern Europe FALSE 14 2021-02-03 259581754 relation "University of York, Low Lane, Heslington, York, Yorkshire and the Humber, England, YO10 5DD, United Kingdom" amenity university 0.808489417863799 United Kingdom TRUE
+wellcome sanger institute gb Europe Northern Europe FALSE 14 2021-02-03 259312934 relation "Wellcome Trust Sanger Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SA, United Kingdom" amenity research_institute 0.711524674526993 United Kingdom TRUE
+ludwig maximilian university of munich de Europe Western Europe TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+max planck institute for the science of human history de Europe Western Europe TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+southern university of science and technology cn Asia Eastern Asia FALSE 14 2021-02-03 193573154 way "å<8d>—方科技大å¦, 1088, å¦è‹‘大é<81>“, 深圳大å¦åŸŽ, 桃å›è¡—é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518055, ä¸å›½" amenity university 0.310439474412231 ä¸å›½ TRUE
+sun yat-sen university cn Asia Eastern Asia FALSE 14 2021-02-03 162813155 way "ä¸å±±å¤§å¦å<8d>—æ ¡åŒº, 135, 新港西路, 新港街é<81>“, æµ·ç<8f> 区, 广州市, 广东çœ<81>, 510275, ä¸å›½" amenity university 0.474754845855875 ä¸å›½ TRUE
+simon fraser university ca Americas Northern America FALSE 14 2021-02-03 113041662 way "Simon Fraser University, University Drive West, Burnaby, Metro Vancouver Regional District, British Columbia, V5A 4X6, Canada" amenity university 0.794772751234326 Canada TRUE
+university of ottawa ca Americas Northern America FALSE 14 2021-02-03 173311174 way "University of Ottawa, 75, Laurier Avenue East, Sandy Hill, Rideau-Vanier, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1N 6N5, Canada" amenity university 0.812764144652578 Canada TRUE
+bolivia bo Americas South America FALSE 14 2021-02-03 258419196 relation Bolivia boundary administrative 0.833354940927664 Bolivia TRUE
+csiro au Oceania Australia and New Zealand FALSE 14 2021-02-03 148535125 way "CSIRO, Mayfield West, Newcastle, Newcastle City Council, New South Wales, 2304, Australia" landuse industrial 0.3 Australia TRUE
+university of the witwatersrand za Africa Southern Africa FALSE 13 2021-02-03 95936135 way "University of the Witwatersrand, Empire Road, Parktown, Johannesburg Ward 87, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" amenity university 0.87569370880422 South Africa TRUE
+allen institute for brain science us Americas Northern America FALSE 13 2021-02-03 176152346 way "Allen Institute for Brain Science, 615, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office research 0.501 United States TRUE
+american museum of natural history us Americas Northern America FALSE 13 2021-02-03 181018011 way "American Museum of Natural History, 180, Central Park West, Upper West Side, Manhattan Community Board 7, Manhattan, New York County, New York, 10024, United States" tourism museum 1.04240928202528 United States TRUE
+amgen us Americas Northern America FALSE 13 2021-02-03 178550546 way "Amgen, Thousand Oaks, Ventura County, California, United States" landuse industrial 0.3 United States TRUE
+berkeley us Americas Northern America FALSE 13 2021-02-03 258426548 relation "Berkeley, Alameda County, California, United States" boundary administrative 0.704505510928137 United States TRUE
+boeing us Americas Northern America FALSE 13 2021-02-03 217291868 way "Boeing, Pasadena, Harris County, Texas, United States" landuse commercial 0.3 United States TRUE
+brookhaven national laboratory us Americas Northern America FALSE 13 2021-02-03 104653350 way "Brookhaven National Laboratory, Suffolk County, New York, United States" landuse commercial 0.5 United States TRUE
+caltech us Americas Northern America FALSE 13 2021-02-03 97237039 way "California Institute of Technology, East Del Mar Boulevard, Pasadena, Los Angeles County, California, 91106, United States" amenity university 0.58591368499579 United States TRUE
+fermilab us Americas Northern America FALSE 13 2021-02-03 99059145 way "Fermi National Accelerator Laboratory, DuPage County, Illinois, United States" landuse industrial 0.463054296170656 United States TRUE
+fred hutchinson cancer research center us Americas Northern America FALSE 13 2021-02-03 179513052 way "Fred Hutchinson Cancer Research Center, 1100, Fairview Avenue North, South Lake Union, Capitol Hill, Seattle, King County, Washington, 98109, United States" amenity research_institute 0.831005307834616 United States TRUE
+jackson laboratory us Americas Northern America FALSE 13 2021-02-03 100308447 way "The Jackson Laboratory, 600, Main Street, Bar Harbor, Hancock County, Maine, 04609, United States" amenity research_institute 0.201 United States TRUE
+rice university us Americas Northern America FALSE 13 2021-02-03 103588283 way "Rice University, Shakespeare Street, Houston, Harris County, Texas, 77030, United States" amenity university 0.734727351217308 United States TRUE
+university of missouri us Americas Northern America FALSE 13 2021-02-03 157228940 way "University of Missouri, Old 63 South, Columbia, Boone County, Missouri, 65201, United States" amenity university 0.856334584047093 United States TRUE
+university of notre dame us Americas Northern America FALSE 13 2021-02-03 148464630 way "University of Notre Dame du Lac, West Pokagon Street, North Shore Triangle, South Bend, Saint Joseph County, Indiana, 46556, United States" amenity university 0.970403619291787 United States TRUE
+university of texas md anderson cancer center us Americas Northern America FALSE 13 2021-02-03 103450497 way "University of Texas MD Anderson Cancer Center, 1515, Holcombe Boulevard, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity hospital 1.04319043229938 United States TRUE
+us agency for international development us Americas Northern America FALSE 13 2021-02-03 19295624 node "US Agency for International Development, 14th Street Northwest, Washington, District of Columbia, 20230, United States" office government 0.998819499208192 United States TRUE
+us congress us Americas Northern America FALSE 13 2021-02-03 257925515 relation "Congress, Maricopa County, Arizona, 85332, United States" boundary administrative 0.490444593674683 United States TRUE
+us department of justice us Americas Northern America TRUE 13 2021-02-03 258462661 relation "Department of Justice, Padre Faura Street, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" office government 0.772714057293031 Luzon TRUE
+us national institute of standards and technology us Americas Northern America FALSE 13 2021-02-03 103001988 way "National Institute of Standards and Technology, Montgomery County, Maryland, 20899, United States" landuse industrial 0.8 United States TRUE
+lund university se Europe Northern Europe TRUE 13 2021-02-03 141557155 way "Lund Building, University Drive, Duluth, Saint Louis County, Minnesota, 55812, United States" building yes 0.201 United States TRUE
+ph ph Asia South-Eastern Asia FALSE 13 2021-02-03 258179528 relation Philippines boundary administrative 0.869521465880606 Philippines TRUE
+panama pa Americas Central America FALSE 13 2021-02-03 257650546 relation Panamá boundary administrative 0.714187410132119 Panamá TRUE
+university of auckland nz Oceania Australia and New Zealand FALSE 13 2021-02-03 259348817 relation "University of Auckland, Ernest Davis Steps, Quay Park, Auckland Central, Auckland, WaitematÄ<81>, Auckland, 1053, New Zealand / Aotearoa" amenity university 0.808489417863799 New Zealand / Aotearoa TRUE
+embryology authority NONE NA NA FALSE 13 2021-02-03 NA NA NA NA NA NA NA TRUE
+nature publishing group NONE NA NA FALSE 13 2021-02-03 NA NA NA NA NA NA NA TRUE
+fao MULTI MULTI MULTI TRUE 13 2021-02-03 50992903 node "FAO, Viale Aventino, Municipio Roma I, Roma, Roma Capitale, Lazio, 00153, Italia" office government 0.503670690295642 Italia TRUE
+interacademy council MULTI MULTI MULTI TRUE 13 2021-02-03 NA NA NA NA NA NA NA TRUE
+international space station MULTI MULTI MULTI TRUE 13 2021-02-03 54535102 node "International Space Station, 1601, NASA Parkway, Houston, Harris County, Texas, 77058, United States" tourism attraction 0.301 United States TRUE
+wwf MULTI MULTI MULTI TRUE 13 2021-02-03 187819953 way "WWF, Juupajoki, Ylä-Pirkanmaan seutukunta, Pirkanmaa, Länsi- ja Sisä-Suomen aluehallintovirasto, Manner-Suomi, FIN-35500, Suomi / Finland" highway path 0.175 Suomi / Finland TRUE
+croatia hr Europe Southern Europe FALSE 13 2021-02-03 257878830 relation Hrvatska boundary administrative 0.783685743027873 Hrvatska TRUE
+potsdam institute for climate impact research de Europe Western Europe TRUE 13 2021-02-03 NA NA NA NA NA NA NA TRUE
+technical university of munich de Europe Western Europe FALSE 13 2021-02-03 161377183 way "Technische Universität München, Am Coulombwall, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity university 0.544238542262786 Deutschland TRUE
+university of tübingen de Europe Western Europe FALSE 13 2021-02-03 155721520 way "Klimagarten der Universität Tübingen, Sand, Lustnau, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland" leisure park 0.25 Deutschland TRUE
+cuba cu Americas Caribbean FALSE 13 2021-02-03 258428385 relation Cuba boundary administrative 0.844839051690795 Cuba TRUE
+dalhousie university ca Americas Northern America FALSE 13 2021-02-03 52245694 node "Faculty of Computer Science, Dalhousie University, 6050, University Avenue, Marlborough Woods, Halifax, Halifax Regional Municipality, Halifax County, Nova Scotia, B3H 4R2, Canada" amenity university 0.411644870826829 Canada TRUE
+university of waterloo ca Americas Northern America FALSE 13 2021-02-03 259427430 relation "University of Waterloo, Wilmot, Region of Waterloo, Southwestern Ontario, Ontario, Canada" amenity university 0.804103708523755 Canada TRUE
+university of adelaide au Oceania Australia and New Zealand FALSE 13 2021-02-03 113745459 way "University of Adelaide, North Terrace, Adelaide, Adelaide City Council, South Australia, 5005, Australia" amenity university 0.79940049921715 Australia TRUE
+university of tasmania au Oceania Australia and New Zealand FALSE 13 2021-02-03 95796124 way "University of Tasmania, Alexander Street, Sandy Bay, Hobart, City of Hobart, Tasmania, 7005, Australia" amenity university 0.758734778928549 Australia TRUE
+advanced laser interferometer gravitational-wave observatory us Americas Northern America TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+apple us Americas Northern America FALSE 12 2021-02-03 22363154 node "Apple Store, 815, Boylston Street, Block F, Back Bay, Boston, Suffolk County, Massachusetts, 02116, United States" shop electronics 0.760382661059545 United States TRUE
+argonne national laboratory us Americas Northern America FALSE 12 2021-02-03 84941288 way "Argonne National Laboratory, DuPage County, Illinois, United States" landuse industrial 0.756680175360968 United States TRUE
+carnegie institution for science us Americas Northern America TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+cold spring harbor laboratory us Americas Northern America FALSE 12 2021-02-03 217475644 way "Cold Spring Harbor Laboratory, Moores Hill Road, Laurel Hollow, Oyster Bay, Nassau County, New York, 11724, United States" amenity university 0.401 United States TRUE
+colorado state university us Americas Northern America FALSE 12 2021-02-03 259127396 relation "Colorado State University, Spring Park Drive, Fort Collins, Larimer County, Colorado, 80525-1424, United States" amenity university 0.794853132594755 United States TRUE
+illumina us Americas Northern America FALSE 12 2021-02-03 105132630 way "Illumina, San Diego, San Diego County, California, United States" landuse commercial 0.3 United States TRUE
+j. craig venter institute us Americas Northern America FALSE 12 2021-02-03 183799690 way "J. Craig Venter Institute, Capricorn Lane, San Diego, San Diego County, California, 92093, United States" building university 0.401 United States TRUE
+johns hopkins us Americas Northern America FALSE 12 2021-02-03 70591573 node "John's Hopkins, 2112, Dundalk Avenue, Norwood Park, Dundalk, Baltimore County, Maryland, 21222:21224, United States" amenity doctors 0.101 United States TRUE
+nebraska us Americas Northern America FALSE 12 2021-02-03 257963338 relation "Nebraska, United States" boundary administrative 0.799657112825905 United States TRUE
+oregon health and science university us Americas Northern America FALSE 12 2021-02-03 258885522 relation "Oregon Health & Science University, Robert Hugh Baldock Freeway, South Portland, Portland, Metro, Oregon, 97258, United States" amenity university 0.876527586886318 United States TRUE
+smithsonian center for astrophysics us Americas Northern America TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+southern methodist university us Americas Northern America FALSE 12 2021-02-03 97835046 way "Southern Methodist University, 6425, Dyer Street, University Park, Dallas County, Texas, 75205, United States" amenity university 0.818001590349159 United States TRUE
+university of south florida us Americas Northern America FALSE 12 2021-02-03 98932241 way "University of South Florida, USF Pine Drive, Tampa, Hillsborough County, Florida, 33612, United States" amenity university 0.401 United States TRUE
+university of texas southwestern medical center us Americas Northern America FALSE 12 2021-02-03 207040692 way "University of Texas Southwestern Medical Center, 5323, Harry Hines Boulevard, Dallas, TX, Dallas, Dallas County, Texas, 75390, United States" amenity university 0.942002873412564 United States TRUE
+us air force us Americas Northern America FALSE 12 2021-02-03 226151743 way "US Air Force, East Steamboat Avenue, Aurora, Arapahoe County, Colorado, 80017, United States" tourism camp_site 0.301 United States TRUE
+woods hole oceanographic institution us Americas Northern America FALSE 12 2021-02-03 189684904 way "Woods Hole Oceanographic Institution, Water Street, Woods Hole, Falmouth, Barnstable County, Massachusetts, 02543, United States" amenity university 0.401 United States TRUE
+chad td Africa Middle Africa FALSE 12 2021-02-03 258517069 relation Tchad تشاد boundary administrative 0.762462283081021 Tchad تشاد TRUE
+papua new guinea pg Oceania Melanesia FALSE 12 2021-02-03 258241053 relation Papua Niugini boundary administrative 0.788329503761047 Papua Niugini TRUE
+department of science and technology NONE NA NA TRUE 12 2021-02-03 99532466 way "Department of Science and Technology, Taguig, Fourth District, Metro Manila, Luzon" landuse commercial 0.862603275084388 Luzon TRUE
+harvard t. h. chan school of public health NONE NA NA FALSE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+higher education funding council NONE NA NA FALSE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+mrc NONE NA NA TRUE 12 2021-02-03 258982901 relation "Kiamika, Antoine-Labelle, Laurentides, Québec, Canada" boundary administrative 0.429332784738109 Canada TRUE
+university of oslo no Europe Northern Europe FALSE 12 2021-02-03 259041314 relation "Universitetet i Oslo, Behrens’ gate, Briskeby, Frogner, Oslo, 0257, Norge" amenity university 0.687044419782976 Norge TRUE
+radboud university nl Europe Western Europe FALSE 12 2021-02-03 85314411 way "Radboud Universiteit, Erasmuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525 EX, Nederland" amenity university 0.552553099500867 Nederland TRUE
+european food safety authority MULTI Europe MULTI TRUE 12 2021-02-03 258983516 relation "EFSA, 1A, Via Carlo Magno, Cornocchio, Pablo, Parma, Emilia-Romagna, 43126, Italia" office government 0.45558864174307 Italia TRUE
+european university association MULTI Europe MULTI TRUE 12 2021-02-03 113874154 way "European University Association, 24, Avenue de l'Yser - Ijzerlaan, Etterbeek, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1040, België / Belgique / Belgien" building yes 0.301 België / Belgique / Belgien TRUE
+united nations environment programme MULTI MULTI MULTI TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+luxembourg lu Europe Western Europe FALSE 12 2021-02-03 258680582 relation Lëtzebuerg boundary administrative 0.72827867579404 Lëtzebuerg TRUE
+riken jp Asia Eastern Asia TRUE 12 2021-02-03 5691099 node "Riken, Murgenthal, Bezirk Zofingen, Aargau, 4853, Schweiz/Suisse/Svizzera/Svizra" place village 0.375 Schweiz/Suisse/Svizzera/Svizra TRUE
+hebrew university of jerusalem il Asia Western Asia FALSE 12 2021-02-03 6058012 node "×”×<90>×•× ×™×‘×¨×¡×™×˜×” העברית בירושלי×<9d>, Reagan Plaza, הר הצופי×<9d>, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" amenity university 0.001 ישר×<90>ל TRUE
+eli lilly gb Europe Northern Europe FALSE 12 2021-02-03 225577556 way "Eli Lilly, Windlesham, Surrey Heath, Surrey, South East, England, GU20 6PH, United Kingdom" landuse commercial 0.4 United Kingdom TRUE
+house of lords gb Europe Northern Europe FALSE 12 2021-02-03 6178647 node "House of Lords, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 0AA, United Kingdom" tourism attraction 0.915610657194478 United Kingdom TRUE
+met office gb Europe Northern Europe FALSE 12 2021-02-03 259459361 relation "The Met Office, Fitzroy Road, Met Office, Monkerton, Exeter, Devon, South West England, England, EX1 3PB, United Kingdom" office weather 0.660932371570306 United Kingdom TRUE
+uk research and innovation gb Europe Northern Europe TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of bath gb Europe Northern Europe FALSE 12 2021-02-03 173079366 way "University of Bath, All Saints Place, Claverton Down, Bath, Bath and North East Somerset, South West England, England, BA2 6DU, United Kingdom" amenity university 0.782140725159681 United Kingdom TRUE
+university of portsmouth gb Europe Northern Europe FALSE 12 2021-02-03 4318922 node "University, Cambridge Road, Old Portsmouth, Portsmouth, South East, England, PO1 2HB, United Kingdom" highway bus_stop 0.201 United Kingdom TRUE
+university of reading gb Europe Northern Europe FALSE 12 2021-02-03 54678990 node "The Ure Museum of Greek Archaeology, Queen's Drive, Lower Earley, Earley, Reading, Wokingham, South East, England, RG6 6DN, United Kingdom" tourism museum 0.43859140675544 United Kingdom TRUE
+university of montpellier fr Europe Western Europe FALSE 12 2021-02-03 17861839 node "Institut Musicothérapie, 11, Rue Saint-Louis, Les Arceaux, Centre, Montpellier, Hérault, Occitanie, France métropolitaine, 34967, France" amenity university 0.101 France TRUE
+max planck institute for solar system research de Europe Western Europe FALSE 12 2021-02-03 153463565 way "Max-Planck-Institut für Sonnensystemforschung, 3, Justus-von-Liebig-Weg, Weende, Weende / Deppoldshausen, Göttingen, Landkreis Göttingen, Niedersachsen, 37077, Deutschland" amenity university 0.401 Deutschland TRUE
+university of heidelberg de Europe Western Europe FALSE 12 2021-02-03 6159717 node "SRH Hochschule, 6, Ludwig-Guttmann-Straße, Wieblingen, Heidelberg, Baden-Württemberg, 69123, Deutschland" amenity university 0.414317004425986 Deutschland TRUE
+american astronomical society's division for planetary sciences us Americas Northern America TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+american society for biochemistry and molecular biology us Americas Northern America TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+arecibo observatory us Americas Northern America FALSE 11 2021-02-03 184420154 way "Arecibo Observatory, Carretera al Observatorio de Arecibo, Cienaga, Esperanza, Arecibo, Puerto Rico, United States" building yes 0.201 United States TRUE
+cornell us Americas Northern America FALSE 11 2021-02-03 257370146 relation "Cornell, Livingston County, Illinois, United States" boundary administrative 0.526110221552319 United States TRUE
+lunar and planetary institute us Americas Northern America FALSE 11 2021-02-03 2467172 node "Lunar and Planetary Institute Rice University, West Oaks Drive, Pasadena, Harris County, Texas, 77058, United States" amenity school 0.401 United States TRUE
+national academies us Americas Northern America FALSE 11 2021-02-03 158007717 way "Bergen County Academies, NJ 4, Hackensack, Bergen County, New Jersey, 07646:07666, United States" amenity school 0.451332014915526 United States TRUE
+oregon health & science university us Americas Northern America FALSE 11 2021-02-03 258885522 relation "Oregon Health & Science University, Robert Hugh Baldock Freeway, South Portland, Portland, Metro, Oregon, 97258, United States" amenity university 0.776527586886318 United States TRUE
+sangamo biosciences us Americas Northern America TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+smithsonian institution us Americas Northern America FALSE 11 2021-02-03 107528703 way "National Museum of Natural History, Smithsonian Pollinator Garden Path, Penn Quarter, Washington, District of Columbia, 20560, United States" tourism museum 0.592769930727231 United States TRUE
+tufts university us Americas Northern America FALSE 11 2021-02-03 258528054 relation "Tufts University, Whitman Street, West Somerville, Somerville, Middlesex County, Massachusetts, 02144, United States" amenity university 0.726756832210693 United States TRUE
+u.s. us Americas Northern America FALSE 11 2021-02-03 158313324 way "U.S., State Highway 55, Sunny Waters, Town of Wolf River, Langlade County, Wisconsin, 54462, United States" amenity fuel 0.201 United States TRUE
+ucla us Americas Northern America FALSE 11 2021-02-03 179950382 way "UCLA, Marina del Rey, Los Angeles County, California, United States" highway pedestrian 0.2 United States TRUE
+ucsf us Americas Northern America FALSE 11 2021-02-03 99733448 way "University of California, San Francisco, Irving Street, Inner Sunset, San Francisco, San Francisco City and County, California, 94122, United States" amenity university 0.479827038246968 United States TRUE
+university of new hampshire us Americas Northern America FALSE 11 2021-02-03 97073744 way "University of New Hampshire, Main Street, Durham, Strafford County, New Hampshire, 03824, United States" amenity university 0.874977044922586 United States TRUE
+university of oklahoma us Americas Northern America FALSE 11 2021-02-03 181607166 way "University of Oklahoma, 660, Parrington Oval, Norman, Cleveland County, Oklahoma, 73019, United States" amenity university 0.906565448656976 United States TRUE
+university of oregon us Americas Northern America FALSE 11 2021-02-03 258754869 relation "University of Oregon, Emerald Express, Eugene, Lane County, Oregon, 97403-5274, United States" amenity university 0.858937574127135 United States TRUE
+university of texas medical branch us Americas Northern America TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+us fish and wildlife service us Americas Northern America FALSE 11 2021-02-03 166257913 way "US Fish and Wildlife Service, Linn County, Oregon, United States" landuse commercial 0.7 United States TRUE
+west virginia university us Americas Northern America FALSE 11 2021-02-03 203052022 way "George Washington University - Virginia Science and Technology Campus, Broad Run Drive, Broad Run Farms, Loudoun County, Virginia, 20165, United States" amenity university 0.521409003314806 United States TRUE
+uae ua Europe Eastern Europe FALSE 11 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна TRUE
+royal swedish academy of sciences se Europe Northern Europe TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+russian academy of sciences ru Europe Eastern Europe FALSE 11 2021-02-03 96980816 way "ЗоологичеÑ<81>кий музей ЗоологичеÑ<81>кого инÑ<81>титута Ð Ð<90>Ð<9d>, 1-3, УниверÑ<81>итетÑ<81>каÑ<8f> набережнаÑ<8f>, округ â„– 7, Санкт-Петербург, Северо-Западный федеральный округ, 199034, РоÑ<81>Ñ<81>иÑ<8f>" tourism museum 0.343425222676179 РоÑ<81>Ñ<81>иÑ<8f> TRUE
+university of otago nz Oceania Australia and New Zealand FALSE 11 2021-02-03 258279984 relation "University of Otago, Ward Street Overbridge, North Dunedin, Dunedin, Dunedin City, Otago, 9016, New Zealand / Aotearoa" amenity university 0.784012568793374 New Zealand / Aotearoa TRUE
+aps NONE NA NA TRUE 11 2021-02-03 258139810 relation "Alba-la-Romaine, Privas, Ardèche, Auvergne-Rhône-Alpes, France métropolitaine, 07400, France" boundary administrative 0.504276300065756 France TRUE
+cmb NONE NA NA TRUE 11 2021-02-03 259551000 relation "Lomé, Togo" boundary administrative 0.540313125234513 Togo TRUE
+department of justice NONE NA NA TRUE 11 2021-02-03 258462661 relation "Department of Justice, Padre Faura Street, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" office government 0.672714057293031 Luzon TRUE
+geophysical research letters NONE NA NA FALSE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+human genome project NONE NA NA FALSE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+open university NONE NA NA TRUE 11 2021-02-03 107644861 way "×”×<90>×•× ×™×‘×¨×¡×™×˜×” הפתוחה, החורש, Kiryat Golomb, Kiryat Etgarim, ×¨×¢× × ×”, × ×¤×ª פתח תקווה, מחוז המרכז, no, ישר×<90>ל" amenity university 0.467686595449203 ישר×<90>ל TRUE
+orion NONE NA NA TRUE 11 2021-02-03 258678145 relation "Orion, Oloron-Sainte-Marie, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64390, France" boundary administrative 0.652704511977299 France TRUE
+public library of science NONE NA NA TRUE 11 2021-02-03 117746945 way "Science, Victoria Road, London Borough of Hillingdon, London, Greater London, England, HA4 0JE, United Kingdom" building yes 0.201 United Kingdom TRUE
+university NONE NA NA TRUE 11 2021-02-03 115937498 way "University College, Logic Lane, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4EX, United Kingdom" amenity university 0.583844730994415 United Kingdom TRUE
+international astronomical union MULTI MULTI MULTI TRUE 11 2021-02-03 80025084 node "International Astronomical Union, 98 bis, Boulevard Arago, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" office company 0.928915221808463 France TRUE
+syngenta MULTI MULTI MULTI TRUE 11 2021-02-03 101933385 way "Syngenta, Aigues-Vives, Nîmes, Gard, Occitanie, France métropolitaine, 30670, France" landuse industrial 0.3 France TRUE
+mongolia mn Asia Eastern Asia FALSE 11 2021-02-03 258374991 relation Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° boundary administrative 0.712716402748512 Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° TRUE
+mali ml Africa Western Africa FALSE 11 2021-02-03 258390630 relation Mali boundary administrative 0.790781088929414 Mali TRUE
+university of padua it Europe Southern Europe FALSE 11 2021-02-03 5420036 node "Aula studio ""Jappelli"", Via Giuseppe Jappelli, Forcellini, Padova, Veneto, 35121, Italia" amenity university 0.001 Italia TRUE
+indian institute of science in Asia Southern Asia FALSE 11 2021-02-03 259230417 relation "Indian Institute of Science, CV Raman Road, Malleswaram, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India" amenity university 0.860020321697533 India TRUE
+indian space research organisation in Asia Southern Asia FALSE 11 2021-02-03 102303066 way "Indian Space Research Organisation - ISRO Vijinapura Campus, 1st Main Road, Dollar Colony, Raj Mahal Vilas, East Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560094, India" office government 0.922406253415619 India TRUE
+isro in Asia Southern Asia FALSE 11 2021-02-03 236288936 way "ISRO, Thiruvananthapuram, Kerala, India" landuse industrial 0.3 India TRUE
+athena gr Europe Southern Europe FALSE 11 2021-02-03 298973026 node "Αθήνα, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 10667, Ελλάδα" place city 0.732722808213196 Ελλάδα TRUE
+university of london gb Europe Northern Europe FALSE 11 2021-02-03 59535451 node "University of London, Thornhaugh Street, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1H 0XG, United Kingdom" tourism information 0.301 United Kingdom TRUE
+university of st andrews gb Europe Northern Europe FALSE 11 2021-02-03 44520497 node "University of St Andrews, North Street, St Andrews, Fife, Scotland, KY16 9AJ, United Kingdom" amenity university 0.967907552390845 United Kingdom TRUE
+algeria dz Africa Northern Africa FALSE 11 2021-02-03 258028956 relation Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر boundary administrative 0.758319025069823 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر TRUE
+max planck institute for chemistry de Europe Western Europe FALSE 11 2021-02-03 258507046 relation "Max-Planck-Institut für Chemie, 1, Hahn-Meitner-Weg, Oberstadt, Mainz, Rheinland-Pfalz, 55128, Deutschland" building university 0.201 Deutschland TRUE
+guangdong cn Asia Eastern Asia FALSE 11 2021-02-03 257937455 relation "广东çœ<81>, ä¸å›½" boundary administrative 0.685068695817348 ä¸å›½ TRUE
+hubei cn Asia Eastern Asia FALSE 11 2021-02-03 257842089 relation "湖北çœ<81>, ä¸å›½" boundary administrative 0.677032187273797 ä¸å›½ TRUE
+sichuan cn Asia Eastern Asia FALSE 11 2021-02-03 257966453 relation "å››å·<9d>çœ<81>, ä¸å›½" boundary administrative 0.711286195807749 ä¸å›½ TRUE
+university of manitoba ca Americas Northern America FALSE 11 2021-02-03 259131209 relation "University of Manitoba, Sifton Road, Montcalm, Winnipeg, Winnipeg (city), Manitoba, R3T 2N2, Canada" amenity university 0.301 Canada TRUE
+university of victoria ca Americas Northern America FALSE 11 2021-02-03 78344431 node "University of Victoria, Alumni Chip Trail, Cadboro Bay Village, Saanich, Capital Regional District, British Columbia, V8P 5C0, Canada" amenity post_office 0.301 Canada TRUE
+australian research council au Oceania Australia and New Zealand FALSE 11 2021-02-03 198145984 way "Australian Cotton Research Institute, Kamilaroi Highway, Narrabri, Narrabri Shire Council, New South Wales, 2390, Australia" office research 0.301 Australia TRUE
+james cook university au Oceania Australia and New Zealand FALSE 11 2021-02-03 162709786 way "James Cook University, 1, James Cook Drive, Douglas, Townsville, Townsville City, Queensland, 4811, Australia" amenity university 0.72561814389347 Australia TRUE
+venezuela ve Americas South America FALSE 10 2021-02-03 258211725 relation Venezuela boundary administrative 0.857303027661612 Venezuela TRUE
+american society of human genetics us Americas Northern America TRUE 10 2021-02-03 NA NA NA NA NA NA NA TRUE
+campbell us Americas Northern America FALSE 10 2021-02-03 259236537 relation "Campbell, Santa Clara County, California, 95008, United States" boundary administrative 0.580261160940683 United States TRUE
+carnegie institution for science in stanford us Americas Northern America TRUE 10 2021-02-03 NA NA NA NA NA NA NA TRUE
+human rights watch us Americas Northern America FALSE 10 2021-02-03 58663937 node "Human Rights Watch, 350 5th Ave, West 34th Street, Midtown South, Manhattan Community Board 5, Manhattan, New York County, New York, 10118, United States" office ngo 0.301 United States TRUE
+intel us Americas Northern America FALSE 10 2021-02-03 177283013 way "Intel, Intel Hawthorn Farm Campus, Orenco Station, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, United States" landuse construction 0.3 United States TRUE
+johnson space center us Americas Northern America FALSE 10 2021-02-03 99133114 way "Lyndon B. Johnson Space Center, 2101, NASA Parkway, Houston, Harris County, Texas, 77058, United States" tourism attraction 0.818056742388072 United States TRUE
+national science board us Americas Northern America FALSE 10 2021-02-03 12578717 node "NYU School of Medicine, 562, 1st Avenue, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10017-6927, United States" amenity university 0.499286093607089 United States TRUE
+osaka university us Americas Northern America FALSE 10 2021-02-03 74378542 node "Osaka, University Mall, University Place, Orem, Utah County, Utah, 84604, United States" amenity restaurant 0.201 United States TRUE
+rogers us Americas Northern America FALSE 10 2021-02-03 258319337 relation "Rogers, Benton County, Arkansas, United States" boundary administrative 0.579492986484072 United States TRUE
+university of bergen us Americas Northern America FALSE 10 2021-02-03 158650789 way "Fairleigh Dickinson University, Northumberland Road, Teaneck Township, Bergen County, New Jersey, 07666, United States" amenity university 0.636721108965853 United States TRUE
+university of kansas us Americas Northern America FALSE 10 2021-02-03 226545942 way "University of Kansas, Louisiana Street, Malls Shopping Center, Lawrence, Douglas County, Kansas, 66046, United States" amenity university 0.862696980333312 United States TRUE
+university of kentucky us Americas Northern America FALSE 10 2021-02-03 258670100 relation "University of Kentucky, East Vine Street, Central Business District, Lexington, Fayette County, Kentucky, 40506, United States" amenity university 0.850375161540189 United States TRUE
+university of massachusetts amherst us Americas Northern America FALSE 10 2021-02-03 259199097 relation "University of Massachusetts Amherst, Kendrick Place, Amherst, Hampshire County, Massachusetts, 01004, United States" amenity university 0.91421857649354 United States TRUE
+us defense advanced research projects agency us Americas Northern America FALSE 10 2021-02-03 166563644 way "Defense Advanced Research Projects Agency, 675, North Randolph Street, Ballston, Arlington, Arlington County, Virginia, 22203, United States" office government 0.501 United States TRUE
+us national academies us Americas Northern America FALSE 10 2021-02-03 158007717 way "Bergen County Academies, NJ 4, Hackensack, Bergen County, New Jersey, 07646:07666, United States" amenity school 0.451332014915526 United States TRUE
+seti institute td Africa Middle Africa FALSE 10 2021-02-03 153816233 way "Institut Tchadien pour la Recherche Agronomique et le Développement, شارع مليز, Ù<81>ارشا Farcha, 1er Arrondissement / الدائرة الأولى, N'Djaména انجمينا, BP41, Tchad تشاد" office research 0.001 Tchad تشاد TRUE
+united nations educational ps Asia Western Asia FALSE 10 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 1.00816286930485 Palestinian Territory TRUE
+darpa pk Asia Southern Asia FALSE 10 2021-02-03 50587431 node "Darpa Khel, North WazÄ«ristÄ<81>n Agency, خیبر پښتونخوا, پاکستان" place village 0.375 پاکستان TRUE
+astrophysical journal NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA TRUE
+church NONE NA NA TRUE 10 2021-02-03 299392511 way "Church, Thruxton, Test Valley, Hampshire, South East, England, SP11 8PW, United Kingdom" highway raceway 0.539445078941215 United Kingdom TRUE
+clarivate analytics NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepmind NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecohealth alliance NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+european geosciences union NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard office for scholarly communication NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard t.h. chan school of public health NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for stem cell research NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+national human genome research institute NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+precision medicine initiative NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+vaccine alliance NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+delft university of technology nl Europe Western Europe FALSE 10 2021-02-03 138201041 way "Technische Universiteit Delft, Mijnbouwstraat, Wippolder, Delft, Zuid-Holland, Nederland, 2628, Nederland" amenity university 0.604534284533579 Nederland FALSE
+niger ne Africa Western Africa FALSE 10 2021-02-03 258196686 relation Niger boundary administrative 0.762187691693021 Niger FALSE
+hind NA Africa Southern Africa FALSE 10 2021-02-03 1244386 node Indian Ocean place ocean 0.676747312216863 NA FALSE
+unam mx Americas Central America FALSE 10 2021-02-03 96671012 way "Universidad Nacional Autónoma de México, Circuito Exterior, Ciudad Universitaria, Coyoacán, Ciudad de México, 04360, México" amenity university 0.562409087444079 México FALSE
+us navy it Europe Southern Europe FALSE 10 2021-02-03 16815715 node "Us Navy, SP69/II, San Giorgio-Librino-San Giuseppe la Rena-Zia Lisa-Villaggio Sant'Agata, Lentini, Siracusa, Sicilia, Italia" amenity fuel 0.201 Italia FALSE
+nci ie Europe Northern Europe FALSE 10 2021-02-03 258574096 relation "National College of Ireland, Mayor Square, International Financial Services Centre, North Dock, Dublin, County Dublin, Leinster, Éire / Ireland" amenity college 0.402778707896871 Éire / Ireland FALSE
+hungarian academy of sciences hu Europe Eastern Europe FALSE 10 2021-02-03 256816091 relation "Magyar Tudományos Akadémia, 9, Széchenyi István tér, Lipótváros, V. kerület, Budapest, Közép-Magyarország, 1051, Magyarország" tourism attraction 0.578948761652427 Magyarország FALSE
+alliance manchester business school gb Europe Northern Europe FALSE 10 2021-02-03 707500 node "Alliance Manchester Business School, Booth Street West, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M15 6PB, United Kingdom" amenity university 0.401 United Kingdom FALSE
+institute of cancer research gb Europe Northern Europe FALSE 10 2021-02-03 175592054 way "Institute of Cancer Research, 237, Fulham Road, The Boltons, Brompton, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW3 6HS, United Kingdom" building hospital 0.810743518323823 United Kingdom FALSE
+isis gb Europe Northern Europe FALSE 10 2021-02-03 136970771 way "ISIS, Road Eight, East Hendred, Vale of White Horse, Oxfordshire, South East, England, OX11 0RD, United Kingdom" building industrial 0.411628560800675 United Kingdom FALSE
+london school of economics gb Europe Northern Europe FALSE 10 2021-02-03 258598818 relation "London School of Economics and Political Science, Houghton Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AE, United Kingdom" amenity university 0.988176875647945 United Kingdom FALSE
+london school of hygiene & tropical medicine gb Europe Northern Europe FALSE 10 2021-02-03 185180502 way "London School of Hygiene and Tropical Medicine, Gower Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7HT, United Kingdom" amenity university 1.04105233650125 United Kingdom FALSE
+universities uk gb Europe Northern Europe FALSE 10 2021-02-03 55479876 node "Universities UK, 20, Tavistock Square, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 9HQ, United Kingdom" place house 0.201 United Kingdom FALSE
+university of aberdeen gb Europe Northern Europe FALSE 10 2021-02-03 259116297 relation "University of Aberdeen, College Bounds, Old Aberdeen, Aberdeen City, Scotland, AB24 3EB, United Kingdom" amenity university 0.823940959797236 United Kingdom FALSE
+university of dundee gb Europe Northern Europe FALSE 10 2021-02-03 102764772 way "University of Dundee, Ure Street, Blackness, Dundee, Dundee City, Scotland, DD1 5JA, United Kingdom" amenity university 0.774336051043759 United Kingdom FALSE
+zoological society of london gb Europe Northern Europe FALSE 10 2021-02-03 252630202 way "Zoological Society of London, Regent's Canal Towpath, Chalk Farm, City of Westminster, London, Greater London, England, NW1 4SX, United Kingdom" office ngo 0.401 United Kingdom FALSE
+labour fr Europe Western Europe FALSE 10 2021-02-03 50485271 node "Le Labour, La Chapelle-du-Lou, La Chapelle du Lou du Lac, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35360, France" place hamlet 0.35 France FALSE
+organisation for economic co-operation fr Europe Western Europe FALSE 10 2021-02-03 103637552 way "OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" office government 0.569924309656139 France FALSE
+sanofi fr Europe Western Europe FALSE 10 2021-02-03 135101682 way "Sanofi, Vitry Sud - Ardoines, Vitry-sur-Seine, Arrondissement de L'Haÿ-les-Roses, Val-de-Marne, Île-de-France, France métropolitaine, 94400, France" landuse industrial 0.3 France FALSE
+technical university of denmark dk Europe Northern Europe FALSE 10 2021-02-03 94920613 way "Danmarks Tekniske Universitet, Asmussens Allé, Lundtofte, Lyngby-Taarbæk Kommune, Region Hovedstaden, 2800, Danmark" amenity university 0.570433047832959 Danmark FALSE
+fws de Europe Western Europe FALSE 10 2021-02-03 14490517 node "FWS, 5, Stephanstraße, St. Johanner Markt, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66111, Deutschland" amenity language_school 0.101 Deutschland FALSE
+reuters de Europe Western Europe FALSE 10 2021-02-03 16075920 node "Reuters, Lauterbach, Vogelsbergkreis, Hessen, 36318, Deutschland" place village 0.305371759161912 Deutschland FALSE
+galileo co Americas South America FALSE 10 2021-02-03 228694972 way "Galileo, Localidad Usaquén, Bogotá, Bogotá Distrito Capital, Región Andina, 110131, Colombia" landuse residential 0.3 Colombia FALSE
+wikipedia co Americas South America FALSE 10 2021-02-03 258072903 relation "Amazonas, Amazonia, Colombia" boundary administrative 0.478217339016076 Colombia FALSE
+chinese university of hong kong cn Asia Eastern Asia FALSE 10 2021-02-03 259201755 relation "香港ä¸æ–‡å¤§å¸ The Chinese University of Hong Kong, å<90><90>露港公路 Tolo Highway, 馬料水 Ma Liu Shui, 馬éž<8d>å±± Ma On Shan, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" amenity university 1.01579693868845 ä¸å›½ FALSE
+green party cn Asia Eastern Asia FALSE 10 2021-02-03 296801653 node "The Green Party, é’Ÿå<8d>—è¡—, è<8f><81>å<8d>Žç¤¾åŒº, 东沙湖社工委, è‹<8f>州工业å›åŒºç›´å±žé•‡, è‹<8f>州工业å›åŒº, è‹<8f>州市, 江è‹<8f>çœ<81>, 215028, ä¸å›½" shop variety_store 0.201 ä¸å›½ FALSE
+canadian institutes of health research ca Americas Northern America TRUE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcmaster university ca Americas Northern America FALSE 10 2021-02-03 95450699 way "McMaster University, Main Street West, Westdale, Hamilton, Golden Horseshoe, Ontario, L8S 1B3, Canada" amenity university 0.704585752093458 Canada FALSE
+duke ba Europe Southern Europe FALSE 10 2021-02-03 24796492 node "Duke, Općina Kiseljak, Srednjobosanski kanton / Županija SrediÅ¡nja Bosna, Federacija Bosne i Hercegovine, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" place village 0.375 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+deakin university au Oceania Australia and New Zealand FALSE 10 2021-02-03 133189487 way "Deakin University, 221, Burwood Highway, Burwood, Melbourne, City of Whitehorse, Victoria, 3125, Australia" amenity university 0.36265143530573 Australia FALSE
+university of wollongong au Oceania Australia and New Zealand FALSE 10 2021-02-03 85003768 way "University of Wollongong, Dallas Street, Keiraville, Wollongong City Council, New South Wales, 2500, Australia" amenity university 0.751344582361174 Australia FALSE
+international energy agency at Europe Western Europe FALSE 10 2021-02-03 149447246 way "Internationale Atomenergie-Organisation IAEO, Bruno-Kreisky-Platz, Donau City, KG Kaisermühlen, Donaustadt, Wien, 1220, Österreich" building yes 0.101 Österreich FALSE
+albert einstein college of medicine us Americas Northern America FALSE 9 2021-02-03 203373692 way "Albert Einstein College of Medicine, Rhinelander Avenue, The Bronx, Bronx County, New York, 10461, United States" amenity college 0.91305789785603 United States FALSE
+beth israel deaconess medical center us Americas Northern America FALSE 9 2021-02-03 147022219 way "Beth Israel Deaconess Medical Center East Campus, 330, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States" amenity hospital 0.859613385609502 United States FALSE
+biogen us Americas Northern America FALSE 9 2021-02-03 191876081 way "Biogen, 225, Binney Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" building commercial 0.101 United States FALSE
+california state university us Americas Northern America FALSE 9 2021-02-03 140128410 way "California State University, Long Beach, East Bixby Hill Road, Long Beach, Los Angeles County, California, 90815, United States" amenity university 0.781345777911708 United States FALSE
+city college us Americas Northern America FALSE 9 2021-02-03 115546934 way "The City College of New York, 160, Convent Avenue, Sugar Hill, Manhattan Community Board 9, Manhattan, New York County, New York, 10031, United States" amenity university 0.71231196067725 United States FALSE
+defense advanced research projects agency us Americas Northern America FALSE 9 2021-02-03 166563644 way "Defense Advanced Research Projects Agency, 675, North Randolph Street, Ballston, Arlington, Arlington County, Virginia, 22203, United States" office government 0.501 United States FALSE
+federal bureau of investigation us Americas Northern America FALSE 9 2021-02-03 295889146 relation "Federal Bureau of Investigation, 935, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20535, United States" amenity police 0.742718151065986 United States FALSE
+florida state university us Americas Northern America FALSE 9 2021-02-03 121104541 way "Florida State University, 600, West College Avenue, Tallahassee, Leon County, Florida, 32306-1058, United States" amenity university 0.851225835831412 United States FALSE
+imperial us Americas Northern America FALSE 9 2021-02-03 258271306 relation "Imperial County, California, United States" boundary administrative 0.649875514128109 United States FALSE
+jupiter us Americas Northern America FALSE 9 2021-02-03 258426556 relation "Jupiter, Palm Beach County, Florida, United States" boundary administrative 0.570373326511065 United States FALSE
+kansas us Americas Northern America FALSE 9 2021-02-03 257791284 relation "Kansas, United States" boundary administrative 0.816541831442553 United States FALSE
+lamont-doherty earth observatory us Americas Northern America FALSE 9 2021-02-03 101655405 way "Lamont-Doherty Earth Observatory, Ludlow Lane, Palisades, Town of Orangetown, Rockland County, New York, 10964, United States" amenity university 0.401 United States FALSE
+mass us Americas Northern America FALSE 9 2021-02-03 258278823 relation "Massachusetts, United States" boundary administrative 0.836449761303479 United States FALSE
+nasa ames research center us Americas Northern America FALSE 9 2021-02-03 298990599 way "NASA Ames Conference Center (NACC) Building 3, South Akron Road, Ames Research Center, Santa Clara County, California, 94035-0016, United States" building yes 0.401 United States FALSE
+national research foundation us Americas Northern America FALSE 9 2021-02-03 123853626 way "Research Parkway, Presbyterian Health Foundation, Oklahoma City, Oklahoma County, Oklahoma, 73104, United States" highway unclassified 0.3 United States FALSE
+texas tech university us Americas Northern America FALSE 9 2021-02-03 193845831 way "Texas Tech University, 2500, Broadway Street, Lubbock, Lubbock County, Texas, 79409, United States" amenity university 0.809795372861755 United States FALSE
+tmt us Americas Northern America FALSE 9 2021-02-03 5539908 node "Thirty Meter Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.354348884656857 United States FALSE
+university of cincinnati us Americas Northern America FALSE 9 2021-02-03 258441379 relation "University of Cincinnati, Elland Avenue, Pill Hill, Corryville, Cincinnati, Hamilton County, Ohio, 45229-3026, United States" amenity university 0.81920367879753 United States FALSE
+university of massachusetts us Americas Northern America FALSE 9 2021-02-03 75830459 node "Cold Spring Orchard, 391, Sabin Street, Cold Spring, Belchertown, Hampshire County, Massachusetts, 01009, United States" shop farm 0.101 United States FALSE
+university of massachusetts medical school us Americas Northern America FALSE 9 2021-02-03 125863087 way "University of Massachusetts Medical School, First Road, Worcester, Worcester County, Massachusetts, 01653, United States" amenity college 0.501 United States FALSE
+university of montana us Americas Northern America FALSE 9 2021-02-03 207899223 way "University of Montana, East Beckwith Avenue, University District, Missoula, Missoula County, Montana, 59812, United States" amenity university 0.76176245010242 United States FALSE
+university of wyoming us Americas Northern America FALSE 9 2021-02-03 197878304 way "University of Wyoming, North 30th Street, Laramie, Albany County, Wyoming, 82071, United States" amenity university 0.790871452105903 United States FALSE
+us government accountability office us Americas Northern America FALSE 9 2021-02-03 103419777 way "Government Accountability Office, 441, G Street Northwest, Penn Quarter, Washington, District of Columbia, 20548, United States" building house 0.435420222661424 United States FALSE
+us national academy of medicine us Americas Northern America FALSE 9 2021-02-03 101801329 way "Academy of Medicine, 7th Street Northeast, Atlanta, Fulton County, Georgia, 30308, United States" amenity school 0.428160971568546 United States FALSE
+vesta us Americas Northern America FALSE 9 2021-02-03 257790764 relation "Vesta, Redwood County, Minnesota, United States" boundary administrative 0.52868986151298 United States FALSE
+youtube us Americas Northern America FALSE 9 2021-02-03 107269264 way "YouTube, 900, Cherry Avenue, YouTube, San Bruno, San Mateo County, California, 94066, United States" building commercial 0.815565438604185 United States FALSE
+nrc ua Europe Eastern Europe FALSE 9 2021-02-03 45182287 node "Ð<9d>орвезька рада у Ñ<81>правах біженців, 10 к2, Федоренка вулицÑ<8f>, Сєвєродонецьк, Сєвєродонецький район, ЛуганÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 93408, Україна" office ngo 0.30799018260571 Україна FALSE
+eua to Oceania Polynesia FALSE 9 2021-02-03 258839633 relation "'Eua, Mata'aho, Vahe 'Eua, ʻEua, Tonga" place island 0.425 Tonga FALSE
+slovakia sk Europe Eastern Europe FALSE 9 2021-02-03 257217802 relation Slovensko boundary administrative 0.777034782704995 Slovensko FALSE
+stockholm university se Europe Northern Europe FALSE 9 2021-02-03 104694332 way "Stockholms universitet, Stora Skuggans Väg, Lappkärrsberget, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 17, Sverige" amenity university 0.101 Sverige FALSE
+qatar qa Asia Western Asia FALSE 9 2021-02-03 258224271 relation قطر boundary administrative 0.703411605024364 قطر FALSE
+department of health ph Asia South-Eastern Asia FALSE 9 2021-02-03 674851 node "Department Of Health, Rizal Avenue, Barangay 335, Santa Cruz, Third District, Manila, First District, Metro Manila, 1003, Luzon" amenity public_building 0.301 Luzon FALSE
+national health service np Asia Southern Asia FALSE 9 2021-02-03 68009675 node "Health Service, Nayapul-Makha, Makha, Modi Rural Municipality Ward No.2, देउपà¥<81>र, मोदि गाउà¤<81>पालिका (Modi), परà¥<8d>वत, गणà¥<8d>डकी पà¥<8d>रदेश, नेपाल" amenity clinic 0.201 नेपाल FALSE
+association of american medical colleges NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian academy of sciences NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+convention on international trade in endangered species of wild fauna NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+editas medicine NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+intergovernmental science-policy platform on biodiversity and ecosystem services NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+league of european research universities NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine-earth science and technology NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of allergy NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+national natural science foundation of china NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel committee NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of science and technology policy NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk medical research council NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of groningen nl Europe Western Europe FALSE 9 2021-02-03 258652656 relation "Academiegebouw, Broerstraat, Binnenstad-noord, Centrum, Groningen, Nederland, 9712GJ, Nederland" building university 0.349182950422608 Nederland FALSE
+deepwater horizon NA Africa Southern Africa FALSE 9 2021-02-03 6855110 node Deepwater Horizon man_made pumping_rig 0.629506969685059 NA FALSE
+mozambique mz Africa Eastern Africa FALSE 9 2021-02-03 258405737 relation Moçambique boundary administrative 0.690869640042326 Moçambique FALSE
+ukri lv Europe Northern Europe FALSE 9 2021-02-03 259569629 relation "Ukri, Auces novads, Zemgale, Latvija" boundary administrative 0.4 Latvija FALSE
+ministry of health lk Asia Southern Asia FALSE 9 2021-02-03 152298643 way "Ministry of Health, 385, Deans Road, Suduwella, Maligawatte, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 800, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office government 0.594028740055238 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+sri lanka lk Asia Southern Asia FALSE 9 2021-02-03 258464964 relation à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை boundary administrative 0.730312094018578 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+institute for basic science kr Asia Eastern Asia FALSE 9 2021-02-03 195637674 way "Institute for Basic Science, 대ë<8d>•ëŒ€ë¡œ512번길, ì‹ ì„±ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 34125, 대한민êµ" amenity research_institute 0.401 ëŒ€í•œë¯¼êµ FALSE
+universities space research association in Asia Southern Asia FALSE 9 2021-02-03 156452951 way "Bharati Vidyapeetha, Admiral Somnath Path, Sneh Paradise, Erandwana, Pune City, Pune District, Maharashtra, 411038, India" amenity university 0.001 India FALSE
+university college dublin ie Europe Northern Europe FALSE 9 2021-02-03 94729783 way "James Joyce Library, Route1, Roebuck, Dundrum ED, Dundrum, Dún Laoghaire-Rathdown, County Dublin, Leinster, D04 XT65, Éire / Ireland" amenity library 0.101 Éire / Ireland FALSE
+bangor university gb Europe Northern Europe FALSE 9 2021-02-03 116565795 way "Bangor University, College Road Site, Garth Road, Garth, Bangor, Gwynedd, Cymru / Wales, LL57 2RP, United Kingdom" amenity university 0.201 United Kingdom FALSE
+climatic research unit gb Europe Northern Europe FALSE 9 2021-02-03 99663934 way "Climatic Research Unit (CRU), Chancellors Drive, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" building yes 0.627161274702289 United Kingdom FALSE
+commission gb Europe Northern Europe FALSE 9 2021-02-03 174443117 way "The Commission, Stratford Road, London Borough of Hillingdon, London, Greater London, England, TW6 3FB, United Kingdom" amenity restaurant 0.101 United Kingdom FALSE
+conservative gb Europe Northern Europe FALSE 9 2021-02-03 128024014 way "Conservative Club, Whitecross Street, Overmonnow, Monmouth, Monmouthshire, Cymru / Wales, NP25 3BY, United Kingdom" club yes 0.383827688081076 United Kingdom FALSE
+elsevier gb Europe Northern Europe FALSE 9 2021-02-03 258202489 relation "Elsevier, The Boulevard, Oxford Spires Business Park, Kidlington, Thrupp, Cherwell, Oxfordshire, South East, England, OX5 1NZ, United Kingdom" building yes 0.101 United Kingdom FALSE
+russell group gb Europe Northern Europe FALSE 9 2021-02-03 23799035 node "Russell Group Limited, 2a, Commerce Square, Lace Market, St Ann's, City of Nottingham, East Midlands, England, NG1 1HS, United Kingdom" office company 0.201 United Kingdom FALSE
+aarhus university dk Europe Northern Europe FALSE 9 2021-02-03 258651824 relation "Aarhus Universitet, Paludan-Müllers Vej, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8200, Danmark" amenity university 0.616309477187943 Danmark FALSE
+ludwig maximilian university de Europe Western Europe FALSE 9 2021-02-03 108346027 way "Ludwig-Maximilians-Universität, 1, Geschwister-Scholl-Platz, Bezirksteil Universität, Maxvorstadt, München, Bayern, 80539, Deutschland" amenity university 0.812089678594562 Deutschland FALSE
+cyprus cy Asia Western Asia FALSE 9 2021-02-03 257947846 relation ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs boundary administrative 0.720547249770618 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+cas co Americas South America FALSE 9 2021-02-03 1280004 node "Casanare, Orinoquia, Colombia" place state 0.65 Colombia FALSE
+university of calgary ca Americas Northern America FALSE 9 2021-02-03 83952183 way "University of Calgary, Crowchild Trail NW, Banff Trail, Calgary, Alberta, T2M 4X6, Canada" amenity university 0.301 Canada FALSE
+university of guelph ca Americas Northern America FALSE 9 2021-02-03 126276159 way "University of Guelph, South Ring Road, Guelph, Southwestern Ontario, Ontario, N1G 3A2, Canada" amenity university 0.768891779789467 Canada FALSE
+university of western ontario ca Americas Northern America FALSE 9 2021-02-03 119657580 way "Huron University College, Western Road, London, Southwestern Ontario, Ontario, N6G 2V4, Canada" building university 0.657411994477751 Canada FALSE
+nas bs Americas Caribbean FALSE 9 2021-02-03 198204916 way "Lynden Pindling International Airport, John F. Kennedy Drive, New Providence, 00000, The Bahamas" aeroway aerodrome 0.392062334826953 The Bahamas FALSE
+anr be Europe Western Europe FALSE 9 2021-02-03 86964198 way "Internationale Luchthaven Antwerpen, Leon Stampelaan, Deurne, Antwerpen, Vlaanderen, 2100, België / Belgique / Belgien" aeroway aerodrome 0.389007360490923 België / Belgique / Belgien FALSE
+basf be Europe Western Europe FALSE 9 2021-02-03 102592327 way "BASF Antwerpen nv, 600, Scheldelaan, Zandvliet, Berendrecht-Zandvliet-Lillo, Antwerpen, Vlaanderen, 2040, België / Belgique / Belgien" man_made works 0.630708311748545 België / Belgique / Belgien FALSE
+brain research au Oceania Australia and New Zealand FALSE 9 2021-02-03 103375921 way "Queensland Brain Institute, Research Road, St Lucia, Brisbane City, Queensland, 4072, Australia" building university 0.201 Australia FALSE
+international atomic energy agency at Europe Western Europe FALSE 9 2021-02-03 149447246 way "Internationale Atomenergie-Organisation IAEO, Bruno-Kreisky-Platz, Donau City, KG Kaisermühlen, Donaustadt, Wien, 1220, Österreich" building yes 0.101 Österreich FALSE
+new horizons za Africa Southern Africa FALSE 8 2021-02-03 724484 node "New Horizons, Bitou Ward 4, Plettenberg Bay, Bitou Local Municipality, Garden Route District Municipality, Western Cape, 6600, South Africa" place suburb 0.475 South Africa FALSE
+international monetary fund us Americas Northern America FALSE 8 2021-02-03 258484235 relation "International Monetary Fund, 700, 19th Street Northwest, Golden Triangle, Washington, District of Columbia, 20052, United States" office ngo 0.913937873889599 United States FALSE
+lbnl us Americas Northern America FALSE 8 2021-02-03 201093023 way "Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States" amenity research_institute 0.001 United States FALSE
+md us Americas Northern America FALSE 8 2021-02-03 258170637 relation "Maryland, United States" boundary administrative 0.724620353023131 United States FALSE
+north dakota us Americas Northern America FALSE 8 2021-02-03 258332531 relation "North Dakota, United States" boundary administrative 0.889102339362075 United States FALSE
+salk institute us Americas Northern America FALSE 8 2021-02-03 3058237 node "Salk Institute Library, Salk Institute Road, La Jolla Farms, Torrey Pines, San Diego, San Diego County, California, 92093, United States" amenity library 0.201 United States FALSE
+scripps us Americas Northern America FALSE 8 2021-02-03 149620798 way "Scripps, Asilomar Avenue, Pacific Grove Acres, Pacific Grove, Monterey County, California, 93950-2424, United States" building yes 0.101 United States FALSE
+syracuse university us Americas Northern America FALSE 8 2021-02-03 258567940 relation "Syracuse University, East Adams Street, University Hill, Syracuse, Onondaga County, New York, 13210-1053, United States" amenity university 0.763992465055935 United States FALSE
+university of alaska fairbanks us Americas Northern America FALSE 8 2021-02-03 259286295 relation "University of Alaska Fairbanks, 1731, College, Fairbanks North Star, Alaska, 99775, United States" amenity university 0.827623120278844 United States FALSE
+university of delaware us Americas Northern America FALSE 8 2021-02-03 30187178 node "University of Delaware, South College Avenue, Newark, New Castle County, Delaware, 19713, United States" amenity university 0.801868684259545 United States FALSE
+university of houston us Americas Northern America FALSE 8 2021-02-03 154516059 way "University of Houston, 4800, Calhoun Road, Houston, Harris County, Texas, 77004, United States" amenity university 0.831411414196818 United States FALSE
+us forest service us Americas Northern America FALSE 8 2021-02-03 301108853 node "Cabin City, Twelvemile Creek Road #353, Cabin City, Mineral County, Montana, United States" tourism camp_site 0.001 United States FALSE
+us national park service us Americas Northern America FALSE 8 2021-02-03 229380168 way "Longleaf Campground, National Park Road, Richland County, South Carolina, United States" tourism camp_site 0.201 United States FALSE
+us patent and trademark office us Americas Northern America FALSE 8 2021-02-03 55565757 node "Silicon Valley United States Patent and Trademark Office, South 4th Street, Saint James Square Historic District, Japantown, San Jose, Santa Clara County, California, 95112-3580, United States" office government 0.401 United States FALSE
+uspto us Americas Northern America FALSE 8 2021-02-03 103148391 way "USPTO Remsen Building, 400, Dulany Street, Lyles-Crouch, Alexandria, Virginia, 22314, United States" building office 0.101 United States FALSE
+us institute of medicine ua Europe Eastern Europe FALSE 8 2021-02-03 5595802 node "МедуниверÑ<81>итет, бульвар Ленина, Железнодорожный район, Симферополь, СимферопольÑ<81>кий городÑ<81>кой Ñ<81>овет, 295006, Україна" highway bus_stop 0.001 Україна FALSE
+treasury se Europe Northern Europe FALSE 8 2021-02-03 20386522 node "Skattkammaren, Slottsbacken, Gamla stan, Södermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 111 31, Sverige" tourism museum 0.244698616841389 Sverige FALSE
+genbank ru Europe Eastern Europe FALSE 8 2021-02-03 37168464 node "Генбанк, МалаÑ<8f> Ð<90>ндроньевÑ<81>каÑ<8f> улица, ТаганÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 109544, РоÑ<81>Ñ<81>иÑ<8f>" amenity bank 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+paraguay py Americas South America FALSE 8 2021-02-03 258211585 relation Paraguay boundary administrative 0.814653400915517 Paraguay FALSE
+lancet pl Europe Eastern Europe FALSE 8 2021-02-03 45795901 node "Lancet, 1a, KoÅ›cielna, BaÅ‚uty-DoÅ‚y, Å<81>ódź-BaÅ‚uty, Å<81>ódź, województwo łódzkie, 91-444, Polska" amenity veterinary 0.101 Polska FALSE
+food and agriculture organization of the united nations pe Americas South America FALSE 8 2021-02-03 64529240 node "Food and Agriculture Organization of the United Nations, 328, Calle Manuel Almenara, Miraflores, Lima, 15048, Perú" office diplomatic 0.801 Perú FALSE
+advanced research projects agency NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+butantan institute NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+cary institute of ecosystem studies NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+chandra x-ray observatory NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecological society of america NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and resources institute NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+french academy of sciences NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+german institute for international and security affairs NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+hfea NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on science and technology NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+ice data center NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan science and technology agency NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+marshall space flight center NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa goddard institute for space studies NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for biomedical research NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for space research NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+ostp NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew research center NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+protein & cell NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+skolkovo institute of science and technology NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+solar dynamics observatory NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of würzburg NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+whitehead institute for biomedical research NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+european research area nl Europe Western Europe FALSE 8 2021-02-03 296384894 way "European Space Research and Technology Centre, Noordwijk, Zuid-Holland, Nederland, 2201AZ, Nederland" landuse commercial 0.615797566639606 Nederland FALSE
+malawi mw Africa Eastern Africa FALSE 8 2021-02-03 258015492 relation Malawi boundary administrative 0.760119250884759 Malawi FALSE
+european court of justice lu Europe Western Europe FALSE 8 2021-02-03 137569328 way "Ministère des affaires étrangères & européennes, 9, Rue du Palais de Justice, Ville-Haute, Luxembourg, Canton Luxembourg, 1841, Lëtzebuerg" office government 0.472275390676979 Lëtzebuerg FALSE
+lebanon lb Asia Western Asia FALSE 8 2021-02-03 258407440 relation لبنان boundary administrative 0.733805379704602 لبنان FALSE
+tohoku university jp Asia Eastern Asia FALSE 8 2021-02-03 49999020 node "Tohoku University, 1, é<8d>›å†¶å±‹å‰<8d>ä¸<81>, ä¸å¤®å››ä¸<81>ç›®, é<9d>’葉区, ä»™å<8f>°å¸‚, 宮城県, 980-8577, 日本" amenity school 0.201 日本 FALSE
+national centre for scientific research iq Asia Western Asia FALSE 8 2021-02-03 109500352 way "المركز الوطني للعلوم والابØاث, شارع الأميرات, Ù…Øلة 601, Mansour, المنصور, بغداد, قضاء الکرخ, Ù…ØاÙ<81>ظة بغداد, 10013, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" office research 0.195871082899258 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+gmo in Asia Southern Asia FALSE 8 2021-02-03 6772130 node "Netaji SC Bose Junction Gomoh, NH19, Topchanchi, Dhanbad, Jharkhand, 828402, India" railway station 0.339306791900516 India FALSE
+science media centre in Asia Southern Asia FALSE 8 2021-02-03 48932681 node "Science Media Center, CV Raman Road, Sadhashivanagar, Aramane Nagara Ward, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India" office research 0.201 India FALSE
+bbc gb Europe Northern Europe FALSE 8 2021-02-03 101162178 way "BBC, 23, Whiteladies Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS8 2LR, United Kingdom" building commercial 0.484120725224289 United Kingdom FALSE
+bracewell gb Europe Northern Europe FALSE 8 2021-02-03 150485 node "Bracewell, Pendle, Lancashire, North West England, England, BD23 3JU, United Kingdom" place village 0.375 United Kingdom FALSE
+greenpeace gb Europe Northern Europe FALSE 8 2021-02-03 98060114 way "Greenpeace, Canonbury Villas, Highbury, London Borough of Islington, London, Greater London, England, N1 2PN, United Kingdom" building office 0.101 United Kingdom FALSE
+royal society b gb Europe Northern Europe FALSE 8 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.847225834784319 United Kingdom FALSE
+royal society of chemistry gb Europe Northern Europe FALSE 8 2021-02-03 2359906 node "Royal Society of Chemistry, Albany Court Yard, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1J 0HE, United Kingdom" amenity learned_society;library 0.902029768014478 United Kingdom FALSE
+tyndall centre for climate change research gb Europe Northern Europe FALSE 8 2021-02-03 99663934 way "Climatic Research Unit (CRU), Chancellors Drive, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" building yes 0.427161274702289 United Kingdom FALSE
+acs fr Europe Western Europe FALSE 8 2021-02-03 258273931 relation "Ax-les-Thermes, Foix, Ariège, Occitanie, France métropolitaine, 09110, France" boundary administrative 0.523865752467132 France FALSE
+cnes fr Europe Western Europe FALSE 8 2021-02-03 3710223 node "CNES, Avenue de l'Europe, Rangueil, Sauzelong, Pech David, Pouvourville, Toulouse Sud-Est, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31400, France" tourism information 0.101 France FALSE
+trademark office dk Europe Northern Europe FALSE 8 2021-02-03 40802206 node "Trædemark, Vesthimmerlands Kommune, Region Nordjylland, Danmark" place hamlet 0.25 Danmark FALSE
+european molecular biology laboratory de Europe Western Europe FALSE 8 2021-02-03 97458858 way "Europäisches Laboratorium für Molekularbiologie, 1, Meyerhofstraße, Rohrbach, Heidelberg, Baden-Württemberg, 69117, Deutschland" amenity research_institute 0.353558714867367 Deutschland FALSE
+dama cn Asia Eastern Asia FALSE 8 2021-02-03 55283412 node "大马镇, 鄢陵县, 许昌市, æ²³å<8d>—çœ<81>, ä¸å›½" place town 0.3 ä¸å›½ FALSE
+guizhou cn Asia Eastern Asia FALSE 8 2021-02-03 258210629 relation "贵州çœ<81>, ä¸å›½" boundary administrative 0.653351269063716 ä¸å›½ FALSE
+open science cn Asia Eastern Asia FALSE 8 2021-02-03 24025212 node "Open Oyster, 科å¸é¤¨å»£å ´ Science Museum Square, 尖沙咀æ<9d>± East Tsim Sha Tsui, 尖沙咀 Tsim Sha Tsui, 油尖旺å<8d>€ Yau Tsim Mong District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" amenity restaurant 0.201 ä¸å›½ FALSE
+xinjiang cn Asia Eastern Asia FALSE 8 2021-02-03 257472610 relation "新疆维å<90>¾å°”自治区, ä¸å›½" boundary administrative 0.674183703517689 ä¸å›½ FALSE
+msf ch Europe Western Europe FALSE 8 2021-02-03 145205796 way "Médecins Sans Frontières, 78, Rue de Lausanne, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" office ngo 0.549022542887286 Schweiz/Suisse/Svizzera/Svizra FALSE
+global fund cf Africa Middle Africa FALSE 8 2021-02-03 42017839 node "IFRC Global Fund office, RN 2, Bangî - Bangui, Ködörösêse tî Bêafrîka - République Centrafricaine" office ngo 0.201 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+zaire cd Africa Middle Africa FALSE 8 2021-02-03 258410829 relation République démocratique du Congo boundary administrative 0.722405117667525 République démocratique du Congo FALSE
+botswana bw Africa Southern Africa FALSE 8 2021-02-03 258296134 relation Botswana boundary administrative 0.769811324959997 Botswana FALSE
+burkina faso bf Africa Western Africa FALSE 8 2021-02-03 258453504 relation Burkina Faso boundary administrative 0.880491224481489 Burkina Faso FALSE
+curtin university au Oceania Australia and New Zealand FALSE 8 2021-02-03 259557731 relation "Curtin University, Rivervale, City of Belmont, Western Australia, 6103, Australia" amenity university 0.635785692031318 Australia FALSE
+universities australia au Oceania Australia and New Zealand FALSE 8 2021-02-03 138620341 way "Australian Universities Centre, Geils Court, Deakin, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" building yes 0.201 Australia FALSE
+university of western australia au Oceania Australia and New Zealand FALSE 8 2021-02-03 259557956 relation "University of Western Australia, 35, Stirling Highway, Claremont, Town of Claremont, Western Australia, 6009, Australia" amenity university 0.889177431740209 Australia FALSE
+central european university at Europe Western Europe FALSE 8 2021-02-03 299890380 way "Central European University, 51, Quellenstraße, KG Favoriten, Favoriten, Wien, 1100, Österreich" amenity university 0.749444237200763 Österreich FALSE
+university of innsbruck at Europe Western Europe FALSE 8 2021-02-03 95953179 way "Universität Innsbruck Campus Innrain, Innerkoflerstraße, Innenstadt, Innsbruck, Tirol, 6020, Österreich" amenity university 0.728386601652889 Österreich FALSE
+angola ao Africa Middle Africa FALSE 8 2021-02-03 258358160 relation Angola boundary administrative 0.821117617604629 Angola FALSE
+george church za Africa Southern Africa FALSE 7 2021-02-03 122429 node "George, George Local Municipality, Garden Route District Municipality, Western Cape, 6529, South Africa" place town 0.541004242546897 South Africa FALSE
+university of science and technology ye Asia Western Asia FALSE 7 2021-02-03 104295063 way "جامعة العلوم والتكنولوجيا, شارع القاهرة, الجامعة, مديرية معين, مدينة صنعاء, أمانة العاصمة, 0022, اليمن" amenity university 0.001 اليمن FALSE
+uruguay uy Americas South America FALSE 7 2021-02-03 257746160 relation Uruguay boundary administrative 0.835509004923576 Uruguay FALSE
+advancement of science us Americas Northern America FALSE 7 2021-02-03 8123167 node "AAAS / Science, 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" tourism attraction 0.201 United States FALSE
+american civil liberties union us Americas Northern America FALSE 7 2021-02-03 61017923 node "American Civil Liberties Union, 125, Broad Street, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10004, United States" office association 0.401 United States FALSE
+arkansas us Americas Northern America FALSE 7 2021-02-03 257460053 relation "Arkansas, United States" boundary administrative 0.804692261310712 United States FALSE
+center for biological diversity us Americas Northern America FALSE 7 2021-02-03 223764606 way "Center For Biological Diversity, 378, North Main Avenue, El Presidio, Tucson, Pima County, Arizona, 85701, United States" building yes 0.401 United States FALSE
+clay mathematics institute us Americas Northern America FALSE 7 2021-02-03 186024492 way "Institute for Pure and Applied Mathematics, 460, Portola Plaza, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" building yes 0.43181178765026 United States FALSE
+collins us Americas Northern America FALSE 7 2021-02-03 258356239 relation "Collins, Story County, Iowa, United States" boundary administrative 0.534140648717751 United States FALSE
+colorado state university in fort collins us Americas Northern America FALSE 7 2021-02-03 259127396 relation "Colorado State University, Spring Park Drive, Fort Collins, Larimer County, Colorado, 80525-1424, United States" amenity university 1.09485313259475 United States FALSE
+district of columbia us Americas Northern America FALSE 7 2021-02-03 258375899 relation "District of Columbia, United States" boundary administrative 0.712065652038613 United States FALSE
+dupont us Americas Northern America FALSE 7 2021-02-03 257884857 relation "DuPont, Pierce County, Washington, 98327, United States" boundary administrative 0.487992348356751 United States FALSE
+engineering and medicine us Americas Northern America FALSE 7 2021-02-03 101669661 way "Fitzpatrick Center for Interdisciplinary Engineering, Medicine and Applied Sciences (FCIEMAS), 101, Science Drive, Durham, Durham County, North Carolina, 27705, United States" building yes 0.301 United States FALSE
+government accountability office us Americas Northern America FALSE 7 2021-02-03 103419777 way "Government Accountability Office, 441, G Street Northwest, Penn Quarter, Washington, District of Columbia, 20548, United States" building house 0.435420222661424 United States FALSE
+iowa state university us Americas Northern America FALSE 7 2021-02-03 258786807 relation "Iowa State University, US 30, Ames, Story County, Iowa, 50011, United States" amenity university 0.829769585619443 United States FALSE
+keystone us Americas Northern America FALSE 7 2021-02-03 257787992 relation "Keystone, Benton County, Iowa, 52249, United States" boundary administrative 0.534676120369013 United States FALSE
+lockheed martin us Americas Northern America FALSE 7 2021-02-03 69800309 node "Lockheed Martin, North Mathilda Avenue, Sunnyvale, Santa Clara County, California, 94089, United States" railway station 0.51689306175332 United States FALSE
+marine biological laboratory us Americas Northern America FALSE 7 2021-02-03 20613776 node "Marine Biological Laboratory, Marine Biological Lab Street, Woods Hole, Falmouth, Barnstable County, Massachusetts, 02543, United States" amenity school 0.301 United States FALSE
+michigan technological university us Americas Northern America FALSE 7 2021-02-03 214188897 way "Michigan Technological University, 1400, Townsend Drive, Houghton, Portage Township, Houghton County, Michigan, 49931, United States" amenity university 0.728748587005153 United States FALSE
+monterey bay aquarium research institute us Americas Northern America FALSE 7 2021-02-03 57262992 node "Monterey Bay Aquarium Research Institute, 7700, Sandholdt Road, Moss Landing, Monterey County, California, 95039, United States" office research 0.501 United States FALSE
+national marine fisheries service us Americas Northern America FALSE 7 2021-02-03 98716401 way "National Marine Fisheries Service, Santa Cruz, Santa Cruz County, California, United States" boundary administrative 0.525 United States FALSE
+national radio astronomy observatory us Americas Northern America FALSE 7 2021-02-03 103730706 way "National Radio Astronomy Observatory, East End Road, Saint Croix District, United States Virgin Islands, United States" building yes 0.401 United States FALSE
+national weather service us Americas Northern America FALSE 7 2021-02-03 226762473 way "National Weather Service, Valley, Douglas County, Nebraska, United States" landuse commercial 0.5 United States FALSE
+new york law school us Americas Northern America FALSE 7 2021-02-03 153073848 way "New York Law School, 185, Worth Street, Tribeca, Manhattan Community Board 1, Manhattan, New York County, New York, 10013, United States" building university 0.805751306412585 United States FALSE
+oak ridge national laboratory us Americas Northern America FALSE 7 2021-02-03 162828025 way "Oak Ridge National Laboratory, Oak Ridge, Roane County, Tennessee, United States" landuse industrial 0.6 United States FALSE
+office of science us Americas Northern America FALSE 7 2021-02-03 258762307 relation "Science, East Reserve Street, Officers Row, Vancouver, Clark County, Washington, 98661, United States" building yes 0.301 United States FALSE
+oppenheimer us Americas Northern America FALSE 7 2021-02-03 490611 node "Oppenheimer, Bedford Township, Bedford County, Pennsylvania, United States" place hamlet 0.35 United States FALSE
+sangamo us Americas Northern America FALSE 7 2021-02-03 87502152 way "Sangamo Drive, Belaire Estates, Greenville County, South Carolina, 29611, United States" highway residential 0.2 United States FALSE
+temple university us Americas Northern America FALSE 7 2021-02-03 202219991 way "Temple University, Dondill Place, Yorktown, Philadelphia, Philadelphia County, Pennsylvania, 19122, United States" amenity university 0.73236936447695 United States FALSE
+university of central florida us Americas Northern America FALSE 7 2021-02-03 258129364 relation "University of Central Florida, Mercury Circle, Alafaya, Orange County, Florida, 32816, United States" amenity university 0.896770959418636 United States FALSE
+university of connecticut us Americas Northern America FALSE 7 2021-02-03 150779544 way "University of Connecticut, Middle Turnpike, Mansfield Four Corners, Mansfield, Tolland County, Connecticut, 06269, United States" amenity university 0.845434458950227 United States FALSE
+university of wisconsin-madison us Americas Northern America FALSE 7 2021-02-03 259436351 relation "University of Wisconsin-Madison, Lake Mendota Drive, Madison, Dane County, Wisconsin, 53705, United States" amenity university 0.980768897517013 United States FALSE
+vermont us Americas Northern America FALSE 7 2021-02-03 257728022 relation "Vermont, United States" boundary administrative 0.790877987357213 United States FALSE
+virginia tech us Americas Northern America FALSE 7 2021-02-03 258252884 relation "Virginia Polytechnic Institute and State University, Drillfield Drive, Blacksburg, Montgomery County, Virginia, 24061, United States" amenity university 0.724377849520944 United States FALSE
+weill cornell medicine us Americas Northern America FALSE 7 2021-02-03 73119338 node "Weill Cornell Internal Medicine Associates at Wright, 1484, 1st Avenue, Upper East Side, Manhattan Community Board 8, Manhattan, New York County, New York, 10075, United States" amenity clinic 0.301 United States FALSE
+wildlife conservation society us Americas Northern America FALSE 7 2021-02-03 105840797 way "Prospect Park Zoo, 450, Flatbush Avenue, Prospect Heights, Brooklyn, Kings County, New York, 11225, United States" tourism zoo 0.360507920897054 United States FALSE
+institute of medicine ua Europe Eastern Europe FALSE 7 2021-02-03 5595802 node "МедуниверÑ<81>итет, бульвар Ленина, Железнодорожный район, Симферополь, СимферопольÑ<81>кий городÑ<81>кой Ñ<81>овет, 295006, Україна" highway bus_stop 0.001 Україна FALSE
+academia sinica tw Asia Eastern Asia FALSE 7 2021-02-03 125761439 way "ä¸å¤®ç ”究院, 128, ç ”ç©¶é™¢è·¯äºŒæ®µ, ä¸ç ”里, å<8d>—港å<8d>€, 三é‡<8d>埔, 臺北市, 11529, 臺ç<81>£" amenity research_institute 0.586985895897651 臺ç<81>£ FALSE
+national university of singapore sg Asia South-Eastern Asia FALSE 7 2021-02-03 105581168 way "National University of Singapore, Business Link, Queenstown, Southwest, 119613, Singapore" amenity university 0.924762239536787 Singapore FALSE
+chalmers university of technology se Europe Northern Europe FALSE 7 2021-02-03 98299775 way "Chalmers Tekniska Högskola, Guldhedsgatan, Johanneberg, Centrum, Göteborg, Göteborgs Stad, Västra Götalands län, 40530, Sverige" amenity university 0.101 Sverige FALSE
+umeå university se Europe Northern Europe FALSE 7 2021-02-03 70819385 node "Datorföreningen Academic Computer Club UmeÃ¥ Universitet, Petrus Laestadius väg, Lilljansberget, Universitets- och sjukhusomrÃ¥det, UmeÃ¥, UmeÃ¥ kommun, Västerbottens län, 907 13, Sverige" office association 0.101 Sverige FALSE
+university of gothenburg se Europe Northern Europe FALSE 7 2021-02-03 95030421 way "Göteborgs Universitet, 100, Universitetsplatsen, Vasastaden, Centrum, Göteborg, Göteborgs Stad, Västra Götalands län, 405 30, Sverige" amenity university 0.001 Sverige FALSE
+shell ru Europe Eastern Europe FALSE 7 2021-02-03 61004484 node "Shell, вл2Ð<90>, МКÐ<90>Д, 1-й километр, Южное Измайлово, район ИвановÑ<81>кое, МоÑ<81>ква, Центральный федеральный округ, 111531, РоÑ<81>Ñ<81>иÑ<8f>" amenity fuel 0.684546645920874 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+digital science ro Europe Eastern Europe FALSE 7 2021-02-03 74464037 node "Digital Science, Strada Melodiei, Iași, Podul Roș, Iași, Zona Metropolitană Iași, Iași, 700050, România" office yes 0.201 România FALSE
+national university ph Asia South-Eastern Asia FALSE 7 2021-02-03 127228015 way "National University, 551, Mansanas, Sampaloc, 4th District, Manila, First District, Metro Manila, 1008, Luzon" amenity university 0.60242374951 Luzon FALSE
+public citizen ph Asia South-Eastern Asia FALSE 7 2021-02-03 56406294 node "Public WI-FI (PISO WI-FI 011216), S.G. Calulo Street, Citizen Village, Polomolok, South Cotabato, Soccsksargen, 9504, Luzon" amenity cafe 0.201 Luzon FALSE
+allen institute for artificial intelligence NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+american public health association NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of clinical oncology NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology industry organization NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg new energy finance NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian society for the advancement of science NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+cansino biologics NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+cooperative institute for research in environmental sciences NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of energy's office of science NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+evidence for democracy NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of european neuroscience societies NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+global carbon project NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+gran sasso national laboratory NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard open access project NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+hhmi NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+national nuclear security administration NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands environmental assessment agency NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel assembly NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian academy of science and letters NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean observatories initiative NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+physical sciences research council NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+pnas NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+"royal holloway, university of london" NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of dresden NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+milky way nl Europe Western Europe FALSE 7 2021-02-03 155504451 way "Melkweg, Lijnbaansgracht, Centrum, Amsterdam, Noord-Holland, Nederland, 1017PH, Nederland" amenity theatre 0.413510524610342 Nederland FALSE
+radboud university nijmegen nl Europe Western Europe FALSE 7 2021-02-03 85314411 way "Radboud Universiteit, Erasmuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525 EX, Nederland" amenity university 0.652553099500867 Nederland FALSE
+tilburg university nl Europe Western Europe FALSE 7 2021-02-03 99323909 way "Tilburg University, Universiteitslaan, West, Tilburg, Noord-Brabant, Nederland, 5037AB, Nederland" amenity university 0.626171455933285 Nederland FALSE
+conservation international mg Africa Eastern Africa FALSE 7 2021-02-03 68745674 node "Conservation International, N 7, Mahamanina, Antsororokavo, Tanana Ambany, Fianarantsoa, District de Fianarantsoa, Matsiatra Ambony, Province de Fianarantsoa, 301, Madagasikara" office ngo 0.201 Madagasikara FALSE
+liberal party jp Asia Eastern Asia FALSE 7 2021-02-03 122578456 way "自由民主会館, 23, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8910, 日本" office political_party 0.001 日本 FALSE
+national graduate institute for policy studies jp Asia Eastern Asia FALSE 7 2021-02-03 114338072 way "政ç–ç ”ç©¶å¤§å¦é™¢å¤§å¦, å…本木トンãƒ<8d>ル, å…本木七ä¸<81>ç›®, å…本木, 麻布, 港区, æ<9d>±äº¬éƒ½, 106-0033, 日本" amenity university 0.400318800773851 日本 FALSE
+science council of japan jp Asia Eastern Asia FALSE 7 2021-02-03 125087351 way "日本å¦è¡“会è°, 319, å…本木七ä¸<81>ç›®, å…本木, 麻布, 港区, æ<9d>±äº¬éƒ½, 106-0033, 日本" building yes 0.44541340693117 日本 FALSE
+tokyo institute of technology jp Asia Eastern Asia FALSE 7 2021-02-03 258519927 relation "æ<9d>±äº¬å·¥æ¥å¤§å¦ 大岡山ã‚ャンパス, 轟橋, 目黒区, æ<9d>±äº¬éƒ½, 158, 日本" amenity university 0.508521601885091 日本 FALSE
+efsa it Europe Southern Europe FALSE 7 2021-02-03 258983516 relation "EFSA, 1A, Via Carlo Magno, Cornocchio, Pablo, Parma, Emilia-Romagna, 43126, Italia" office government 0.55558864174307 Italia FALSE
+fermi it Europe Southern Europe FALSE 7 2021-02-03 15584094 node "Fermi, Via Edmondo De Amicis, Borgata Paradiso, Collegno, Torino, Piemonte, 10093, Italia" railway station 0.394028740055238 Italia FALSE
+sapienza university of rome it Europe Southern Europe FALSE 7 2021-02-03 716518 node "Università La Sapienza sede distaccata Architettura, Piazza Borghese, Rione IV Campo Marzio, Municipio Roma I, Roma, Roma Capitale, Lazio, 00186, Italia" amenity university 0.101 Italia FALSE
+academy of medical sciences ir Asia Southern Asia FALSE 7 2021-02-03 249549450 way "Ù<81>رهنگستان علوم پزشکی, اراضی عباس آباد, منطقه Û³ شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1919816311, ایران" highway tertiary 0.1 ایران FALSE
+nimh ir Asia Southern Asia FALSE 7 2021-02-03 79156398 node "کوه Ù†Ù<90>مه, دهستان سولقان, بخش Ú©Ù†, شهرستان تهران, استان تهران, ایران" natural ridge 0.2 ایران FALSE
+communist party in Asia Southern Asia FALSE 7 2021-02-03 251592329 way "Communist Party, Vengode- Venjaramoodu Road, Thiruvananthapuram, Kerala, 695313, India" office political_party 0.201 India FALSE
+department of commerce in Asia Southern Asia FALSE 7 2021-02-03 247702407 way "Department of Commerce, Adoor - Vandiperiyar Highway, Makkamkunnu, Pathanamthitta, Kerala, 683647, India" building college 0.301 India FALSE
+inter-university centre for astronomy and astrophysics in Asia Southern Asia FALSE 7 2021-02-03 113630721 way "Inter University Center for Astronomy & Astrophysics, Breman Chowk - Khadki Bazar Road, Mandalay Lines, Khadki, Pune City, Pune District, Maharashtra, 411007, India" building yes 0.601 India FALSE
+trinity college dublin ie Europe Northern Europe FALSE 7 2021-02-03 165744701 way "Trinity College Dublin, College Green, Mansion House A ED, Dublin, Dublin 2, Leinster, D02 HR67, Éire / Ireland" amenity university 0.820634411605724 Éire / Ireland FALSE
+cancer research uk gb Europe Northern Europe FALSE 7 2021-02-03 25437189 node "Cancer Research UK, 22-24, High Street, Enmore Green, Shaftesbury, Dorset, South West England, England, SP7 8JG, United Kingdom" place houses 0.35 United Kingdom FALSE
+center for global development gb Europe Northern Europe FALSE 7 2021-02-03 191950659 way "Center for Global Development, Wilton Road, Victoria, City of Westminster, London, Greater London, England, SW1V 1HN, United Kingdom" office ngo 0.401 United Kingdom FALSE
+european bioinformatics institute gb Europe Northern Europe FALSE 7 2021-02-03 259174699 relation "European Bioinformatics Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SD, United Kingdom" amenity research_institute 0.754244998383175 United Kingdom FALSE
+financial times gb Europe Northern Europe FALSE 7 2021-02-03 103776457 way "Financial Times, 1, Friday Street, Blackfriars, City of London, Greater London, England, EC4M 9BT, United Kingdom" office newspaper 0.756792051580292 United Kingdom FALSE
+lancaster university gb Europe Northern Europe FALSE 7 2021-02-03 95263873 way "Lancaster University, Scotforth Road, Lower Burrow, Hala, Bailrigg, Lancaster, Lancashire, North West England, England, LA2 0PH, United Kingdom" amenity university 0.201 United Kingdom FALSE
+liverpool school of tropical medicine gb Europe Northern Europe FALSE 7 2021-02-03 296757298 way "Liverpool School of Tropical Medicine, Pembroke Place, Knowledge Quarter, Liverpool, North West England, England, L3 5QA, United Kingdom" amenity university 0.884723197268746 United Kingdom FALSE
+mrc laboratory of molecular biology gb Europe Northern Europe FALSE 7 2021-02-03 125035001 way "MRC Laboratory of Molecular Biology (LMB), Francis Crick Avenue, Cambridge, Cambridgeshire, East of England, England, CB2 0AA, United Kingdom" building university 0.501 United Kingdom FALSE
+national oceanography centre gb Europe Northern Europe FALSE 7 2021-02-03 257842880 relation "National Oceanography Centre, European Way, Port of Southampton, St Mary's, Southampton, South East, England, SO14 3ZH, United Kingdom" building yes 0.557277503353622 United Kingdom FALSE
+research councils uk gb Europe Northern Europe FALSE 7 2021-02-03 258509732 relation "UK Research Councils, North Star Avenue, Gorse Hill, Central Swindon North, Swindon, South West England, England, SN2 1ET, United Kingdom" building office 0.301 United Kingdom FALSE
+swansea university gb Europe Northern Europe FALSE 7 2021-02-03 4265317 node "Swansea University, Mumbles Road, Blackpill, Sketty, Swansea, Cymru / Wales, SA2 0AX, United Kingdom" highway bus_stop 0.201 United Kingdom FALSE
+philae fr Europe Western Europe FALSE 7 2021-02-03 242087546 way "Philae, Sainte-Radegonde, Tours, Indre-et-Loire, Centre-Val de Loire, France métropolitaine, France" landuse residential 0.3 France FALSE
+national research agency fi Europe Northern Europe FALSE 7 2021-02-03 54517775 node "The Finnish Brain Research and Rehabilitation Center Neuron, Kortesalmi, Kuopio, Kuopion seutukunta, Pohjois-Savo, Itä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" amenity hospital 0.101 Suomi / Finland FALSE
+csic es Europe Southern Europe FALSE 7 2021-02-03 258925679 relation "Museo Nacional de Ciencias Naturales, 2, Calle de José Gutiérrez Abascal, El Viso, ChamartÃn, Madrid, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28006, España" tourism museum 0.348159836291227 España FALSE
+state council eg Africa Northern Africa FALSE 7 2021-02-03 197019864 way "مجلس الدولة, شارع شارل ديجول, شارع الدقى, الجيزة, 11551, مصر" amenity courthouse 0.001 مصر FALSE
+max planck institute de Europe Western Europe FALSE 7 2021-02-03 95363379 way "Max-Planck-Institute, Büsnau, Vaihingen, Stuttgart, Baden-Württemberg, 70569, Deutschland" landuse commercial 0.5 Deutschland FALSE
+max planck institute for astrophysics de Europe Western Europe FALSE 7 2021-02-03 65732258 node "Max-Planck-Institut für Astrophysik, 1, Karl-Schwarzschild-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" office research 0.664296579375046 Deutschland FALSE
+ucs de Europe Western Europe FALSE 7 2021-02-03 225927055 way "UCS, Veddel, Hamburg-Mitte, Hamburg, 20539, Deutschland" landuse commercial 0.3 Deutschland FALSE
+proton cz Europe Eastern Europe FALSE 7 2021-02-03 44452898 node "Proton, HÅ™ensko, okres DÄ›Ä<8d>Ãn, Ústecký kraj, Severozápad, 407 14, ÄŒesko" natural peak 0.4 ÄŒesko FALSE
+shanghai jiao tong university cn Asia Eastern Asia FALSE 7 2021-02-03 124491612 way "上海交通大å¦ï¼ˆå¾<90>æ±‡æ ¡åŒºï¼‰, å<8d>Žå±±è·¯, å¾<90>汇区, 200030, ä¸å›½" amenity university 0.501020559978481 ä¸å›½ FALSE
+wuhan institute of virology cn Asia Eastern Asia FALSE 7 2021-02-03 240734527 way "ä¸å›½ç§‘å¦é™¢æ¦æ±‰ç—…æ¯’ç ”ç©¶æ‰€, 金龙大街, 纸å<9d>Šè¡—, 江å¤<8f>区, 湖北çœ<81>, ä¸å›½" amenity research_institute 0.001 ä¸å›½ FALSE
+air force cm Africa Middle Africa FALSE 7 2021-02-03 66242004 node "AIR FORCE, Baladji, Ngaoundéré, Communauté urbaine de Ngaoundéré, Vina, Adamaoua, BP 353/NGAOUNDÉRÉ, Cameroun" place PETIT MARCHE 0.4 Cameroun FALSE
+epfl ch Europe Western Europe FALSE 7 2021-02-03 95072766 way "École Polytechnique Fédérale de Lausanne, Route de la Sorge, Quartier Sorge, Ecublens, District de l'Ouest lausannois, Vaud, 1015, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.483095905643059 Schweiz/Suisse/Svizzera/Svizra FALSE
+tess ch Europe Western Europe FALSE 7 2021-02-03 258262464 relation "Diesse, Plateau de Diesse, Arrondissement administratif du Jura bernois, Région administrative du Jura bernois, Bern/Berne, 2517, Schweiz/Suisse/Svizzera/Svizra" boundary administrative 0.34859234613195 Schweiz/Suisse/Svizzera/Svizra FALSE
+wmo ch Europe Western Europe FALSE 7 2021-02-03 89750216 way "Organisation Météorologique Mondiale, 7 bis, Avenue de la Paix, Sécheron, Pâquis, Genève, 1211, Schweiz/Suisse/Svizzera/Svizra" office government 0.474195817992651 Schweiz/Suisse/Svizzera/Svizra FALSE
+york university ca Americas Northern America FALSE 7 2021-02-03 259467282 relation "York University, 120, Ian Macdonald Boulevard, Humber River—Black Creek, North York, Toronto, Golden Horseshoe, Ontario, M7A 2C5, Canada" railway station 0.558338814941197 Canada FALSE
+moderna br Americas South America FALSE 7 2021-02-03 52890773 node "Moderna, Sertânia, Região Geográfica Imediata de Arcoverde, Região Geográfica Intermediária de Caruaru, Pernambuco, Região Nordeste, Brasil" place village 0.375 Brasil FALSE
+benin bj Africa Western Africa FALSE 7 2021-02-03 258030246 relation Bénin boundary administrative 0.667613308618136 Bénin FALSE
+exxonmobil be Europe Western Europe FALSE 7 2021-02-03 92996065 way "ExxonMobil, Antwerpen, Vlaanderen, 2030, België / Belgique / Belgien" landuse industrial 0.3 België / Belgique / Belgien FALSE
+macquarie university au Oceania Australia and New Zealand FALSE 7 2021-02-03 139533038 way "Macquarie University, University Avenue, Macquarie Park, Sydney, Council of the City of Ryde, New South Wales, 2113, Australia" amenity university 0.669953649018245 Australia FALSE
+queensland university of technology au Oceania Australia and New Zealand FALSE 7 2021-02-03 94497763 way "Queensland University of Technology, Kelvin Grove Road, Kelvin Grove, Brisbane City, Queensland, 4059, Australia" amenity university 0.401 Australia FALSE
+university of buenos aires ar Americas South America FALSE 7 2021-02-03 59478624 node "universidad de Morón, 221, Lima, Monserrat, Buenos Aires, Comuna 1, Ciudad Autónoma de Buenos Aires, 1076, Argentina" amenity school 0.201 Argentina FALSE
+stellenbosch university za Africa Southern Africa FALSE 6 2021-02-03 208348417 way "Universiteit Stellenbosch, Smuts, Stellenbosch Ward 9, Dalsig, Stellenbosch Local Municipality, Cape Winelands District Municipality, Western Cape, 7599, South Africa" amenity university 0.554011689337226 South Africa FALSE
+falcon ve Americas South America FALSE 6 2021-02-03 1238826 node "Falcón, Región Centroccidental, Venezuela" place state 0.55 Venezuela FALSE
+alphabet us Americas Northern America FALSE 6 2021-02-03 225684906 way "Alphabet, Horace Mann, Japantown, San Jose, Santa Clara County, California, 95112-3580, United States" highway footway 0.175 United States FALSE
+american university us Americas Northern America FALSE 6 2021-02-03 99772807 way "American University, 4400, Massachusetts Avenue Northwest, Cathedral Heights, Washington, District of Columbia, 20016, United States" amenity university 0.717014338477232 United States FALSE
+arc us Americas Northern America FALSE 6 2021-02-03 101560700 way "Ames Research Center, Santa Clara County, California, 94035-0016, United States" landuse industrial 0.567592905439716 United States FALSE
+brandeis university us Americas Northern America FALSE 6 2021-02-03 128290139 way "Brandeis University, Boynton Street, Banks Square, Riverview, Waltham, Middlesex County, Massachusetts, 02453-2728, United States" amenity university 0.201 United States FALSE
+brookings institution us Americas Northern America FALSE 6 2021-02-03 42626050 node "The Brookings Institution, 1755, Massachusetts Avenue Northwest, Dupont Circle and surrunding block, Dupont Circle, Washington, District of Columbia, 20036, United States" place house 0.201 United States FALSE
+capitol hill us Americas Northern America FALSE 6 2021-02-03 2913454 node "Capitol Hill, Washington, District of Columbia, 20540, United States" place locality 0.633871158129342 United States FALSE
+children's hospital boston us Americas Northern America FALSE 6 2021-02-03 146447101 way "Boston Children's Hospital, 300, Blackfan Street, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.763455742331178 United States FALSE
+city university of new york us Americas Northern America FALSE 6 2021-02-03 179360561 way "Queens College, City University of New York, 152nd Street, Queens, Queens County, New York, 11367, United States" amenity university 0.9318394385017 United States FALSE
+cleveland clinic us Americas Northern America FALSE 6 2021-02-03 181161483 way "Cleveland Clinic, 9500, Euclid Avenue, Hough, University Circle, Cleveland, Cuyahoga County, Ohio, 44195, United States" amenity hospital 0.607266933591874 United States FALSE
+diamond us Americas Northern America FALSE 6 2021-02-03 257115549 relation "Diamond, Grundy County, Illinois, United States" boundary administrative 0.534194405720176 United States FALSE
+hughes us Americas Northern America FALSE 6 2021-02-03 258255449 relation "Hughes County, South Dakota, 57501, United States" boundary administrative 0.571820093574305 United States FALSE
+institute for advanced study in princeton us Americas Northern America FALSE 6 2021-02-03 96388432 way "Institute for Advanced Study, Goldman Lane, Princeton, Mercer County, New Jersey, 08540, United States" amenity university 1.1343793531708 United States FALSE
+institute of mathematical sciences us Americas Northern America FALSE 6 2021-02-03 55398385 node "Courant Institute of Mathematical Sciences, 251, Mercer Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States" amenity university 0.822385266730329 United States FALSE
+kent state university us Americas Northern America FALSE 6 2021-02-03 134730614 way "Kent State University, Health Center Drive, Kent, Portage County, Ohio, 44242-0001, United States" amenity university 0.781992451472996 United States FALSE
+labor party us Americas Northern America FALSE 6 2021-02-03 205366515 way "Socialist Labor Party Hall, 46, Barre, Barre City, Washington County, Vermont, 496, United States" boundary protected_area 0.405371759161912 United States FALSE
+laval university us Americas Northern America FALSE 6 2021-02-03 91625841 way "Laval Drive, Blackberry Estates, University City, Saint Louis County, Missouri, 63132, United States" highway residential 0.3 United States FALSE
+liberal us Americas Northern America FALSE 6 2021-02-03 258136520 relation "Liberal, Seward County, Kansas, United States" boundary administrative 0.57453184281069 United States FALSE
+manoa us Americas Northern America FALSE 6 2021-02-03 7215417 node "Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" place suburb 0.412408728172101 United States FALSE
+montana state university us Americas Northern America FALSE 6 2021-02-03 165822886 way "Montana State University, West College Street, Bozeman, Gallatin County, Montana, 59715, United States" amenity university 0.729796188420265 United States FALSE
+new democratic party us Americas Northern America FALSE 6 2021-02-03 229030677 way "Democratic Party, 46, South Main Street, Marshall, Madison County, North Carolina, 28753, United States" office political_party 0.201 United States FALSE
+nyu us Americas Northern America FALSE 6 2021-02-03 114164826 way "New York University, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States" amenity university 0.634621425344776 United States FALSE
+ok us Americas Northern America FALSE 6 2021-02-03 258391951 relation "Oklahoma, United States" boundary administrative 0.814016195392348 United States FALSE
+pentagon us Americas Northern America FALSE 6 2021-02-03 258346723 relation "Pentagon, Corridor 6, Arlington, Arlington County, Virginia, 20310, United States" military office 0.666673809290972 United States FALSE
+princeton plasma physics laboratory us Americas Northern America FALSE 6 2021-02-03 96034748 way "Princeton Plasma Physics Laboratory, 100, Stellarator Road, Plainsboro Township, Princeton, Middlesex County, New Jersey, 08540, United States" amenity research_institute 0.776937105996802 United States FALSE
+san francisco state university us Americas Northern America FALSE 6 2021-02-03 96725450 way "San Francisco State University, 19th Avenue, San Francisco, San Francisco City and County, California, 94132, United States" amenity university 0.902969926456814 United States FALSE
+smithsonian us Americas Northern America FALSE 6 2021-02-03 5566830 node "Smithsonian American Art Museum, 750, 9th Street Northwest, Penn Quarter, Washington, District of Columbia, 20001, United States" tourism museum 0.591127986916952 United States FALSE
+snyder us Americas Northern America FALSE 6 2021-02-03 259276147 relation "Snyder, Scurry County, Texas, United States" boundary administrative 0.571174722238935 United States FALSE
+tulane university us Americas Northern America FALSE 6 2021-02-03 97823120 way "Tulane University, South Claiborne Avenue, Broadmoor, Uptown, New Orleans, Orleans Parish, Louisiana, 70118, United States" amenity university 0.72920861071119 United States FALSE
+utc us Americas Northern America FALSE 6 2021-02-03 130801377 way "University Teaching Center, 105, East 21st Street, The Drag, Austin, Travis County, Texas, 78705, United States" building university 0.135420222661424 United States FALSE
+yale university in new haven us Americas Northern America FALSE 6 2021-02-03 258788418 relation "Yale University, West Haven, New Haven County, Connecticut, 06516, United States" amenity university 1.05963616015799 United States FALSE
+tunisia tn Africa Northern Africa FALSE 6 2021-02-03 258390327 relation تونس boundary administrative 0.734006780061664 تونس FALSE
+ska th Asia South-Eastern Asia FALSE 6 2021-02-03 301424908 relation "จังหวัดสงขลา, ประเทศไทย" boundary administrative 0.486153860067244 ประเทศไทย FALSE
+snp sk Europe Eastern Europe FALSE 6 2021-02-03 258637575 relation "SNP, Považská Bystrica, okres Považská Bystrica, TrenÄ<8d>iansky kraj, Západné Slovensko, Slovensko" boundary administrative 0.35 Slovensko FALSE
+slovenia si Europe Southern Europe FALSE 6 2021-02-03 258398896 relation Slovenija boundary administrative 0.768267137056828 Slovenija FALSE
+swedish museum of natural history se Europe Northern Europe FALSE 6 2021-02-03 217046 node "Naturhistoriska riksmuseet, Frescativägen, Ekhagen, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 18, Sverige" tourism museum 0.431447409196647 Sverige FALSE
+samsung ru Europe Eastern Europe FALSE 6 2021-02-03 298004709 relation "Samsung, ЛиговÑ<81>кий проÑ<81>пект, округ Лиговка-ЯмÑ<81>каÑ<8f>, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" craft electronics_repair 0.681482163173531 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+us securities and exchange commission pk Asia Southern Asia FALSE 6 2021-02-03 226472772 way "Securities and Exchange Commission, Leckil Road, Central Business District, Sultanabad, Lyari, کراچی, سنڌ, 72500, پاکستان" office government 0.501 پاکستان FALSE
+committee ph Asia South-Eastern Asia FALSE 6 2021-02-03 94937180 way "Committee, Batasan Hills, 2nd District, Quezon City, Metro Manila, 1126, Luzon" highway residential 0.2 Luzon FALSE
+department of agriculture ph Asia South-Eastern Asia FALSE 6 2021-02-03 106739978 way "Department of Agriculture, Vasra, 1st District, Quezon City, Metro Manila, 1128, Luzon" landuse commercial 0.5 Luzon FALSE
+american association of physical anthropologists NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for cell biology NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+aquabounty technologies NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of universities for research in astronomy NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrophysical journal letters NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+california institute for regenerative medicine NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of leuven NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's lamont-doherty earth observatory NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+culham centre for fusion energy NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+frankfurt institute for advanced studies NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+free university of amsterdam NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+free university of brussels NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+fundamental science review NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+german cancer research center NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+gfz german research centre for geosciences NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+global biological standards institute NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+high energy accelerator research organization NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for health metrics and evaluation NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+lux research NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centers for environmental information NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on drug abuse NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural environment research council NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature neuroscience NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew charitable trusts NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken center for developmental biology NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+simons foundation NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for american archaeology NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+spitzer space telescope NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford university school of medicine NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+stratospheric observatory for infrared astronomy NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss federal institute of technology zurich NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations convention on biological diversity NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of freiburg NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+world health assembly NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale university school of medicine NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+european patent office nl Europe Western Europe FALSE 6 2021-02-03 99793708 way "European Patent Office, Rijswijk, Zuid-Holland, Nederland" landuse commercial 0.5 Nederland FALSE
+european space research and technology centre nl Europe Western Europe FALSE 6 2021-02-03 296384894 way "European Space Research and Technology Centre, Noordwijk, Zuid-Holland, Nederland, 2201AZ, Nederland" landuse commercial 1.01579756663961 Nederland FALSE
+wageningen university nl Europe Western Europe FALSE 6 2021-02-03 235168671 way "Wageningen University & Research, Bornsesteeg, Wageningen, Gelderland, Nederland, 6708PE, Nederland" amenity university 0.285440647712364 Nederland FALSE
+nicaragua ni Americas Central America FALSE 6 2021-02-03 258223262 relation Nicaragua boundary administrative 0.795002067004934 Nicaragua FALSE
+peta ng Africa Western Africa FALSE 6 2021-02-03 258544920 relation "Peta, Kwaya Kusar, Borno, Nigeria" boundary administrative 0.45 Nigeria FALSE
+ross ice shelf NA Africa Southern Africa FALSE 6 2021-02-03 258745006 relation Ross Ice Shelf natural glacier 0.793636263858092 NA FALSE
+mrsa my Asia South-Eastern Asia FALSE 6 2021-02-03 247579802 way "Malaysia Remote Sensing Agency, Mentakab, Temerloh, Pahang, Malaysia" landuse industrial 0.2 Malaysia FALSE
+agu mx Americas Central America FALSE 6 2021-02-03 258383817 relation "Aguascalientes, México" boundary administrative 0.651698731260612 México FALSE
+university grants commission lk Asia Southern Asia FALSE 6 2021-02-03 48686537 node "University Grants Commission, Ward Place, TownHall, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 800, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office government 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+korea advanced institute of science and technology kr Asia Eastern Asia FALSE 6 2021-02-03 107053417 way "í•œêµê³¼í•™ê¸°ìˆ ì›<90>, 291, 대학로, 온천2ë<8f>™, 온천ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 34141, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+euratom it Europe Southern Europe FALSE 6 2021-02-03 233423450 way "Joint Research Centre, Barza, Ispra, Varese, Lombardia, Italia" landuse industrial 0.363793454953531 Italia FALSE
+allen institute in Asia Southern Asia FALSE 6 2021-02-03 300497581 node "Allen Career Institute Jalahalli East, MS Ramaiah Road, Doddabomasandra, Dodda Bommasandra, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560014, India" office educational_institution 0.201 India FALSE
+cbd in Asia Southern Asia FALSE 6 2021-02-03 3342193 node "Car Nicobar Air Force Station, Car Nicobar, Nicobar, Andaman and Nicobar Islands, India" military airfield 0.416945583987361 India FALSE
+department of biotechnology in Asia Southern Asia FALSE 6 2021-02-03 129892474 way "Department of Biotechnology, Calicut University Villooniyal Road, Villoonniyal, Thenhipalam, Tirurangadi, Malappuram, Kerala, 673635, India" building university 0.301 India FALSE
+tata institute of fundamental research in Asia Southern Asia FALSE 6 2021-02-03 259525635 relation "Tata Institute of Fundamental Research (TIFR), Survey No.36/P, Gopanpally - Wipro Road, Ward 105 Gachibowli, Hyderabad, Serilingampalle mandal, Rangareddy, Telangana, 500107, India" office research 0.722549534893346 India FALSE
+israel institute of technology il Asia Western Asia FALSE 6 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+id id Asia South-Eastern Asia FALSE 6 2021-02-03 257918359 relation Indonesia boundary administrative 0.815582040548682 Indonesia FALSE
+amnesty international gb Europe Northern Europe FALSE 6 2021-02-03 299249192 way "Amnesty International, Magdalen Road, Robin Hood, Oxford, Oxfordshire, South East, England, OX4 1RQ, United Kingdom" office association 0.201 United Kingdom FALSE
+bis gb Europe Northern Europe FALSE 6 2021-02-03 154731847 way "Business, Energy & Industrial Strategy, 1, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1H 0ET, United Kingdom" office government 0.414108902120048 United Kingdom FALSE
+department for international development gb Europe Northern Europe FALSE 6 2021-02-03 98247145 way "Department for International Development, 22-24, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2WH, United Kingdom" office government 0.401 United Kingdom FALSE
+energy and industrial strategy gb Europe Northern Europe FALSE 6 2021-02-03 154731847 way "Business, Energy & Industrial Strategy, 1, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1H 0ET, United Kingdom" office government 0.814108902120048 United Kingdom FALSE
+great britain gb Europe Northern Europe FALSE 6 2021-02-03 302503364 relation "Great Britain, United Kingdom" place island 0.896790110521564 United Kingdom FALSE
+interior department gb Europe Northern Europe FALSE 6 2021-02-03 88415175 way "The Department, Lawton Street, Ropewalks, Liverpool, North West England, England, L1 1FS, United Kingdom" building yes 0.101 United Kingdom FALSE
+international institute for environment and development gb Europe Northern Europe FALSE 6 2021-02-03 42420083 node "International Institute for Environment and Development, 4, Hanover Street, New Town, New Town/Broughton, City of Edinburgh, Scotland, EH2 2EN, United Kingdom" office yes 0.601 United Kingdom FALSE
+international whaling commission gb Europe Northern Europe FALSE 6 2021-02-03 130872832 way "International Whaling Commission, Station Road, Impington, South Cambridgeshire, Cambridgeshire, East of England, England, CB24 9LF, United Kingdom" building yes 0.301 United Kingdom FALSE
+microsoft research gb Europe Northern Europe FALSE 6 2021-02-03 139659987 way "Microsoft Research, 21, Station Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB1 2FB, United Kingdom" building commercial 0.201 United Kingdom FALSE
+royal astronomical society gb Europe Northern Europe FALSE 6 2021-02-03 2216371 node "Royal Astronomical Society, Burlington Arcade, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1J 0ET, United Kingdom" amenity learned_society;library 0.794024211333493 United Kingdom FALSE
+science and technology facilities council gb Europe Northern Europe FALSE 6 2021-02-03 103985987 way "Royal Observatory, Edinburgh, Observatory Road, Blackford Hill, Blackford, City of Edinburgh, Scotland, EH9 3HJ, United Kingdom" tourism attraction 0.460151663261328 United Kingdom FALSE
+unicef gb Europe Northern Europe FALSE 6 2021-02-03 112681341 way "UNICEF, 30a, Great Sutton Street, Farringdon, Clerkenwell, London Borough of Islington, London, Greater London, England, EC1V 0DU, United Kingdom" office ngo 0.694034602256172 United Kingdom FALSE
+university of kent gb Europe Northern Europe FALSE 6 2021-02-03 130686043 way "University of Kent, Giles Lane, Hales Place, Tyler Hill, Canterbury, Kent, South East, England, CT2 7NJ, United Kingdom" amenity university 0.789199447242987 United Kingdom FALSE
+aix-marseille university fr Europe Western Europe FALSE 6 2021-02-03 99572106 way "Aix-Marseille Université - Campus de Saint-Charles, Avenue Général Leclerc, Saint-Lazare, 3e Arrondissement, Marseille, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13003, France" amenity university 0.669227485691559 France FALSE
+iau fr Europe Western Europe FALSE 6 2021-02-03 80025084 node "International Astronomical Union, 98 bis, Boulevard Arago, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" office company 0.628915221808463 France FALSE
+university of paris-sud fr Europe Western Europe FALSE 6 2021-02-03 125512473 way "Université Paris 1 Panthéon-Sorbonne Centre Pierre Mendès-France, 90, Rue de Tolbiac, Cité Florale, Quartier de la Maison-Blanche, Paris 13e Arrondissement, Paris, Île-de-France, France métropolitaine, 75013, France" amenity university 0.320860870373788 France FALSE
+european chemicals agency fi Europe Northern Europe FALSE 6 2021-02-03 228733010 way "ECHA, 6, Telakkakatu, Viiskulma, Punavuori, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00150, Suomi / Finland" office government 0.58713884113187 Suomi / Finland FALSE
+university of barcelona es Europe Southern Europe FALSE 6 2021-02-03 87708249 way "Universitat de Barcelona, Gran Via de les Corts Catalanes, l'Antiga Esquerra de l'Eixample, Eixample, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España" amenity university 0.420054390558144 España FALSE
+ec ec Americas South America FALSE 6 2021-02-03 258316020 relation Ecuador boundary administrative 0.839288603689881 Ecuador FALSE
+democratic dz Africa Northern Africa FALSE 6 2021-02-03 258028956 relation Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر boundary administrative 0.758319025069823 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+european space operations centre de Europe Western Europe FALSE 6 2021-02-03 112384523 way "European Space Operations Centre, Waldkolonie, Darmstadt-Nord, Darmstadt, Hessen, 64293, Deutschland" landuse institutional 0.6 Deutschland FALSE
+goethe university de Europe Western Europe FALSE 6 2021-02-03 682490 node "Goethe-Denkmal, Edsger-W.-Dijkstra-Gedächtnisweg, Universitätsviertel, Martinsviertel-West, Darmstadt-Nord, Darmstadt, Hessen, 64289, Deutschland" historic memorial 0.219931111449547 Deutschland FALSE
+max planck institute for biological cybernetics de Europe Western Europe FALSE 6 2021-02-03 258094329 relation "Max-Planck-Institut für Biologische Kybernetik, 8, Max-Planck-Ring, Max-Planck-Institut, Schönblick / Winkelwiese, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland" building office 0.515802194348806 Deutschland FALSE
+max planck institute of molecular cell biology and genetics de Europe Western Europe FALSE 6 2021-02-03 95773291 way "Max-Planck-Institut für molekulare Zellbiologie und Genetik, 108, Pfotenhauerstraße, Johannstadt-Nord, Johannstadt, Altstadt, Dresden, Sachsen, 01307, Deutschland" office research 0.624670737896991 Deutschland FALSE
+mpa de Europe Western Europe FALSE 6 2021-02-03 100723451 way "MPA, Wiesenau, Brieskow-Finkenheerd, Oder-Spree, Brandenburg, 15295, Deutschland" landuse farmyard 0.3 Deutschland FALSE
+university of bonn de Europe Western Europe FALSE 6 2021-02-03 20122302 node "Rheinische Friedrich-Wilhelms-Universität Bonn, Arkadenhof, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.790223294922313 Deutschland FALSE
+university of münster de Europe Western Europe FALSE 6 2021-02-03 258955070 relation "Westfälische Wilhelms-Universität, 2, Schlossplatz, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland" amenity university 0.65844573834098 Deutschland FALSE
+venus express de Europe Western Europe FALSE 6 2021-02-03 16140825 node "Syrisches Pizza, 53, Bahnhofstraße, Breddeviertel, Witten-Mitte, Witten, Ennepe-Ruhr-Kreis, Nordrhein-Westfalen, 58452, Deutschland" amenity fast_food 0.001 Deutschland FALSE
+center for food safety cn Asia Eastern Asia FALSE 6 2021-02-03 302473941 way "食物安全ä¸å¿ƒ Centre for Food Safety, 磅巷 Pound Lane, 西å<8d>Šå±± Mid-Levels West, å<8d>Šå±±å<8d>€ Mid-Levels, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, N/A, ä¸å›½" building yes 0.301 ä¸å›½ FALSE
+china national space administration cn Asia Eastern Asia FALSE 6 2021-02-03 226170093 way "ä¸å›½ç©ºé—´æŠ€æœ¯ç ”究院, å”<90>家å²æ<9d>‘, 海淀区, 北京市, ä¸å›½" landuse commercial 0.370940340656356 ä¸å›½ FALSE
+china university of geosciences cn Asia Eastern Asia FALSE 6 2021-02-03 259360085 relation "ä¸å›½åœ°è´¨å¤§å¦ï¼ˆæ¦æ±‰ï¼‰, 388å<8f>·, é²<81>磨路, 关山街é<81>“, 洪山区, 湖北çœ<81>, 430074, ä¸å›½" amenity university 0.382526166251558 ä¸å›½ FALSE
+chinese academy of agricultural sciences cn Asia Eastern Asia FALSE 6 2021-02-03 299451471 way "ä¸å›½å†œä¸šç§‘å¦é™¢, 北三环, 万柳地区, 海淀区, 北京市, 100098, ä¸å›½" amenity research_institute 0.001 ä¸å›½ FALSE
+city university of hong kong cn Asia Eastern Asia FALSE 6 2021-02-03 258416888 relation "é¦™æ¸¯åŸŽå¸‚å¤§å¸ City University of Hong Kong, 煙墩山隧é<81>“ Beacon Hill Tunnel, 顯田 Hin Tin, 深水埗å<8d>€ Sham Shui Po District, ä¹<9d>é¾<8d> Kowloon, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, 000000, ä¸å›½" amenity university 0.995013581495974 ä¸å›½ FALSE
+hainan cn Asia Eastern Asia FALSE 6 2021-02-03 258588983 relation "æµ·å<8d>—çœ<81>, ä¸å›½" boundary administrative 0.61214060827491 ä¸å›½ FALSE
+instagram cn Asia Eastern Asia FALSE 6 2021-02-03 174127886 way "Instagram Pier, 石塘咀 Shek Tong Tsui, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" highway service 0.357277503353622 ä¸å›½ FALSE
+tsinghua cn Asia Eastern Asia FALSE 6 2021-02-03 259261903 relation "清å<8d>Žå¤§å¦, 30, å<8f>Œæ¸…è·¯, 五é<81>“å<8f>£, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100084, ä¸å›½" amenity university 0.540801021048672 ä¸å›½ FALSE
+university of science and technology of china cn Asia Eastern Asia FALSE 6 2021-02-03 155145876 way "ä¸å›½ç§‘å¦æŠ€æœ¯å¤§å¦ åŒ—æ ¡åŒº, 黄山路, 通和大厦, 三里庵街é<81>“, å<90>ˆè‚¥å¸‚区, å<90>ˆè‚¥å¸‚, 230022, ä¸å›½" amenity university 0.464121550533476 ä¸å›½ FALSE
+eth zurich ch Europe Western Europe FALSE 6 2021-02-03 45376322 node "ETH Merchandise Store, 3, Sonneggstrasse, Oberstrass, Kreis 6, Zürich, Bezirk Zürich, Zürich, 8092, Schweiz/Suisse/Svizzera/Svizra" shop clothes 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+world intellectual property organization ch Europe Western Europe FALSE 6 2021-02-03 75817483 node "World Intellectual Property Organization, Chemin des Colombettes, Moillebeau, Petit-Saconnex et Servette, Genève, 1209, Schweiz/Suisse/Svizzera/Svizra" office yes 0.401 Schweiz/Suisse/Svizzera/Svizra FALSE
+central african republic cf Africa Middle Africa FALSE 6 2021-02-03 257558721 relation Ködörösêse tî Bêafrîka - République Centrafricaine boundary administrative 0.669810150148004 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+woods hole research center cd Africa Middle Africa FALSE 6 2021-02-03 24158480 node "Woods Hole Research Center, Avenue Clinique, Ibanga, Mbandaka, Équateur, République démocratique du Congo" office ngo 0.401 République démocratique du Congo FALSE
+carleton university ca Americas Northern America FALSE 6 2021-02-03 88329470 way "Carleton University, 1125, Colonel By Drive, Capital, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1S 5B7, Canada" amenity university 0.698422783543645 Canada FALSE
+mcmaster university in hamilton ca Americas Northern America FALSE 6 2021-02-03 95450699 way "McMaster University, Main Street West, Westdale, Hamilton, Golden Horseshoe, Ontario, L8S 1B3, Canada" amenity university 0.904585752093457 Canada FALSE
+national health commission ca Americas Northern America FALSE 6 2021-02-03 128238070 way "Boundary Trails Health Centre, Boundary Commission Trail, Morden, Stanley, Manitoba, R6M 1P3, Canada" amenity hospital 0.201 Canada FALSE
+triton ca Americas Northern America FALSE 6 2021-02-03 16414366 node "Triton, unincorporated Newfoundland, Newfoundland, Newfoundland and Labrador, Canada" place town 0.4 Canada FALSE
+bulgaria bg Europe Eastern Europe FALSE 6 2021-02-03 257859201 relation БългaриÑ<8f> boundary administrative 0.785388247880598 БългaриÑ<8f> FALSE
+european council be Europe Western Europe FALSE 6 2021-02-03 76246823 node "EUCO, 175, Rue de la Loi - Wetstraat, Quartier européen - Europese Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1048, België / Belgique / Belgien" office government 0.001 België / Belgique / Belgien FALSE
+ghent university be Europe Western Europe FALSE 6 2021-02-03 114264163 way "Universiteit Gent Vakgroep Textielkunde, 70A, Technologiepark-Zwijnaarde, Wetenschapspark Ardoyen, Zwijnaarde, Gent, Oost-Vlaanderen, Vlaanderen, 9052, België / Belgique / Belgien" building yes 0.513953996266395 België / Belgique / Belgien FALSE
+national academies of sciences be Europe Western Europe FALSE 6 2021-02-03 16772906 node "Académie royale des Sciences, des Lettres et des Beaux-Arts de Belgique, Rue Ducale - Hertogstraat, Quartier Royal - Koninklijke Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1000, België / Belgique / Belgien" office yes 0.201 België / Belgique / Belgien FALSE
+university of liège be Europe Western Europe FALSE 6 2021-02-03 123758853 way "HEC Liège, Rue Reynier, Saint-Laurent, Glain, Liège, Wallonie, 4000, België / Belgique / Belgien" amenity university 0.101 België / Belgique / Belgien FALSE
+flinders university au Oceania Australia and New Zealand FALSE 6 2021-02-03 145152966 way "Flinders University, Shepherds Hill Road, Bellevue Heights, Adelaide, City of Mitcham, South Australia, 5050, Australia" amenity university 0.201 Australia FALSE
+science & technology australia au Oceania Australia and New Zealand FALSE 6 2021-02-03 99632951 way "Science 1 (N25), Technology Lane, Nathan, Brisbane City, Queensland, 4111, Australia" building university 0.301 Australia FALSE
+academy of science of south africa za Africa Southern Africa FALSE 5 2021-02-03 234711560 way "Cape Academy of Maths, Science and Technology, Cushat Close, Sweet Valley, Constantia, City of Cape Town, Western Cape, 7806, South Africa" amenity college 0.601 South Africa FALSE
+university of kwazulu-natal za Africa Southern Africa FALSE 5 2021-02-03 118132354 way "University of KwaZulu-Natal, Fairfield Avenue, Scottsville, Msunduzi Ward 33, Pietermaritzburg, Msunduzi Local Municipality, uMgungundlovu District Municipality, KwaZulu-Natal, 3200, South Africa" amenity university 0.401 South Africa FALSE
+university of witwatersrand za Africa Southern Africa FALSE 5 2021-02-03 95936135 way "University of the Witwatersrand, Empire Road, Parktown, Johannesburg Ward 87, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" amenity university 0.77569370880422 South Africa FALSE
+vanuatu vu Oceania Melanesia FALSE 5 2021-02-03 258495458 relation Vanuatu boundary administrative 0.741390776726574 Vanuatu FALSE
+marie curie university vn Asia South-Eastern Asia FALSE 5 2021-02-03 164542463 way "Marie Curie, Vietnam National University HCMC, PhÆ°á»<9d>ng Ä<90>ông Hòa, Thà nh phố DÄ© An, Tỉnh Bình DÆ°Æ¡ng, 7200000, Việt Nam" highway residential 0.4 Việt Nam FALSE
+virgin islands vg Americas Caribbean FALSE 5 2021-02-03 258226789 relation British Virgin Islands boundary administrative 0.809067636380411 British Virgin Islands FALSE
+american statistical association us Americas Northern America FALSE 5 2021-02-03 144357197 way "American Statistical Association, 732, North Washington Street, Jefferson Houston, Alexandria, Virginia, 22314, United States" office foundation 0.301 United States FALSE
+avac us Americas Northern America FALSE 5 2021-02-03 126885480 way "AVAC Equipment Control Building, 4930, Caribbean Way, Bay Lake, Reedy Creek Improvement District, Orange County, Florida, 32830, United States" craft hvac 0.101 United States FALSE
+bard college us Americas Northern America FALSE 5 2021-02-03 166142313 way "Bard College, 30, Campus Road, Annandale-on-Hudson, Town of Red Hook, Dutchess County, New York, 12504, United States" amenity college 0.665268080528699 United States FALSE
+baylor us Americas Northern America FALSE 5 2021-02-03 258348836 relation "Baylor County, Texas, 76380, United States" boundary administrative 0.656007857309354 United States FALSE
+boston children's hospital us Americas Northern America FALSE 5 2021-02-03 146447101 way "Boston Children's Hospital, 300, Blackfan Street, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.763455742331178 United States FALSE
+boston college us Americas Northern America FALSE 5 2021-02-03 168144245 way "Boston College, 140, Commonwealth Avenue, Newton Centre, Newton, Middlesex County, Massachusetts, 02467, United States" amenity university 0.743540689832249 United States FALSE
+boston university school of medicine us Americas Northern America FALSE 5 2021-02-03 14708091 node "Boston University School of Medicine, Harrison Avenue, South End, Boston, Suffolk County, Massachusetts, 02118, United States" amenity university 0.501 United States FALSE
+brigham young university us Americas Northern America FALSE 5 2021-02-03 97425595 way "Brigham Young University, Campus Drive, Provo, Utah County, Utah, 84604, United States" amenity university 0.852231384786617 United States FALSE
+caledonia us Americas Northern America FALSE 5 2021-02-03 258349656 relation "Caledonia, Boone County, Illinois, United States" boundary administrative 0.522709819346418 United States FALSE
+california academy of sciences us Americas Northern America FALSE 5 2021-02-03 97642823 way "California Academy of Sciences, 55, Music Concourse Drive, San Francisco, San Francisco City and County, California, 94118, United States" tourism museum 0.401 United States FALSE
+central intelligence agency us Americas Northern America FALSE 5 2021-02-03 134865123 way "Central Intelligence Agency, Clearview Manor, McLean, Fairfax County, Virginia, United States" landuse government 0.5 United States FALSE
+columbia university medical center us Americas Northern America FALSE 5 2021-02-03 235180475 way "Columbia University, Reunion Plaza, Morningside Heights, Manhattan Community Board 9, Manhattan, New York County, New York, United States" amenity university 0.872550278643288 United States FALSE
+dsm us Americas Northern America FALSE 5 2021-02-03 258271826 relation "Des Moines International Airport, IA 28, Des Moines, Polk County, Iowa, 50321, United States" aeroway aerodrome 0.393012981942171 United States FALSE
+etc group us Americas Northern America FALSE 5 2021-02-03 194468754 way "ETC Group, 1997, 1100 East, Sugar House, Salt Lake City, Salt Lake County, Utah, 84106, United States" office engineering 0.201 United States FALSE
+florida international university us Americas Northern America FALSE 5 2021-02-03 116704484 way "Florida International University, East Campus Circle, Miami-Dade County, Florida, 33199, United States" amenity university 0.842176759304101 United States FALSE
+gemini observatory us Americas Northern America FALSE 5 2021-02-03 163883937 way "Gemini Observatory, 670, North Aohoku Place, Hilo CDP, Hawaiʻi County, Hawaii, 96720, United States" building yes 0.201 United States FALSE
+gilead us Americas Northern America FALSE 5 2021-02-03 299882604 relation "Gilead, Oxford County, Maine, United States" boundary administrative 0.485438474922168 United States FALSE
+harvard school of public health us Americas Northern America FALSE 5 2021-02-03 146383535 way "Harvard School of Public Health, Huntington Avenue, Roxbury, Boston, Suffolk County, Massachusetts, 02120, United States" amenity university 0.885556884947779 United States FALSE
+institute us Americas Northern America FALSE 5 2021-02-03 451003 node "Institute, Jefferson, Kanawha County, West Virginia, 25064, United States" place hamlet 0.454934934074513 United States FALSE
+inter-american development bank us Americas Northern America FALSE 5 2021-02-03 102806036 way "Inter-American Development Bank, 1300, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" office government 0.883362660493124 United States FALSE
+james clerk maxwell telescope us Americas Northern America FALSE 5 2021-02-03 5561092 node "James Clerk Maxwell Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.761564502190835 United States FALSE
+kansas state university us Americas Northern America FALSE 5 2021-02-03 258613534 relation "Kansas State University, College Avenue, Manhattan, Riley County, Kansas, 66506â€<90>1600, United States" amenity university 0.807972174654867 United States FALSE
+kennedy space center us Americas Northern America FALSE 5 2021-02-03 99967594 way "Kennedy Space, Bus Drop-Off, Brevard County, Florida, United States" amenity parking 0.201 United States FALSE
+lowell observatory us Americas Northern America FALSE 5 2021-02-03 138722097 way "Lowell Observatory, 1400, West Mars Hill Road, Flagstaff Townsite, Flagstaff, Coconino County, Arizona, 86001, United States" tourism attraction 0.720435832121165 United States FALSE
+myriad genetics us Americas Northern America FALSE 5 2021-02-03 99496081 way "Myriad Genetics, Wakara Way, Research Park, Salt Lake City, Salt Lake County, Utah, 84113, United States" building yes 0.201 United States FALSE
+national academy of sciences usa us Americas Northern America FALSE 5 2021-02-03 106787905 way "National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States" office ngo 1.00593943258948 United States FALSE
+national ecological observatory network us Americas Northern America FALSE 5 2021-02-03 39615877 node "National Ecological Observatory Network, 1685, 38th Street, Boulder, Boulder County, Colorado, 80301, United States" office research 0.401 United States FALSE
+ncar us Americas Northern America FALSE 5 2021-02-03 100783959 way "National Center for Atmospheric Research Mesa Lab, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" building government 0.491849073716688 United States FALSE
+newport news us Americas Northern America FALSE 5 2021-02-03 488126 node "Newport News, Virginia, 23607, United States" place city 0.686660556787456 United States FALSE
+office of research and development us Americas Northern America FALSE 5 2021-02-03 174203885 way "Office of Research and Development, Basil Street, Mobile, Mobile County, Alabama, 36603, United States" building college 0.501 United States FALSE
+ohio university us Americas Northern America FALSE 5 2021-02-03 181314709 way "Ohio University, Edgehill Drive, Athens, Athens County, Ohio, 45701, United States" amenity university 0.701814895980315 United States FALSE
+oklahoma state university us Americas Northern America FALSE 5 2021-02-03 140754357 way "Oklahoma State University, North Jefferson Street, Downtown Stillwater, Stillwater, Payne County, Oklahoma, 74078, United States" amenity university 0.764352569168409 United States FALSE
+pacific biosciences us Americas Northern America FALSE 5 2021-02-03 95009258 way "Pacific Biosciences, 1305, O'Brien Drive, Menlo Park, San Mateo County, California, 94025, United States" office company 0.201 United States FALSE
+plato us Americas Northern America FALSE 5 2021-02-03 258393720 relation "Plato, McLeod County, Minnesota, United States" boundary administrative 0.52505981939652 United States FALSE
+princeton us Americas Northern America FALSE 5 2021-02-03 258098921 relation "Princeton, Mercer County, New Jersey, United States" boundary administrative 0.6656381585396 United States FALSE
+rhic us Americas Northern America FALSE 5 2021-02-03 100399334 way "Renaissance Circle, Brookhaven National Laboratory, Suffolk County, New York, United States" highway residential 0.392697726015046 United States FALSE
+rockefeller us Americas Northern America FALSE 5 2021-02-03 320163 node "Rockefeller, Ogden, Weber County, Utah, 84403, United States" place locality 0.225 United States FALSE
+sandia national laboratories us Americas Northern America FALSE 5 2021-02-03 100715239 way "Sandia National Laboratories, Oakville Lane, Livermore, Alameda County, California, 94550, United States" amenity science_park 0.744009006305759 United States FALSE
+slac us Americas Northern America FALSE 5 2021-02-03 299175282 way "Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States" amenity research_center 0.427082745074033 United States FALSE
+smithsonian national museum of natural history us Americas Northern America FALSE 5 2021-02-03 107528703 way "National Museum of Natural History, Smithsonian Pollinator Garden Path, Penn Quarter, Washington, District of Columbia, 20560, United States" tourism museum 1.09276993072723 United States FALSE
+st jude children's research hospital us Americas Northern America FALSE 5 2021-02-03 258425834 relation "St. Jude Children's Research Hospital, 262, Danny Thomas Place, Lauderdale Courts, Memphis, Shelby County, Tennessee, 38105, United States" amenity hospital 1.00269308307499 United States FALSE
+university at buffalo us Americas Northern America FALSE 5 2021-02-03 106901822 way "University at Buffalo, The State University of New York, South Campus, Parkridge Avenue, University Heights, Buffalo, Erie County, New York, 14215, United States" amenity university 0.301 United States FALSE
+university of alaska us Americas Northern America FALSE 5 2021-02-03 208243462 way "University of Alaska, 45, Baranov Road, Cold Bay, Aleutians East, Alaska, 99571, United States" amenity university 0.301 United States FALSE
+university of colorado denver us Americas Northern America FALSE 5 2021-02-03 104339205 way "University of Colorado Denver, Cherry Creek Trail, Lower Downtown, Denver, Denver County, Colorado, 80217, United States" amenity university 0.66358119422997 United States FALSE
+university of eastern piedmont us Americas Northern America FALSE 5 2021-02-03 54983360 node "Clark University Graduate School of Geography, 936, Main Street, Main South, South Worcester, Worcester, Worcester County, Massachusetts, 01610, United States" office educational_institution 0.201 United States FALSE
+university of nevada us Americas Northern America FALSE 5 2021-02-03 253996236 way "University of Nevada, Las Vegas, 4505, East Tropicana Avenue, Midtown UNLV, Las Vegas, Clark County, Nevada, 89154, United States" amenity university 0.783772660357429 United States FALSE
+university of rhode island us Americas Northern America FALSE 5 2021-02-03 147160757 way "University of Rhode Island, Old North Road, Kingston, South Kingstown, South County, Rhode Island, 02881, United States" amenity university 0.860862691066137 United States FALSE
+university of vermont us Americas Northern America FALSE 5 2021-02-03 258538939 relation "University of Vermont, South Prospect Street, Burlington, Chittenden County, Vermont, 05401, United States" amenity university 0.80032620600642 United States FALSE
+us coast guard us Americas Northern America FALSE 5 2021-02-03 164331997 way "US Coast Guard, Berlin, Worcester County, Maryland, United States" landuse military 0.5 United States FALSE
+us department of the interior us Americas Northern America FALSE 5 2021-02-03 148880750 way "Rincon Mountain Visitor Center, 3693, South Old Spanish Trail, Tucson, Pima County, Arizona, 85748, United States" tourism information 0.001 United States FALSE
+usaid us Americas Northern America FALSE 5 2021-02-03 19295624 node "US Agency for International Development, 14th Street Northwest, Washington, District of Columbia, 20230, United States" office government 0.498819499208192 United States FALSE
+vassar college us Americas Northern America FALSE 5 2021-02-03 2621574 node "Vassar College, 124, Raymond Avenue, Town of Poughkeepsie, Dutchess County, New York, 12604, United States" amenity college 0.707352256464993 United States FALSE
+wake forest university us Americas Northern America FALSE 5 2021-02-03 2618233 node "Wake Forest University, 1834, Wake Forest Road, Reynolda Village, Winston-Salem, Forsyth County, North Carolina, 27106, United States" amenity university 0.804120989443361 United States FALSE
+whoi us Americas Northern America FALSE 5 2021-02-03 190610226 way "WHOI - Rose Garden, Falmouth, Barnstable County, Massachusetts, United States" leisure park 0.25 United States FALSE
+united nations development programme ug Africa Eastern Africa FALSE 5 2021-02-03 44309116 node "United Nations Development Programme, Yusuf Lule Road, Kitante, Wandegeya, Kampala Capital City, Kampala, Central Region, 29880, Uganda" office quango 0.401 Uganda FALSE
+tuvalu tv Oceania Polynesia FALSE 5 2021-02-03 258343085 relation Tuvalu boundary administrative 0.717228207678876 Tuvalu FALSE
+hbp sk Europe Eastern Europe FALSE 5 2021-02-03 184618893 way "303/237, HBP a.s. - baňa Čáry, Čáry, okres Senica, Trnavský kraj, Západné Slovensko, 90843, Slovensko" landuse industrial 0.3 Slovensko FALSE
+karolinska university hospital se Europe Northern Europe FALSE 5 2021-02-03 119648320 way "Karolinska universitetssjukhuset, Ninni Kronbergs Gata, Hagastaden, Vasastaden, Norrmalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 113 65, Sverige" amenity hospital 0.44859234613195 Sverige FALSE
+national congress sd Africa Northern Africa FALSE 5 2021-02-03 143923175 way "National Congress, شارع المعونة, Al-Kadaro, SalÄ<81>mat al BÄ<81>shÄ<81>, الخرطوم, ولاية الخرطوم, 13311, السودان" amenity public_building 0.201 السودان FALSE
+starlink qa Asia Western Asia FALSE 5 2021-02-03 57040217 node "Starlink, شارع المنصورة, المنصورة, الدوØØ©, 10849, قطر" shop yes 0.101 قطر FALSE
+palestinian authority ps Asia Western Asia FALSE 5 2021-02-03 102008206 way "Palestinian Monetry Authority, Al Shuhadaa, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" amenity public_building 0.201 Palestinian Territory FALSE
+skype ps Asia Western Asia FALSE 5 2021-02-03 72916230 node "Skype, شارع الكركÙ<81>Ø©, Øارة التراجمة, بيت Ù„ØÙ…, منطقة Ø£, الضÙ<81>Ø© الغربية, 9045634, Palestinian Territory" amenity restaurant 0.101 Palestinian Territory FALSE
+chemical society pk Asia Southern Asia FALSE 5 2021-02-03 58642829 node "Pak Petro Chemical Pvt Ltd, قومی شاÛ<81>راÛ<81>, Sindhi Jamat Housing Society, Dogar Dairy Farm, Shah Latif Town, کراچی, سنڌ, 75030, پاکستان" office company 0.201 پاکستان FALSE
+department of the interior pe Americas South America FALSE 5 2021-02-03 182000790 way "Ministerio del Interior, Calle 21, Corpac, San Isidro, Lima, AN ISIDRO 15036, Perú" office government 0.33461374284578 Perú FALSE
+gns science nz Oceania Australia and New Zealand FALSE 5 2021-02-03 156362879 way "GNS Science, 1, Fairway Drive, Avalon, Lower Hutt City, Wellington, 5040, New Zealand / Aotearoa" office research 0.521073131097349 New Zealand / Aotearoa FALSE
+world wildlife fund np Asia Southern Asia FALSE 5 2021-02-03 19138585 node "World Wildlife Fund, Pabitra Pyara Marg, Kiran Chok, Baluwatar, Kathmandu Metropolitan Ward 4, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 44616, नेपाल" office ngo 0.301 नेपाल FALSE
+african academy of sciences NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred wegener institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred wegener institute for polar and marine research NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance for regenerative medicine NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+american psychological association NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing genomics institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomedical advanced research and development authority NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+breakthrough science society NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+british chiropractic association NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+british medical journal NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of louvain NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+cell press NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+chan zuckerberg initiative NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese center for disease control and prevention NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for epidemic preparedness innovations NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee of concerned scientists NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on publication ethics NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+confederation of spanish scientific societies NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep space climate observatory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+european atomic energy community NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+european commission's joint research centre NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+european planetary science congress NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+european science foundation NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal university of rio grande do norte NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+fusion power associates NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+gilead sciences of foster city NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+harbin veterinary research institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education policy institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+holtzbrinck publishing group NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+howard hughes medical institute's janelia research campus NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for climate change and development NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+jenner institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+jodrell bank observatory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+jülich research centre NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+ligo laboratory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunenfeld-tanenbaum research institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for meteorology NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for radio astronomy NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of science, technology and innovation" NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa goddard space flight center NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academies of science NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national children's study NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council for scientific and technological development NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for nuclear physics NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of general medical sciences NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature biotechnology NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york academy of sciences NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york stem cell foundation NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university's langone medical center NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel foundation NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford nanopore technologies NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific northwest national laboratory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+public employees for environmental responsibility NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+são paulo research foundation NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+smithsonian institution's national museum of natural history NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+university corporation for atmospheric research NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland school of medicine NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of general medical sciences NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+us naval research laboratory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+eindhoven university of technology nl Europe Western Europe FALSE 5 2021-02-03 86000613 way "Technische Universiteit Eindhoven, 2, De Rondom, Centrum, Eindhoven, Noord-Brabant, Nederland, 5600MB, Nederland" amenity university 0.550731319596144 Nederland FALSE
+ema nl Europe Western Europe FALSE 5 2021-02-03 302037271 node "European Medicines Agency, 6, Domenico Scarlattilaan, Drentepark, Zuid, Amsterdam, Noord-Holland, Nederland, 1083HS, Nederland" office government 0.49651736792561 Nederland FALSE
+leiden university medical center nl Europe Western Europe FALSE 5 2021-02-03 257776634 relation "Leiden, Zuid-Holland, Nederland" boundary administrative 0.719246276766776 Nederland FALSE
+max planck institute for psycholinguistics nl Europe Western Europe FALSE 5 2021-02-03 157832152 way "Max Planck Institute for Psycholinguistics, Comeniuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525XD, Nederland" office research 0.828369791841981 Nederland FALSE
+tesla motors nl Europe Western Europe FALSE 5 2021-02-03 32789620 node "Tesla Motors, 29, Pieter Cornelisz. Hooftstraat, Museumkwartier, Amsterdam, Noord-Holland, Nederland, 1071BM, Nederland" shop car 0.703999921130091 Nederland FALSE
+university of twente nl Europe Western Europe FALSE 5 2021-02-03 164997651 way "ITC - Faculty of Geo-Information Science and Earth Observation, 99, Hengelosestraat, Schuttersveld, Enschede, Overijssel, Nederland, 7514, Nederland" amenity university 0.330361546636441 Nederland FALSE
+rts my Asia South-Eastern Asia FALSE 5 2021-02-03 133258714 way "Johor Bahru–Singapore Rapid Transit System / Sistem Transit Aliran Johor Bahru–Singapura, Jalan Lingkaran Dalam, Johor Bahru, Iskandar Malaysia, Johor, 80730, Malaysia" railway construction 0.373004776697036 Malaysia FALSE
+wmap my Asia South-Eastern Asia FALSE 5 2021-02-03 638414 node "Kluang Airstrip, 881 Army Aviation Regiment, Jalan Delima, Kluang, Johor, 86000, Malaysia" aeroway aerodrome 0.217338060184506 Malaysia FALSE
+mauritius mu Africa Eastern Africa FALSE 5 2021-02-03 258556432 relation Mauritius boundary administrative 0.769831293338391 Mauritius FALSE
+court of justice mt Europe Southern Europe FALSE 5 2021-02-03 123844812 way "Court of Justice, Triq ir-Repubblika, Valletta, Xlokk, 1112, Malta" tourism attraction 0.633256970094253 Malta FALSE
+usc md Europe Eastern Europe FALSE 5 2021-02-03 259256589 relation "Universitatea de Stat „Bogdan Petriceicu HaÈ™deuâ€<9d> din Cahul, 1, PiaÈ›a IndependenÈ›ei, Centru, Cahul, Raionul Cahul, Moldova" amenity college 0.256321943137092 Moldova FALSE
+european investment bank lu Europe Western Europe FALSE 5 2021-02-03 259404813 relation "European Investment Bank, Boulevard Konrad Adenauer, Quartier Européen Nord, Kirchberg, Luxembourg, Canton Luxembourg, 1115, Lëtzebuerg" building office 0.301 Lëtzebuerg FALSE
+lithuania lt Europe Northern Europe FALSE 5 2021-02-03 258088012 relation Lietuva boundary administrative 0.755558712203811 Lietuva FALSE
+keio university jp Asia Eastern Asia FALSE 5 2021-02-03 117198676 way "慶應義塾日å<90>‰ã‚ャンパス, 綱島街é<81>“, 港北区, 横浜市, 神奈å·<9d>県, 231-0017, 日本" amenity university 0.579652848044229 日本 FALSE
+international seabed authority jm Americas Caribbean FALSE 5 2021-02-03 177833065 way "International Seabed Authority HQ, Duke Street, Kingston, Surrey County, KINGSTON CSO, Jamaica" building yes 0.301 Jamaica FALSE
+jamaica jm Americas Caribbean FALSE 5 2021-02-03 258485445 relation Jamaica boundary administrative 0.807261561694498 Jamaica FALSE
+university of pisa it Europe Southern Europe FALSE 5 2021-02-03 95844002 way "Reserved university parking, Via Emanuele Filiberto (Duca d'Aosta), Pratale, Pisa, Toscana, 56127, Italia" amenity parking 0.201 Italia FALSE
+university of turin it Europe Southern Europe FALSE 5 2021-02-03 59730551 node "Università degli Studi di Torino - Dipartimento di Chimica, Via Pietro Giuria, San Salvario, Circoscrizione 8, Torino, Piemonte, 10125, Italia" amenity university 0.001 Italia FALSE
+indian institute of science education and research in Asia Southern Asia FALSE 5 2021-02-03 136293867 way "Indian Institute of Science, Education and Research, 1st Cross Road, Duttabad, FB Block, Rajarhat, North 24 Parganas, West Bengal, 700097, India" amenity university 0.701 India FALSE
+institute of astrophysics in Asia Southern Asia FALSE 5 2021-02-03 99960273 way "Indian Institute of Astrophysics, Koramangala 2nd Block, Koramangala, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, India" boundary wall 0.689453166408414 India FALSE
+national centre for biological sciences in Asia Southern Asia FALSE 5 2021-02-03 301582936 way "NCBS Bangalore, 5th Main Road, Canara Bank Layout, Vidyaranyapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560065, India" amenity research_institute 0.001 India FALSE
+weizmann institute il Asia Western Asia FALSE 5 2021-02-03 17630960 node "מכון ויצמן, הרצל, ×ž×¢×•× ×•×ª וולפסון, × ×•×•×” יהודה, רחובות, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל" highway bus_stop 0.001 ישר×<90>ל FALSE
+department of defense ie Europe Northern Europe FALSE 5 2021-02-03 258792189 relation "Department of Defense, Station Road, Morristownbiller ED, The Municipal District of Kildare — Newbridge, County Kildare, Leinster, W12 AD93, Éire / Ireland" office government 0.622075306013723 Éire / Ireland FALSE
+news & views ie Europe Northern Europe FALSE 5 2021-02-03 17702681 node "News and Views, Main Street, Bundoran Urban ED, Donegal Municipal District, County Donegal, Éire / Ireland" shop convenience 0.201 Éire / Ireland FALSE
+science policy research unit gh Africa Western Africa FALSE 5 2021-02-03 74607278 node "Science and Technology Policy Research Institute, Research Crescent, Maamobi, Kokomlemle, Accra Metropolitan, Greater Accra Region, 16033, Ghana" office research 0.301 Ghana FALSE
+airbus gb Europe Northern Europe FALSE 5 2021-02-03 227109417 way "Airbus, Filton, South Gloucestershire, South West England, England, BS34, United Kingdom" landuse industrial 0.3 United Kingdom FALSE
+antarctic survey gb Europe Northern Europe FALSE 5 2021-02-03 258339816 relation "British Antarctic Survey, High Cross, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0ET, United Kingdom" office research 0.201 United Kingdom FALSE
+british museum gb Europe Northern Europe FALSE 5 2021-02-03 257845646 relation "British Museum, Great Russell Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1B 3DG, United Kingdom" tourism museum 0.834130826976438 United Kingdom FALSE
+grantham research institute on climate change gb Europe Northern Europe FALSE 5 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.872343749103071 United Kingdom FALSE
+institute of neuroscience gb Europe Northern Europe FALSE 5 2021-02-03 258398614 relation "Institute of Psychiatry, Psychology & Neuroscience, 16, De Crespigny Park, Denmark Hill, Camberwell, London Borough of Southwark, London, Greater London, England, SE5 8AF, United Kingdom" building university 0.642242222837154 United Kingdom FALSE
+institute of zoology gb Europe Northern Europe FALSE 5 2021-02-03 100713929 way "Institute of Zoology, Outer Circle, Chalk Farm, London Borough of Camden, London, Greater London, England, NW1 4RY, United Kingdom" amenity research_institute 0.517338060184507 United Kingdom FALSE
+queen mary university of london gb Europe Northern Europe FALSE 5 2021-02-03 104273414 way "Queen Mary University of London, Mile End Road, Globe Town, Mile End, London Borough of Tower Hamlets, London, Greater London, England, E1 4NS, United Kingdom" amenity university 0.962411757792441 United Kingdom FALSE
+tea party gb Europe Northern Europe FALSE 5 2021-02-03 62281634 node "Tea Party, Friern Barnet Lane, Whetstone, London Borough of Barnet, London, Greater London, England, N20 0ND, United Kingdom" tourism artwork 0.201 United Kingdom FALSE
+trinity college gb Europe Northern Europe FALSE 5 2021-02-03 116907164 way "Trinity College, Parks Road, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 3PA, United Kingdom" amenity university 0.67805930713623 United Kingdom FALSE
+uk met office gb Europe Northern Europe FALSE 5 2021-02-03 259459361 relation "The Met Office, Fitzroy Road, Met Office, Monkerton, Exeter, Devon, South West England, England, EX1 3PB, United Kingdom" office weather 0.660932371570306 United Kingdom FALSE
+university and college union gb Europe Northern Europe FALSE 5 2021-02-03 146247548 way "University and College Union, Carlow Street, Somers Town, London Borough of Camden, London, Greater London, England, NW1 7LL, United Kingdom" office trade_union 0.401 United Kingdom FALSE
+vertex pharmaceuticals gb Europe Northern Europe FALSE 5 2021-02-03 74733580 node "Vertex Pharmaceuticals (U.K.) Limited, 2, Kingdom Street, Paddington Central, Paddington, City of Westminster, London, Greater London, England, W2 6PY, United Kingdom" office company 0.201 United Kingdom FALSE
+gabon ga Africa Middle Africa FALSE 5 2021-02-03 257869964 relation Gabon boundary administrative 0.777596981965525 Gabon FALSE
+aas fr Europe Western Europe FALSE 5 2021-02-03 258712681 relation "Aast, Pau, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64460, France" boundary administrative 0.654926295858348 France FALSE
+cgiar fr Europe Western Europe FALSE 5 2021-02-03 132938773 way "Groupe Consultatif pour la Recherche Agronomique Internationale, Rond-Point Professeur Louis Malassis, Aiguelongue, Hôpitaux-Facultés, Montpellier, Hérault, Occitanie, France métropolitaine, France" office research 0.001 France FALSE
+international bureau of weights and measures fr Europe Western Europe FALSE 5 2021-02-03 131402735 way "Bureau International des Poids et Mesures, Allée du Mail, Saint-Cloud, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92210, France" amenity public_building 0.558338814941197 France FALSE
+irb fr Europe Western Europe FALSE 5 2021-02-03 259557803 relation "IRB, Rue du Truel, Hôpitaux-Facultés, Montpellier, Hérault, Occitanie, France métropolitaine, 34090, France" building yes 0.101 France FALSE
+labor fr Europe Western Europe FALSE 5 2021-02-03 258575224 relation "Lavaur, Sarlat-la-Canéda, Dordogne, Nouvelle-Aquitaine, France métropolitaine, 24550, France" boundary administrative 0.540322729036538 France FALSE
+national assembly fr Europe Western Europe FALSE 5 2021-02-03 131548816 way "Assemblée nationale, Quai d'Orsay, Quartier des Invalides, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75007, France" tourism attraction 0.709325210617418 France FALSE
+oa fr Europe Western Europe FALSE 5 2021-02-03 258047884 relation "Aube, Grand Est, France métropolitaine, France" boundary administrative 0.608913204678366 France FALSE
+paris observatory fr Europe Western Europe FALSE 5 2021-02-03 108610831 way "Observatoire de Paris, Avenue de l'Observatoire, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" man_made observatory 0.607006976013631 France FALSE
+sanofi-aventis fr Europe Western Europe FALSE 5 2021-02-03 104705121 way "Sanofi-Aventis, Mosson, Montpellier, Hérault, Occitanie, France métropolitaine, France" landuse industrial 0.4 France FALSE
+ugc fr Europe Western Europe FALSE 5 2021-02-03 218698221 way "UGC Ciné-Cité Les Halles, 7, Allée Baltard, Quartier des Halles, Quartier Les Halles, Paris 1er Arrondissement, Paris, Île-de-France, France métropolitaine, 75001, France" amenity cinema 0.359145294756841 France FALSE
+university of helsinki fi Europe Northern Europe FALSE 5 2021-02-03 192168896 way "Helsingin yliopisto, Fabianinkatu, Kaisaniemi, Kluuvi, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00130, Suomi / Finland" amenity university 0.685481368803326 Suomi / Finland FALSE
+asm er Africa Eastern Africa FALSE 5 2021-02-03 187428690 way "ኣህጉራዊ መዓáˆá<8d>Ž áŠ<90>á<8d>ˆáˆá‰² ኣስመራ مطار أسمرة الدولي, ጎደና ሕዳá‹, ኣስመራ Asmara أسمرة, ዞባ ማእከáˆ<8d> Maekel zone المنطقة المركزية, 00291, ኤáˆá‰µáˆ« Eritrea إرتريا" aeroway aerodrome 0.470033965507204 ኤáˆá‰µáˆ« Eritrea إرتريا FALSE
+estonia ee Europe Northern Europe FALSE 5 2021-02-03 257915995 relation Eesti boundary administrative 0.751423093770254 Eesti FALSE
+ecj ec Americas South America FALSE 5 2021-02-03 188019987 way "ECJ, Avenida El Inca, El Carmen, Kennedy, Quito, Pichincha, EC170138, Ecuador" shop car_repair 0.101 Ecuador FALSE
+bayer de Europe Western Europe FALSE 5 2021-02-03 54102872 node "Bayer, Dippoldiswalde, Sächsische Schweiz-Osterzgebirge, Sachsen, 01734, Deutschland" natural peak 0.4 Deutschland FALSE
+humboldt university of berlin de Europe Western Europe FALSE 5 2021-02-03 257729496 relation "Humboldt-Universität zu Berlin, 6, Unter den Linden, Mitte, Berlin, 10117, Deutschland" building university 0.827161448874237 Deutschland FALSE
+johannes gutenberg university de Europe Western Europe FALSE 5 2021-02-03 185604791 way "Johannes-Bobrowski-Straße, Stadtrandsiedlung, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" highway living_street 0.2 Deutschland FALSE
+nsfc de Europe Western Europe FALSE 5 2021-02-03 42904305 node "NSFC, 1, Kaiserstraße, Gewerbegebiet Haderwald, Kaiserslautern, Rheinland-Pfalz, 67661, Deutschland" amenity fast_food 0.101 Deutschland FALSE
+nwo de Europe Western Europe FALSE 5 2021-02-03 248010374 way "NWO, Emsbüren, Landkreis Emsland, Niedersachsen, 48488, Deutschland" man_made pipeline 0.303130333992136 Deutschland FALSE
+lisa cu Americas Caribbean FALSE 5 2021-02-03 46086136 node "La Lisa, 13500, Cuba" place county 0.55 Cuba FALSE
+beijing normal university cn Asia Eastern Asia FALSE 5 2021-02-03 98084241 way "北京师范大å¦, 19, æ–°è¡—å<8f>£å¤–大街, 海淀区, 北京市, 100875, ä¸å›½" amenity university 0.477635896973777 ä¸å›½ FALSE
+china agricultural university cn Asia Eastern Asia FALSE 5 2021-02-03 104756267 way "ä¸å›½å†œä¸šå¤§å¦è¥¿æ ¡åŒº, 2å<8f>·, 圆明å›è¥¿è·¯, 马连洼æ<9d>‘, 海淀区, 北京市, 100093, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+chinese communist party cn Asia Eastern Asia FALSE 5 2021-02-03 178219809 way "ä¸å…±ä¸€å¤§ä¼šå<9d>€, 374, 黄陂å<8d>—è·¯, æº<90>æˆ<90>里å°<8f>区, 淮海ä¸è·¯è¡—é<81>“, 上海市, 黄浦区, 200021, ä¸å›½" tourism museum 0.406597918617146 ä¸å›½ FALSE
+hebei university of science and technology cn Asia Eastern Asia FALSE 5 2021-02-03 127875964 way "河北科技大å¦, 科技大å¦ä¸œé—¨å<8f>£, 裕翔街é<81>“, 裕å<8d>ŽåŒº, 石家庄市, 桥西区, 河北çœ<81>, 050024, ä¸å›½" amenity university 0.34859234613195 ä¸å›½ FALSE
+huazhong university of science and technology cn Asia Eastern Asia FALSE 5 2021-02-03 259583364 relation "å<8d>Žä¸ç§‘技大å¦, 1037å<8f>·, ç<8f>žå–»è·¯, 东湖新技术开å<8f>‘区, 关东街é<81>“, 东湖新技术开å<8f>‘区(托管), 洪山区, 湖北çœ<81>, 430074, ä¸å›½" amenity university 0.438450184063098 ä¸å›½ FALSE
+hunan cn Asia Eastern Asia FALSE 5 2021-02-03 258328378 relation "æ¹–å<8d>—çœ<81>, ä¸å›½" boundary administrative 0.69379355759446 ä¸å›½ FALSE
+institute of vertebrate paleontology cn Asia Eastern Asia FALSE 5 2021-02-03 154175740 way "Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½" amenity public_building 0.401 ä¸å›½ FALSE
+national people's congress cn Asia Eastern Asia FALSE 5 2021-02-03 143598039 way "湛江人民代表大会 Congrès National du Peuple de Zhanjiang, 人民四西路, 工农街é<81>“, 霞山区, 湛江市, 广东çœ<81>, ä¸å›½" building yes 0.201 ä¸å›½ FALSE
+wuhan university cn Asia Eastern Asia FALSE 5 2021-02-03 259347472 relation "æ¦æ±‰å¤§å¦, 299å<8f>·, 八一路, ç<8f>žç<8f>ˆå±±è¡—é<81>“, æ¦æ˜ŒåŒº, 湖北çœ<81>, 430072, ä¸å›½" amenity university 0.472024029849061 ä¸å›½ FALSE
+zhejiang university cn Asia Eastern Asia FALSE 5 2021-02-03 201716562 way "浙江大å¦ä¹‹æ±Ÿæ ¡åŒº, 之江路, 西湖街é<81>“, 西湖区, æ<9d>州市, 浙江çœ<81>, 310008, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+university of chile cl Americas South America FALSE 5 2021-02-03 67050535 node "UTEM, Universidad Tecnológica Metropolitana. Escuela de Arquitectura, 232, Dieciocho, Santiago, Provincia de Santiago, Región Metropolitana de Santiago, 8330180, Chile" amenity university 0.101 Chile FALSE
+university of basel ch Europe Western Europe FALSE 5 2021-02-03 51795099 node "Faculty of Psychology, University of Basel, 60-62, Missionsstrasse, Am Ring, Grossbasel, Basel, Basel-Stadt, 4055, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.301 Schweiz/Suisse/Svizzera/Svizra FALSE
+perimeter institute for theoretical physics ca Americas Northern America FALSE 5 2021-02-03 150705575 way "Perimeter Institute for Theoretical Physics, 31, Caroline Street North, Uptown, Waterloo, Region of Waterloo, Southwestern Ontario, Ontario, N2L 2Y5, Canada" building university 0.845725205949526 Canada FALSE
+yukon ca Americas Northern America FALSE 5 2021-02-03 258448219 relation "Yukon, Canada" boundary administrative 0.69549941569725 Canada FALSE
+federal university of minas gerais br Americas South America FALSE 5 2021-02-03 38865061 node "Universidade Federal de Itajubá, 1301, Pinheirinho, Itajubá, Microrregião de Itajubá, Região Geográfica Intermediária de Pouso Alegre, Minas Gerais, Região Sudeste, 37500183, Brasil" leisure park 0.45 Brasil FALSE
+inpe br Americas South America FALSE 5 2021-02-03 126630542 way "Instituto Nacional de Pesquisas Espaciais, 1758, Avenida dos Astronautas, Jardim da Granja, São José dos Campos, Região Imediata de São José dos Campos, Região Metropolitana do Vale do ParaÃba e Litoral Norte, Região Geográfica Intermediária de São José dos Campos, São Paulo, Região Sudeste, 12227010, Brasil" amenity research_institute 0.412372663380163 Brasil FALSE
+sbpc br Americas South America FALSE 5 2021-02-03 120770712 way "Aeroporto de Poços de Caldas - Embaixador Walther Moreira Salles, Rua Manoel Marquês de Oliveira, São Bento, Região Urbana Homogênea XII, Poços de Caldas, Microrregião Poços de Caldas, Região Geográfica Intermediária de Pouso Alegre, Minas Gerais, Região Sudeste, 37713326, Brasil" aeroway aerodrome 0.200804307025448 Brasil FALSE
+university of brasilia br Americas South America FALSE 5 2021-02-03 258734158 relation "Cidade Universitária Armando de Salles Oliveira, Rua Francisco dos Santos, Butantã, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05587-050, Brasil" amenity university 0.543129165494252 Brasil FALSE
+bahrain bh Asia Western Asia FALSE 5 2021-02-03 258524311 relation البØرين boundary administrative 0.681587845635736 البØرين FALSE
+la trobe university au Oceania Australia and New Zealand FALSE 5 2021-02-03 59775555 node "La Trobe University, Arnold Street, Bendigo, City of Greater Bendigo, Victoria, 3550, Australia" amenity university 0.301 Australia FALSE
+uc au Oceania Australia and New Zealand FALSE 5 2021-02-03 257740098 relation Australia boundary administrative 0.852135063915112 Australia FALSE
+university of newcastle au Oceania Australia and New Zealand FALSE 5 2021-02-03 127867749 way "University of Newcastle, Callaghan Campus, University Drive, Callaghan, Newcastle, Newcastle City Council, New South Wales, 2308, Australia" amenity university 0.301 Australia FALSE
+csir za Africa Southern Africa FALSE 4 2021-02-03 217011667 way "CSIR, Carlow Road, Melville, Johannesburg Ward 87, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" building commercial 0.101 South Africa FALSE
+observatory za Africa Southern Africa FALSE 4 2021-02-03 258312938 relation "Observatory, Cape Town Ward 57, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" place suburb 0.433807263030136 South Africa FALSE
+university of the western cape za Africa Southern Africa FALSE 4 2021-02-03 106377209 way "University of the Western Cape, Chancellor Street, Belhar, Cape Town Ward 22, City of Cape Town, Western Cape, 7493, South Africa" amenity university 0.883144349963485 South Africa FALSE
+ccs ve Americas South America FALSE 4 2021-02-03 245233315 way "Aeropuerto Internacional de MaiquetÃa Simón BolÃvar, Avenida La Entrada, Playa Grande, Parroquia Raul Leoni, Municipio Vargas, La Guaira, 1262, Venezuela" aeroway aerodrome 0.437029786068705 Venezuela FALSE
+veritas ve Americas South America FALSE 4 2021-02-03 64466466 node "Veritas, Calabozo, Parroquia Calabozo, Municipio Francisco de Miranda, Guárico, 2312, Venezuela" place suburb 0.375 Venezuela FALSE
+alnylam us Americas Northern America FALSE 4 2021-02-03 43655569 node "Alnylam Pharmaceuticals, 300, Third Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" office research 0.101 United States FALSE
+arecibo us Americas Northern America FALSE 4 2021-02-03 258975408 relation "Arecibo, Puerto Rico, United States" boundary administrative 0.563856464536119 United States FALSE
+arizona state us Americas Northern America FALSE 4 2021-02-03 257489274 relation "Arizona, United States" boundary administrative 0.923799492478004 United States FALSE
+bell us Americas Northern America FALSE 4 2021-02-03 258273678 relation "Bell County, Texas, United States" boundary administrative 0.658702837946413 United States FALSE
+buck institute for research us Americas Northern America FALSE 4 2021-02-03 175713833 way "Buck Institute for Research on Aging, 8001, Redwood Boulevard, Novato, Marin County, California, 94945, United States" place house 0.712019878936673 United States FALSE
+children's hospital us Americas Northern America FALSE 4 2021-02-03 146447101 way "Boston Children's Hospital, 300, Blackfan Street, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.663455742331178 United States FALSE
+democratic party us Americas Northern America FALSE 4 2021-02-03 227065873 way "Democratic Party, 42, South Main Street, Marshall, Madison County, North Carolina, 28753, United States" office political_party 0.201 United States FALSE
+department of homeland security us Americas Northern America FALSE 4 2021-02-03 128703019 way "Department Of Homeland Security, Upper Express Drive, O'Hare, Chicago, Jefferson Township, Cook County, Illinois, 60666, United States" building yes 0.401 United States FALSE
+dlr us Americas Northern America FALSE 4 2021-02-03 41377326 node "Disneyland Resort, 1313, South Harbor Boulevard, Anaheim Resort District, Anaheim, Orange County, California, 92802, United States" tourism theme_park 0.484442064603758 United States FALSE
+environmental research us Americas Northern America FALSE 4 2021-02-03 145493547 way "Environmental Research, South Euclid Avenue, Boise, Ada County, Idaho, 83706, United States" building yes 0.201 United States FALSE
+environmental sciences us Americas Northern America FALSE 4 2021-02-03 143791307 way "Environmental Sciences, East Ermina Avenue, Chief Garry Park, Spokane, Spokane County, Washington, 99211, United States" building yes 0.201 United States FALSE
+green bank us Americas Northern America FALSE 4 2021-02-03 102881650 way "Green Bank Telescope, Slavin Hollow Road, Pocahontas County, West Virginia, 24944, United States" man_made telescope 0.590988572487363 United States FALSE
+greens us Americas Northern America FALSE 4 2021-02-03 447523 node "The Greens, Fayetteville, Cumberland County, North Carolina, 28311, United States" place hamlet 0.35 United States FALSE
+humboldt university us Americas Northern America FALSE 4 2021-02-03 209573488 way "William Howard Taft Road, University Village Business District, Mount Auburn, Cincinnati, Hamilton County, Ohio, 45219, United States" highway secondary 0.2 United States FALSE
+icesat us Americas Northern America FALSE 4 2021-02-03 203547980 way "ICESat Road, Glenn Dale, Prince George's County, Maryland, 20771, United States" highway unclassified 0.2 United States FALSE
+iea us Americas Northern America FALSE 4 2021-02-03 258149110 relation "Iowa, United States" boundary administrative 0.721883953901863 United States FALSE
+ilc us Americas Northern America FALSE 4 2021-02-03 233280716 way "Interactive Learning Center, 2120, West University Drive, Boise, Ada County, Idaho, 83725, United States" building university 0.001 United States FALSE
+interior us Americas Northern America FALSE 4 2021-02-03 257566293 relation "Interior, Jackson County, South Dakota, United States" boundary administrative 0.441036070852761 United States FALSE
+international union us Americas Northern America FALSE 4 2021-02-03 123308556 way "Newark Liberty International Airport, Basilone Road, Elizabeth, Union County, New Jersey, 07114, United States" aeroway aerodrome 0.707744508540787 United States FALSE
+jila us Americas Northern America FALSE 4 2021-02-03 96516634 way "Joint Institute for Lab Astrophysics, 1900, Colorado Avenue, The Hill, Boulder, Boulder County, Colorado, 80309, United States" building university 0.326239076957718 United States FALSE
+king us Americas Northern America FALSE 4 2021-02-03 258455752 relation "King County, Texas, 79236, United States" boundary administrative 0.652064928459235 United States FALSE
+la jolla institute for immunology us Americas Northern America FALSE 4 2021-02-03 149701516 way "La Jolla Institute for Allergy and Immunology, Athena Circle, Science Research Park, University City, San Diego, San Diego County, California, 92039, United States" building university 0.501 United States FALSE
+lockheed martin space systems us Americas Northern America FALSE 4 2021-02-03 22515675 node "Lockheed Martin Space Company Fire Department, Empire Grade, Lockheed Martin Space Systems Company, Santa Cruz County, California, United States" amenity fire_station 0.401 United States FALSE
+lunar reconnaissance orbiter us Americas Northern America FALSE 4 2021-02-03 16186893 node "Lunar Reconnaissance Orbiter Camera Visitor Gallery, 1100, South Cady Mall, Tempe, Maricopa County, Arizona, 85287, United States" tourism information 0.301 United States FALSE
+md anderson cancer center us Americas Northern America FALSE 4 2021-02-03 103450497 way "University of Texas MD Anderson Cancer Center, 1515, Holcombe Boulevard, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity hospital 0.743190432299382 United States FALSE
+memorial sloan-kettering cancer center us Americas Northern America FALSE 4 2021-02-03 210339215 way "Memorial Sloan Kettering Cancer Center, 1275, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity hospital 0.894052338771708 United States FALSE
+national academy of medicine us Americas Northern America FALSE 4 2021-02-03 101801329 way "Academy of Medicine, 7th Street Northeast, Atlanta, Fulton County, Georgia, 30308, United States" amenity school 0.428160971568546 United States FALSE
+national air and space museum us Americas Northern America FALSE 4 2021-02-03 106698268 way "National Air and Space Museum, 655, Jefferson Drive Southwest, Washington, District of Columbia, 20560, United States" tourism museum 0.942899315724623 United States FALSE
+nationwide children's hospital us Americas Northern America FALSE 4 2021-02-03 259214398 relation "Nationwide Children's Hospital, 700, Children's Drive, Livingston Park, Columbus, Franklin, Ohio, 43205, United States" amenity hospital 0.649182950422608 United States FALSE
+naval research laboratory us Americas Northern America FALSE 4 2021-02-03 105823802 way "United States Naval Research Laboratory, Washington, District of Columbia, 20375, United States" landuse military 0.730026590181569 United States FALSE
+nnsa us Americas Northern America FALSE 4 2021-02-03 170892516 way "NNSA Gun Range, North Base Road, Kern County, California, United States" building industrial 0.101 United States FALSE
+nrf us Americas Northern America FALSE 4 2021-02-03 236034264 way "Naval Reactors Facility, Butte County, Idaho, United States" landuse industrial 0.2 United States FALSE
+orbital sciences us Americas Northern America FALSE 4 2021-02-03 247187997 way "Orbital Sciences, New South Road, Santa Barbara County, California, United States" building yes 0.201 United States FALSE
+pan american health organization us Americas Northern America FALSE 4 2021-02-03 106697416 way "Pan-American Health Organization, 2121, Virginia Avenue Northwest, Foggy Bottom, Washington, District of Columbia, 20037, United States" office government 1.00046431649804 United States FALSE
+regeneron us Americas Northern America FALSE 4 2021-02-03 155139757 way "Regeneron, 1, Rockwood Road, Archville, Town of Mount Pleasant, Westchester, New York, 10591, United States" building yes 0.101 United States FALSE
+regeneron pharmaceuticals us Americas Northern America FALSE 4 2021-02-03 12282651 node "Regeneron Pharmaceuticals, Garden Way, Clinton Park, Town of East Greenbush, Rensselaer County, New York, 12144, United States" landuse industrial 0.201 United States FALSE
+republican party us Americas Northern America FALSE 4 2021-02-03 147349004 way "Ohio Republican Party, South Fifth Street, Market Mohawk District, Columbus, Franklin, Ohio, 43216, United States" office political_party 0.582152257727352 United States FALSE
+sandoz us Americas Northern America FALSE 4 2021-02-03 356860 node "Sandoz, Calaveras County, California, United States" place hamlet 0.35 United States FALSE
+santa clara university us Americas Northern America FALSE 4 2021-02-03 258949006 relation "Santa Clara University, El Camino Real, Santa Clara, Santa Clara County, California, 95050, United States" amenity university 0.787796879524132 United States FALSE
+santa fe institute us Americas Northern America FALSE 4 2021-02-03 259309786 relation "Santa Fe Institute, Ann Nitze Hiking Trail, Santa Fe, Santa Fe County, New Mexico, 87501, United States" office educational_institution 0.301 United States FALSE
+scripps research us Americas Northern America FALSE 4 2021-02-03 2879141 node "Scripps Research Institute, 10666, Coast Highway, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States" office research 0.201 United States FALSE
+spacex falcon us Americas Northern America FALSE 4 2021-02-03 207518194 way "Falcon 9 Booster B1019, Jack Northrop Avenue, Hawthorne, Los Angeles County, California, 90250-4638, United States" tourism attraction 0.101 United States FALSE
+st. jude children's research hospital us Americas Northern America FALSE 4 2021-02-03 258425834 relation "St. Jude Children's Research Hospital, 262, Danny Thomas Place, Lauderdale Courts, Memphis, Shelby County, Tennessee, 38105, United States" amenity hospital 1.00269308307499 United States FALSE
+tufts university school of medicine us Americas Northern America FALSE 4 2021-02-03 69247818 node "Tufts University School of Medicine, 136, Harrison Avenue, Chinatown, Financial District, Boston, Suffolk County, Massachusetts, 02111, United States" amenity college 0.835161875786798 United States FALSE
+uc berkeley us Americas Northern America FALSE 4 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 0.748194378261701 United States FALSE
+ucsd us Americas Northern America FALSE 4 2021-02-03 94305187 way "University of California, San Diego, 9500, Gilman Drive, San Diego, San Diego County, California, 92093, United States" amenity university 0.549388364219268 United States FALSE
+un general assembly us Americas Northern America FALSE 4 2021-02-03 50098618 node "General Assembly, 675, Ponce de Leon Avenue Northeast, Atlanta, Fulton County, Georgia, 30306, United States" amenity school 0.301 United States FALSE
+university of arkansas us Americas Northern America FALSE 4 2021-02-03 199918736 way "University of Arkansas, North Oakland Avenue, Fayetteville, Washington County, Arkansas, 72701, United States" amenity university 0.820276506570897 United States FALSE
+university of california at berkeley us Americas Northern America FALSE 4 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.1481943782617 United States FALSE
+university of genoa us Americas Northern America FALSE 4 2021-02-03 208081496 way "Cleary University, 3750, Cleary Drive, Howell, Livingston County, Michigan, 48843, United States" building university 0.408817475555606 United States FALSE
+university of lyon us Americas Northern America FALSE 4 2021-02-03 143873364 way "Southwest Minnesota State University, Birch Street, Marshall, Lyon County, Minnesota, 56258, United States" amenity university 0.541762590849456 United States FALSE
+university of maine us Americas Northern America FALSE 4 2021-02-03 129690497 way "University of Maine Orono, Charles Street, Orono, Penobscot County, Maine, 04473, United States" amenity university 0.782803577509063 United States FALSE
+university of mississippi us Americas Northern America FALSE 4 2021-02-03 99276437 way "University of Mississippi, Rebel Drive, University, Lafayette County, Mississippi, 38677, United States" amenity university 0.811795442599009 United States FALSE
+university of naples us Americas Northern America FALSE 4 2021-02-03 2738023 node "Walden University, Bahia Point, Naples, Collier County, Florida, 34103, United States" amenity school 0.201 United States FALSE
+university of potsdam us Americas Northern America FALSE 4 2021-02-03 114514033 way "State University of New York at Potsdam, 44, Pierrepont Avenue, Potsdam, Saint Lawrence County, New York, 13676, United States" amenity university 0.665126099291008 United States FALSE
+university of texas health science center us Americas Northern America FALSE 4 2021-02-03 2459452 node "The University of Texas Health Science Center, 7000, Fannin Street, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity university 0.938041195081873 United States FALSE
+us army corps of engineers us Americas Northern America FALSE 4 2021-02-03 211349908 way "US Army Corps of Engineers, DeKalb County, Tennessee, United States" landuse commercial 0.7 United States FALSE
+us department of homeland security us Americas Northern America FALSE 4 2021-02-03 137867886 way "US Department of Homeland Security, Randolph Road Southeast, Kirtland Addition, Albuquerque, Bernalillo County, New Mexico, 87106-5117, United States" building yes 0.501 United States FALSE
+us department of labor us Americas Northern America FALSE 4 2021-02-03 196192727 way "Department of Labor, 550, South 16th Street, Capitol View, Haymarket, Lincoln, Lancaster County, Nebraska, 68508, United States" office government 0.301 United States FALSE
+us district court us Americas Northern America FALSE 4 2021-02-03 133238357 way "US District Court, 401, Courthouse Square, Lyles-Crouch, Alexandria, Virginia, 22314, United States" amenity courthouse 0.301 United States FALSE
+us national radio astronomy observatory us Americas Northern America FALSE 4 2021-02-03 103730706 way "National Radio Astronomy Observatory, East End Road, Saint Croix District, United States Virgin Islands, United States" building yes 0.401 United States FALSE
+us state department us Americas Northern America FALSE 4 2021-02-03 69248957 node "C Street & 20th Street Northwest (State Department), C Street Northwest, Washington, District of Columbia, 20037, United States" highway bus_stop 0.201 United States FALSE
+wayne state university us Americas Northern America FALSE 4 2021-02-03 259372324 relation "Wayne State University, Commonwealth Street, Woodbridge, Midtown, Detroit, Wayne County, Michigan, 48208, United States" amenity university 0.805217009868445 United States FALSE
+wellesley college us Americas Northern America FALSE 4 2021-02-03 119472640 way "Wellesley College, Cross Street, College Heights, Wellesley, Norfolk County, Massachusetts, 02482, United States" amenity college 0.70312816120194 United States FALSE
+western university us Americas Northern America FALSE 4 2021-02-03 2863345 node "Western University, Easthill Drive, Jamacha, San Diego, San Diego County, California, 91945, United States" amenity school 0.201 United States FALSE
+wilson center us Americas Northern America FALSE 4 2021-02-03 198959606 way "Wilson Center, 240, Nassau Street, Princeton, Mercer County, New Jersey, 08540, United States" building yes 0.201 United States FALSE
+anatolia tr Asia Western Asia FALSE 4 2021-02-03 56798024 node "Asia Minor, Polatlı, Ankara, İç Anadolu Bölgesi, Türkiye" place peninsula 0.602668374396159 Türkiye FALSE
+jwst tr Asia Western Asia FALSE 4 2021-02-03 58940448 node "Just inn Hotel, 18, Ibni-Kemal Caddesi, Hocapaşa Mahallesi, İstanbul, Fatih, İstanbul, Marmara Bölgesi, 34112, Türkiye" tourism hotel 0.001 Türkiye FALSE
+tencent th Asia South-Eastern Asia FALSE 4 2021-02-03 57503349 node "Tencent, ถนนรัชดาภิเษà¸<81>, รัชดาภิเษà¸<81>, à¹<81>ขวงรัชดาภิเษà¸<81>, เขตดินà¹<81>ดง, à¸<81>รุงเทพมหานคร, 10400, ประเทศไทย" shop computer 0.101 ประเทศไทย FALSE
+seti td Africa Middle Africa FALSE 4 2021-02-03 258517069 relation Tchad تشاد boundary administrative 0.662462283081021 Tchad تشاد FALSE
+tms st Africa Middle Africa FALSE 4 2021-02-03 128146184 way "Aeroporto Internacional de São Tomé, ES14, Bairro de Aeroporto, Praia Gamboa, Ã<81>gua Grande, ProvÃncia de São Tomé, 461, São Tomé e PrÃncipe" aeroway aerodrome 0.356849137603517 São Tomé e PrÃncipe FALSE
+duke-nus medical school sg Asia South-Eastern Asia FALSE 4 2021-02-03 131651364 way "Duke-NUS Medical School, 8, College Road, Bukit Merah, Singapore, Central, 169857, Singapore" building university 0.69350420583069 Singapore FALSE
+nus medical school sg Asia South-Eastern Asia FALSE 4 2021-02-03 131651364 way "Duke-NUS Medical School, 8, College Road, Bukit Merah, Singapore, Central, 169857, Singapore" building university 0.59350420583069 Singapore FALSE
+genzyme se Europe Northern Europe FALSE 4 2021-02-03 78318285 node "Genzyme, 42, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 82, Sverige" office company 0.101 Sverige FALSE
+seychelles sc Africa Eastern Africa FALSE 4 2021-02-03 258464914 relation Sesel boundary administrative 0.647100293229899 Sesel FALSE
+kaist ru Europe Eastern Europe FALSE 4 2021-02-03 205795897 way "КаиÑ<81>Ñ‚, городÑ<81>кое поÑ<81>еление ВерхнетуломÑ<81>кий, КольÑ<81>кий район, МурманÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Северо-Западный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" waterway river 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+nikon ru Europe Eastern Europe FALSE 4 2021-02-03 55215823 node "Nikon, 1, 2-й СыромÑ<8f>тничеÑ<81>кий переулок, КошельнаÑ<8f> Ñ<81>лобода, ТаганÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 105120, РоÑ<81>Ñ<81>иÑ<8f>" shop electronics 0.101 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+russian federation ru Europe Eastern Europe FALSE 4 2021-02-03 258410737 relation РоÑ<81>Ñ<81>иÑ<8f> boundary administrative 0.852192362078589 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+palau pw Oceania Micronesia FALSE 4 2021-02-03 258530413 relation Belau boundary administrative 0.62710039879367 Belau FALSE
+polish academy of sciences pl Europe Eastern Europe FALSE 4 2021-02-03 82565029 node "Polska Akademia Nauk, 72, Nowy Świat, Centrum, Śródmieście Północne, Śródmieście, Warszawa, województwo mazowieckie, 00-330, Polska" amenity research_institute 0.551024356739357 Polska FALSE
+university of warsaw pl Europe Eastern Europe FALSE 4 2021-02-03 96031290 way "Uniwersytet Warszawski, Krakowskie Przedmieście, Centrum, Śródmieście Północne, Śródmieście, Warszawa, województwo mazowieckie, 00-046, Polska" amenity university 0.59809205701364 Polska FALSE
+oman om Asia Western Asia FALSE 4 2021-02-03 258236468 relation عمان boundary administrative 0.680326025870515 عمان FALSE
+research council om Asia Western Asia FALSE 4 2021-02-03 200491619 way "The Research Council, سكة 4854, مسقط, 1858, عمان" office research 0.201 عمان FALSE
+magellan nz Oceania Australia and New Zealand FALSE 4 2021-02-03 57692135 node "Magellan, Westland District, West Coast, New Zealand / Aotearoa" natural peak 0.4 New Zealand / Aotearoa FALSE
+massey university nz Oceania Australia and New Zealand FALSE 4 2021-02-03 18195819 node "Massey University, Turitea Road, Fitzherbert, Palmerston North City, Manawatū-Whanganui, 4118, New Zealand / Aotearoa" building yes 0.637234715266229 New Zealand / Aotearoa FALSE
+national party nz Oceania Australia and New Zealand FALSE 4 2021-02-03 26266228 node "National Party, 510, Grey Street, Hamilton East, Hamilton City, Waikato, 3247, New Zealand / Aotearoa" office political_party 0.201 New Zealand / Aotearoa FALSE
+advanced research projects agency-energy NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+american council on education NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+american psychiatric association NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+amyris biotechnologies NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of american publishers NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian strategic policy institute NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+board of land and natural resources NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+board of scientific counselors NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+cayetano heredia university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for drug evaluation and research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international climate research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+central ethical review board NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+charité medical university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of tibetan plateau research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+cold spring harbor laboratory press NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on data for science and technology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on gender balance and diversity in research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+complutense university of madrid NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke university school of medicine NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+eliza hall institute of medical research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+european innovation council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+fastercures NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of american scientists NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+feinstein institute for medical research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+forth institute of molecular biology and biotechnology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national centre for scientific research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+friends of cancer research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+geological society of america NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education statistics agency NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of representatives committee NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+human heredity and health NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for governance and sustainable development NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of advanced scientific studies NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of electrical and electronics engineers NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of genomics and integrative biology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+international agency for research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cancer genome consortium NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+international council on clean transportation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+ipbes NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins university school of medicine NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint united nations programme NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+justice and development party NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+leiden observatory NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+liverpool john moores university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+louisiana universities marine consortium NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+ludwig institute for cancer research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+macarthur foundation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for biophysical chemistry NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for ornithology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of quantum optics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+mctic NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+nagpra NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academy of engineering NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for advancing translational sciences NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for biotechnology information NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national health and medical research council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of nuclear physics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national postdoctoral association NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science advisory board for biosecurity NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national scientific and technical research council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural sciences and engineering research council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature genetics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature photonics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands institute of ecology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+nigeria centre for disease control NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of oceanic and atmospheric research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+paris institute of earth physics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+pompeu fabra university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+pontifical catholic university of chile NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+public patent foundation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+robert koch institute NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+scholarly publishing and academic resources coalition NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+science is vital NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+science philanthropy alliance NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+seismological society of america NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+ska organisation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+space policy institute NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+space policy institute at george washington university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+sputnik planum NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+stamina foundation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford law school NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+statistical manual of mental disorders NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+tmt international observatory NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations security council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of paris south NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of puerto rico NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of rome la sapienza NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of rome tor vergata NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington school of medicine NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington's institute for health metrics and evaluation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of wisconsin law school NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+urgenda foundation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+us global change research program NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academies of science NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national center for biotechnology information NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+wfirst NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale school of public health NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands cancer institute nl Europe Western Europe FALSE 4 2021-02-03 790330 node "Antoni van Leeuwenhoek, 121, Plesmanlaan, Park Haagseweg, Amsterdam, Noord-Holland, Nederland, 1066CX, Nederland" amenity hospital 0.250254845255209 Nederland FALSE
+gwas ng Africa Western Africa FALSE 4 2021-02-03 4173335 node "Kurmin Gwas, Kwaturu, Kachia, Kaduna, Nigeria" place village 0.375 Nigeria FALSE
+european court of auditors lu Europe Western Europe FALSE 4 2021-02-03 178152493 way "European Court of Auditors, 12, Rue Alcide de Gasperi, Quartier Européen Nord, Kirchberg, Luxembourg, Canton Luxembourg, 1615, Lëtzebuerg" office government 0.881520550885057 Lëtzebuerg FALSE
+us department of state lr Africa Western Africa FALSE 4 2021-02-03 203675491 way "Mitigating Local Dispute In Liberia (MLDL) US department Of State, Saclepea Road, Gbalagbein, Zone 2, Garr-Bain, Nimba County, Liberia" man_made yes 0.401 Liberia FALSE
+ulsan national institute of science and technology kr Asia Eastern Asia FALSE 4 2021-02-03 130579694 way "ìš¸ì‚°ê³¼í•™ê¸°ìˆ ì›<90>, ìœ ë‹ˆìŠ¤íŠ¸ê¸¸, 울주군, 울산, 44926, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+kiribati ki Oceania Micronesia FALSE 4 2021-02-03 258555103 relation Kiribati boundary administrative 0.718215660119049 Kiribati FALSE
+astronautical science jp Asia Eastern Asia FALSE 4 2021-02-03 115578298 way "宇宙科å¦ç ”究所 (Institute of Space and Astronautical Science), 銀河北通り, ä¸å¤®åŒº, 相模原市, 神奈å·<9d>県, 252-0234, 日本" office research 0.201 日本 FALSE
+fukushima daiichi jp Asia Eastern Asia FALSE 4 2021-02-03 114047090 way "ç¦<8f>島第一 原å<90>力発電所, 大熊町, å<8f>Œè‘‰éƒ¡, ç¦<8f>島県, 日本" landuse industrial 0.479852659697918 日本 FALSE
+institute of space and astronautical science jp Asia Eastern Asia FALSE 4 2021-02-03 115578298 way "宇宙科å¦ç ”究所 (Institute of Space and Astronautical Science), 銀河北通り, ä¸å¤®åŒº, 相模原市, 神奈å·<9d>県, 252-0234, 日本" office research 0.601 日本 FALSE
+japan proton accelerator research complex jp Asia Eastern Asia FALSE 4 2021-02-03 42542030 node "JPARC, 国é<81>“245å<8f>·, æ<9d>±æµ·æ<9d>‘, é‚£ç<8f>‚郡, 茨城県, 〒319-1112, 日本" landuse industrial 0.001 日本 FALSE
+bari it Europe Southern Europe FALSE 4 2021-02-03 301984442 relation "Bari, Puglia, Italia" boundary administrative 0.718718321253269 Italia FALSE
+university of technology iq Asia Western Asia FALSE 4 2021-02-03 109742498 way "الجامعة التكنلوجية, سريع Ù…Øمد القاسم, Sinaa', البلدية الكرادة, بغداد, ناØية الكرادة, قضاء الرصاÙ<81>Ø©, Ù…ØاÙ<81>ظة بغداد, 3241, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" amenity university 0.3689594008139 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+centre for cellular and molecular biology in Asia Southern Asia FALSE 4 2021-02-03 102044629 way "Center for Cellular and molecular biology, Habsiguda Main Road, Tarnaka, Ward 6 Nacharam, Greater Hyderabad Municipal Corporation East Zone, Hyderabad, Uppal mandal, Medchal–Malkajgiri, Telangana, 500003, India" office research 0.501 India FALSE
+council of scientific and industrial research in Asia Southern Asia FALSE 4 2021-02-03 24264243 node "Council of Scientific & Industrial Research (CSIR), kuzhvila lane, Pappanamcode, 38 MSP Nagar, Thiruvananthapuram, Kerala, 695019, India" amenity research_institute 0.501 India FALSE
+indian institute of technology in Asia Southern Asia FALSE 4 2021-02-03 1396119 node "Indian Institute Of Technology, IIT Delhi Main Road, Mehrauli Tehsil, South Delhi, Delhi, 110 067, India" amenity university 0.788558306414252 India FALSE
+mmr in Asia Southern Asia FALSE 4 2021-02-03 67922341 node "Manmad Junction, NH752G, Railway Colony, Manmad, Nandgaon, Nashik, Maharashtra, 423104, India" railway station 0.363116169023831 India FALSE
+ngc in Asia Southern Asia FALSE 4 2021-02-03 68608272 node "New Guwahati, Ambika giri nagar, Ambikagiri Nagar, Assam, Dispur, Kamrup Metropolitan, 781024, India" railway station 0.249182950422608 India FALSE
+royal institution in Asia Southern Asia FALSE 4 2021-02-03 246099153 way "institution, Salem-Kochi-Kanyakumari Road, Karthikappally, Alappuzha, Kerala, 690548, India" building yes 0.111 India FALSE
+serum institute of india in Asia Southern Asia FALSE 4 2021-02-03 79442200 node "Serum Institute of India Pvt. Ltd., 212/2, Hadapsar, Solapur Road, Pune City, Pune District, Maharashtra, 411028, India" place house 0.401 India FALSE
+workers' party ie Europe Northern Europe FALSE 4 2021-02-03 60364423 node "The Workers' Party, 24/25a, Hill Street, Rotunda A ED, Dublin, Dublin 1, Leinster, D01 P5W9, Éire / Ireland" office political_party 0.201 Éire / Ireland FALSE
+bca id Asia South-Eastern Asia FALSE 4 2021-02-03 82555649 node "BCA, 29-31, Jalan Jenderal Sudirman, RW 02, Setiabudi, Daerah Khusus Ibukota Jakarta, 12920, Indonesia" amenity bank 0.48265030002841 Indonesia FALSE
+gns id Asia South-Eastern Asia FALSE 4 2021-02-03 216515106 way "Bandar Udara Binaka, Nias, Sumatera Utara, Indonesia" aeroway aerodrome 0.382027115756698 Indonesia FALSE
+indonesian institute of sciences id Asia South-Eastern Asia FALSE 4 2021-02-03 118440854 way "Lembaga Ilmu Pengetahuan Indonesia, Jalan Jenderal Gatot Subroto, RW 01, Kuningan Barat, Mampang Prapatan, Daerah Khusus Ibukota Jakarta, 12950, Indonesia" man_made works 0.001 Indonesia FALSE
+eötvös loránd university hu Europe Eastern Europe FALSE 4 2021-02-03 123965591 way "Eötvös Loránd Tudományegyetem Bölcsészettudományi Kar, 4-8, Múzeum körút, Belváros, V. kerület, Budapest, Közép-Magyarország, 1088, Magyarország" amenity university 0.759079404587545 Magyarország FALSE
+honduras hn Americas Central America FALSE 4 2021-02-03 257416285 relation Honduras boundary administrative 0.801423826610442 Honduras FALSE
+guatemala gt Americas Central America FALSE 4 2021-02-03 258193481 relation Guatemala boundary administrative 0.810709287382318 Guatemala FALSE
+university of crete gr Europe Southern Europe FALSE 4 2021-02-03 52030770 node "House of Europe, Μακεδονίας, Δήμος ΡεθÏ<8d>μνης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΡεθÏ<8d>μνης, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 74123, Ελλάδα" tourism hotel 0.101 Ελλάδα FALSE
+equatorial guinea gq Africa Middle Africa FALSE 4 2021-02-03 257904282 relation Guinea Ecuatorial boundary administrative 0.751043770650231 Guinea Ecuatorial FALSE
+university of ghana gh Africa Western Africa FALSE 4 2021-02-03 164347766 way "University of Ghana, Lower Hill Drive, Little Legon, Accra Metropolitan, Greater Accra Region, BOX LG25, Ghana" amenity university 0.736359020811001 Ghana FALSE
+department for education gb Europe Northern Europe FALSE 4 2021-02-03 97291141 way "Department for Education, 20, Great Smith Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3BT, United Kingdom" office government 0.301 United Kingdom FALSE
+economist gb Europe Northern Europe FALSE 4 2021-02-03 186500188 way "The Economist, 25, St. James's Street, St. James's, Mayfair, City of Westminster, London, Greater London, England, SW1A 1HJ, United Kingdom" office newspaper 0.241913844040538 United Kingdom FALSE
+labour party gb Europe Northern Europe FALSE 4 2021-02-03 72659499 node "Labour Party, Jamaica Road, Butler's Wharf, Bermondsey, London Borough of Southwark, London, Greater London, England, SE16 4RX, United Kingdom" office political_party 0.201 United Kingdom FALSE
+liberal democrat gb Europe Northern Europe FALSE 4 2021-02-03 64051674 node "Aylesbury Liberal Democrat Headquarters, Castle Street, Walton, Aylesbury, Buckinghamshire, South East, England, HP20 2QL, United Kingdom" office political_party 0.201 United Kingdom FALSE
+ministry of defence gb Europe Northern Europe FALSE 4 2021-02-03 98588582 way "Ministry of Defence, Horse Guards Avenue, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2HB, United Kingdom" military office 0.831875732226719 United Kingdom FALSE
+national physical laboratory gb Europe Northern Europe FALSE 4 2021-02-03 178419620 way "National Physical Laboratory, Hampton Hill, London Borough of Richmond upon Thames, London, Greater London, England, United Kingdom" landuse commercial 0.5 United Kingdom FALSE
+nhs gb Europe Northern Europe FALSE 4 2021-02-03 97017893 way "Queen Alexandra Hospital, Old London Road, Cosham, Portsmouth, South East, England, PO6 3ES, United Kingdom" amenity hospital 0.217338060184506 United Kingdom FALSE
+pirbright institute gb Europe Northern Europe FALSE 4 2021-02-03 96398766 way "The Pirbright Institute, Pirbright, Guildford, Surrey, South East, England, GU24 0NF, United Kingdom" landuse industrial 0.4 United Kingdom FALSE
+rothamsted research gb Europe Northern Europe FALSE 4 2021-02-03 134923114 way "Rothamsted Research, Rothamsted Avenue, Roundwood, Harpenden, St Albans, Hertfordshire, East of England, England, AL5 2TW, United Kingdom" amenity university 0.201 United Kingdom FALSE
+rutherford appleton laboratory gb Europe Northern Europe FALSE 4 2021-02-03 107529003 way "Rutherford Appleton Laboratory, Roman Fields, Chilton, Vale of White Horse, Oxfordshire, South East, England, OX11 0UF, United Kingdom" amenity laboratory 0.650918373098637 United Kingdom FALSE
+sainsbury laboratory gb Europe Northern Europe FALSE 4 2021-02-03 120833906 way "Sainsbury Laboratory, Middle Walk, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 8BP, United Kingdom" building university 0.560862131063799 United Kingdom FALSE
+soas university of london gb Europe Northern Europe FALSE 4 2021-02-03 259443457 relation "SOAS University of London, Woburn Square, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0AA, United Kingdom" amenity university 0.887548679886816 United Kingdom FALSE
+the nih gb Europe Northern Europe FALSE 4 2021-02-03 257838544 relation "Northern Ireland, United Kingdom" boundary administrative 0.810837420058351 United Kingdom FALSE
+uk national health service gb Europe Northern Europe FALSE 4 2021-02-03 136097374 way "Boots, 40, Hampstead High Street, Vale of Health, Belsize Park, London Borough of Camden, London, Greater London, England, NW3 1QE, United Kingdom" shop chemist 0.101 United Kingdom FALSE
+university college gb Europe Northern Europe FALSE 4 2021-02-03 115937498 way "University College, Logic Lane, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4EX, United Kingdom" amenity university 0.683844730994415 United Kingdom FALSE
+university of surrey gb Europe Northern Europe FALSE 4 2021-02-03 258855441 relation "University of Surrey, Richard Meyjes Road, Park Barn, Guildford, Surrey, South East, England, GU2 7XH, United Kingdom" amenity university 0.774083401364362 United Kingdom FALSE
+cepi fr Europe Western Europe FALSE 4 2021-02-03 258248385 relation "Cépie, Limoux, Aude, Occitanie, France métropolitaine, 11300, France" boundary administrative 0.530539717499056 France FALSE
+committee on space research fr Europe Western Europe FALSE 4 2021-02-03 80463846 node "Committee on Space Research, 2, Place Maurice Quentin, Quartier des Halles, Quartier Les Halles, Paris 1er Arrondissement, Paris, Île-de-France, France métropolitaine, 75001, France" office research 0.862953287025885 France FALSE
+european synchrotron radiation facility fr Europe Western Europe FALSE 4 2021-02-03 257718140 relation "European Synchrotron Radiation Facility, A 480, Polygone Scientifique, Secteur 1, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38000, France" building office 0.760151663261328 France FALSE
+gilead sciences fr Europe Western Europe FALSE 4 2021-02-03 57632761 node "Gilead Sciences, Quai Georges Gorse, Rives de Seine, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" office company 0.201 France FALSE
+lilly fr Europe Western Europe FALSE 4 2021-02-03 258366075 relation "Lilly, Les Andelys, Eure, Normandie, France métropolitaine, 27480, France" boundary administrative 0.646329478200412 France FALSE
+space agency fr Europe Western Europe FALSE 4 2021-02-03 91413915 way "European Space Agency, Square Lowendal, Quartier Necker, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France" office government 0.799350436637207 France FALSE
+university of paris fr Europe Western Europe FALSE 4 2021-02-03 108596882 way "Université Paris-Dauphine, 1, Place du Maréchal de Lattre de Tassigny, Quartier de la Porte-Dauphine, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75116, France" amenity university 0.577529588367216 France FALSE
+university of strasbourg fr Europe Western Europe FALSE 4 2021-02-03 102280471 way "International Space University, Rue Mathias Ringmann, Parc d'Innovation Technologique d'Illkirch, Illkirch-Graffenstaden, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67400, France" amenity university 0.587650262005596 France FALSE
+echa fi Europe Northern Europe FALSE 4 2021-02-03 228733010 way "ECHA, 6, Telakkakatu, Viiskulma, Punavuori, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00150, Suomi / Finland" office government 0.68713884113187 Suomi / Finland FALSE
+nato fi Europe Northern Europe FALSE 4 2021-02-03 142732534 way "Nåtö, Lemland, Ålands landsbygd, Landskapet Åland, Suomi / Finland" place island 0.325 Suomi / Finland FALSE
+addis ababa university et Africa Eastern Africa FALSE 4 2021-02-03 76411915 node "Addis Ababa University, Botswana Street, Sidist Kilo, Gulale, አዲስ አበባ / Addis Ababa, 1176, ኢትዮጵያ" amenity university 0.301 ኢትዮጵያ FALSE
+institute of photonic sciences es Europe Southern Europe FALSE 4 2021-02-03 108665081 way "Institute of Photonic Sciences, 3, Avinguda de Carl Friedrich Gauss, Mar-i-sol, Castelldefels, Baix Llobregat, Barcelona, Catalunya, 08860, España" office research 0.401 España FALSE
+la niña es Europe Southern Europe FALSE 4 2021-02-03 131047530 way "La Niña, Muelle de la reina, Palos de la Frontera, Comarca Metropolitana de Huelva, Huelva, AndalucÃa, 21819, España" tourism attraction 0.545044178032674 España FALSE
+cihr dz Africa Northern Africa FALSE 4 2021-02-03 258722348 relation "Chir ⵛⵉⵔ شير, Daïra Teniet El Abed, Batna ⵜⴱⴰⵜⴻâµ<8f>ⵜ باتنة, 05108, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" boundary administrative 0.394871386033001 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+dominican republic do Americas Caribbean FALSE 4 2021-02-03 257680231 relation República Dominicana boundary administrative 0.808236599440443 República Dominicana FALSE
+mit media lab dk Europe Northern Europe FALSE 4 2021-02-03 73788074 node "Dit og Mit Randers, Ribevej, Randers SV, Randers, Randers Kommune, 8940, Danmark" amenity fast_food 0.101 Danmark FALSE
+biontech de Europe Western Europe FALSE 4 2021-02-03 126159487 way "12, BioNTech, Oberstadt, Mainz, Rheinland-Pfalz, 55131, Deutschland" landuse commercial 0.3 Deutschland FALSE
+embl de Europe Western Europe FALSE 4 2021-02-03 123328960 way "EMBL, 85 Gebäude 25a, Notkestraße, Bahrenfeld, Altona, Hamburg, 22607, Deutschland" office research 0.101 Deutschland FALSE
+esoc de Europe Western Europe FALSE 4 2021-02-03 112384523 way "European Space Operations Centre, Waldkolonie, Darmstadt-Nord, Darmstadt, Hessen, 64293, Deutschland" landuse institutional 0.2 Deutschland FALSE
+federal research institute for animal health de Europe Western Europe FALSE 4 2021-02-03 199023224 way "Friedrich-Loeffler-Institut Riems, Südufer, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17493, Deutschland" office research 0.001 Deutschland FALSE
+ifr de Europe Western Europe FALSE 4 2021-02-03 73912341 node "Institut für Flugmechanik und Flugregelung, 27, Pfaffenwaldring, Pfaffenwald, Vaihingen, Stuttgart, Baden-Württemberg, 70569, Deutschland" office yes 0.001 Deutschland FALSE
+ihme de Europe Western Europe FALSE 4 2021-02-03 257378365 relation "Ihme, Hannover, Region Hannover, Niedersachsen, 30449, Deutschland" waterway river 0.405003945962319 Deutschland FALSE
+karlsruhe institute of technology de Europe Western Europe FALSE 4 2021-02-03 258575634 relation "Karlsruher Institut für Technologie, Ehingen (Donau), Gemeindeverwaltungsverband Ehingen (Donau), Alb-Donau-Kreis, Baden-Württemberg, 89584, Deutschland" amenity university 0.611397516611859 Deutschland FALSE
+max planck institute for infection biology de Europe Western Europe FALSE 4 2021-02-03 53762784 node "Max-Planck-Institut für Infektionsbiologie, 12, Virchowweg, Mitte, Berlin, 10117, Deutschland" office research 0.505872022275768 Deutschland FALSE
+sfi de Europe Western Europe FALSE 4 2021-02-03 174161539 way "Laserzentrum, Fröhden, Jüterbog, Teltow-Fläming, Brandenburg, 14913, Deutschland" landuse commercial 0.2 Deutschland FALSE
+thales alenia space de Europe Western Europe FALSE 4 2021-02-03 121548045 way "Thales Alenia Space, Ditzingen, Landkreis Ludwigsburg, Baden-Württemberg, 71254, Deutschland" landuse commercial 0.747092386151836 Deutschland FALSE
+university of bremen de Europe Western Europe FALSE 4 2021-02-03 258700328 relation "Universität Bremen, 1, Bibliothekstraße, Lehe, Horn-Lehe, Stadtbezirk Bremen-Ost, Bremen, 28359, Deutschland" amenity university 0.587526066641517 Deutschland FALSE
+university of cologne de Europe Western Europe FALSE 4 2021-02-03 259569292 relation "Universität zu Köln, Albertus-Magnus-Platz, Lindenthal, Köln, Nordrhein-Westfalen, 50931, Deutschland" amenity university 0.559121890158648 Deutschland FALSE
+university of göttingen de Europe Western Europe FALSE 4 2021-02-03 101743013 way "Mathematische Fakultät, 3-5, Bunsenstraße, Südstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland" building university 0.101 Deutschland FALSE
+us army de Europe Western Europe FALSE 4 2021-02-03 104158774 way "US Army, Finthen, Layenhof, Mainz, Rheinland-Pfalz, 55126, Deutschland" landuse military 0.4 Deutschland FALSE
+academy of sciences cn Asia Eastern Asia FALSE 4 2021-02-03 52408051 node "科å¦é™¢ç«™, 天æº<90>è·¯, 龙洞街é<81>“, 天河区, 广州市, 广东çœ<81>, 510650, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+center for disease control and prevention cn Asia Eastern Asia FALSE 4 2021-02-03 41562327 node "疾控ä¸å¿ƒ, 工农å<8d>—è·¯, 文峰街é<81>“, å´‡å·<9d>区, å<8d>—通市, 226000, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+china food and drug administration cn Asia Eastern Asia FALSE 4 2021-02-03 60378418 node "柳州市食å“<81>è<8d>¯å“<81>监ç<9d>£ç®¡ç<90>†å±€, 海关路西一巷, æ¡‚ä¸ç¤¾åŒº, 城ä¸åŒº, 柳州市, 广西壮æ—<8f>自治区, 545006, ä¸å›½" office government 0.001 ä¸å›½ FALSE
+institute of high energy physics cn Asia Eastern Asia FALSE 4 2021-02-03 160099538 way "ä¸å›½ç§‘å¦é™¢é«˜èƒ½ç‰©ç<90>†ç ”究所, 19å<8f>·ä¹™, 玉泉路, ç”°æ<9d>‘, 海淀区, 北京市, 100049, ä¸å›½" amenity research_institute 0.001 ä¸å›½ FALSE
+life technologies cn Asia Eastern Asia FALSE 4 2021-02-03 54415927 node "Just Life restaurant, å<9d>‚雪岗大é<81>“ BÇŽnxuÄ› GÇŽng Av, å<8d>Žä¸ºæŠ€æœ¯æœ‰é™<90>å…¬å<8f>¸, 龙岗区, 深圳市, 广东çœ<81>, 518100, ä¸å›½" tourism attraction 0.101 ä¸å›½ FALSE
+national space science center cn Asia Eastern Asia FALSE 4 2021-02-03 48238029 node "ä¸å›½ç§‘å¦é™¢å›½å®¶ç©ºé—´ç§‘å¦ä¸å¿ƒ, 1, ä¸å…³æ<9d>‘å<8d>—四街, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" office research 0.001 ä¸å›½ FALSE
+peking union medical college cn Asia Eastern Asia FALSE 4 2021-02-03 190689755 way "北京å<8d><8f>和医院, 1, 帅府å›èƒ¡å<90>Œ, 东城区, 北京市, 100010, ä¸å›½" amenity hospital 0.312408728172101 ä¸å›½ FALSE
+people's liberation army cn Asia Eastern Asia FALSE 4 2021-02-03 113303197 way "ä¸åœ‹äººæ°‘解放è»<8d>é§<90>香港部隊大廈 Chinese People's Liberation Army Forces Hong Kong Building, æ·»è<8f>¯é<81>“ Tim Wa Avenue, 金é<90>˜ Admiralty, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" building yes 0.655351334110971 ä¸å›½ FALSE
+qinghai cn Asia Eastern Asia FALSE 4 2021-02-03 257865875 relation "é<9d>’æµ·çœ<81>, ä¸å›½" boundary administrative 0.610517291768724 ä¸å›½ FALSE
+south china agricultural university cn Asia Eastern Asia FALSE 4 2021-02-03 259059311 relation "å<8d>Žå<8d>—农业大å¦, 金钟山路, å<8d>Žå<8d>—ç<90>†å·¥å¤§å¦å<8d>—æ–°æ<9d>‘, 五山街é<81>“, 天河区, 广州市, 广东çœ<81>, 510630, ä¸å›½" amenity university 0.398715419165327 ä¸å›½ FALSE
+tgo cn Asia Eastern Asia FALSE 4 2021-02-03 124970678 way "通辽机场, G111, 育新镇, 科尔æ²<81>区, 通辽市, 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½" aeroway aerodrome 0.425184329336588 ä¸å›½ FALSE
+tongji university cn Asia Eastern Asia FALSE 4 2021-02-03 95605064 way "å<90>ŒæµŽå¤§å¦, 1239, 四平路, æ<9d>¨æµ¦åŒº, 200092, ä¸å›½" amenity university 0.469803068930215 ä¸å›½ FALSE
+university of nottingham ningbo china cn Asia Eastern Asia FALSE 4 2021-02-03 148245237 way "å®<81>波诺ä¸<81>汉大å¦, 199, 康泰ä¸è·¯, 首å<8d>—è¡—é<81>“, 鄞州区, å®<81>波市, 浙江çœ<81>, 315100, ä¸å›½" amenity university 0.368648909480289 ä¸å›½ FALSE
+wuhan university of technology cn Asia Eastern Asia FALSE 4 2021-02-03 130531770 way "æ¦æ±‰ç<90>†å·¥å¤§å¦ä½™å®¶å¤´æ ¡åŒº, ç<90>†å·¥äºŒæ¡¥, æ<9d>¨å›è¡—é<81>“, æ¦æ˜ŒåŒº, 湖北çœ<81>, 430080, ä¸å›½" amenity university 0.411679724670082 ä¸å›½ FALSE
+xinhua cn Asia Eastern Asia FALSE 4 2021-02-03 258772903 relation "新化县, 娄底市, æ¹–å<8d>—çœ<81>, 417625, ä¸å›½" boundary administrative 0.490764246652934 ä¸å›½ FALSE
+cerro tololo inter-american observatory cl Americas South America FALSE 4 2021-02-03 122415298 way "Cerro Tololo Inter American Observatory, Vicuña, Provincia de Elqui, Región de Coquimbo, Chile" landuse observatory 0.7 Chile FALSE
+côte d'ivoire ci Africa Western Africa FALSE 4 2021-02-03 257869389 relation Côte d’Ivoire boundary administrative 1.00385204918839 Côte d’Ivoire FALSE
+international telecommunication union ch Europe Western Europe FALSE 4 2021-02-03 109351662 way "Union Internationale des Télécommunications (UIT), Place des Nations, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building yes 0.433228686818865 Schweiz/Suisse/Svizzera/Svizra FALSE
+world economic forum ch Europe Western Europe FALSE 4 2021-02-03 49134466 node "World Economic Forum, 91, Route de la Capite, Ruth, Cologny, Genève, 1253, Schweiz/Suisse/Svizzera/Svizra" office foundation 0.301 Schweiz/Suisse/Svizzera/Svizra FALSE
+bc ca Americas Northern America FALSE 4 2021-02-03 258447774 relation "British Columbia, Canada" boundary administrative 0.71215515233974 Canada FALSE
+icao ca Americas Northern America FALSE 4 2021-02-03 114910153 way "Organisation de l'Aviation Civile Internationale, 999, Boulevard Robert-Bourassa, René-Lévesque, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3C 5H7, Canada" office international_organization 0.001 Canada FALSE
+nova scotia ca Americas Northern America FALSE 4 2021-02-03 257999774 relation "Nova Scotia, Canada" boundary administrative 0.864078179426287 Canada FALSE
+oxford university ca Americas Northern America FALSE 4 2021-02-03 98502897 way "Cumberland Terrace, 820, Yonge Street, Yorkville, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M4W 2G8, Canada" shop mall 0.317338060184506 Canada FALSE
+trent university ca Americas Northern America FALSE 4 2021-02-03 239067020 way "Trent University, 1600, West Bank Drive, Peterborough, Central Ontario, Ontario, K9J 6X5, Canada" amenity university 0.629853869659265 Canada FALSE
+belize bz Americas Central America FALSE 4 2021-02-03 258422412 relation Belize boundary administrative 0.760897982846959 Belize FALSE
+bahamas bs Americas Caribbean FALSE 4 2021-02-03 258050699 relation The Bahamas boundary administrative 0.774909342902589 The Bahamas FALSE
+minas gerais br Americas South America FALSE 4 2021-02-03 258409868 relation "Minas Gerais, Região Sudeste, Brasil" boundary administrative 0.869760787811772 Brasil FALSE
+university of campinas br Americas South America FALSE 4 2021-02-03 56537260 node "Universidade de São José, 97, Rua SÃlvia Maria Fabro, Kobrasol, Campinas, São José, Região Geográfica Imediata de Florianópolis, Região Geográfica Intermediária de Florianópolis, Santa Catarina, Região Sul, 88102-130, Brasil" amenity university 0.101 Brasil FALSE
+antarctic division au Oceania Australia and New Zealand FALSE 4 2021-02-03 101676576 way "Australian Antarctic Division, Kingston, Hobart, Kingborough, Tasmania, Australia" landuse commercial 0.4 Australia FALSE
+bond university au Oceania Australia and New Zealand FALSE 4 2021-02-03 2922698 node "Bond University, University Drive, Robina, Gold Coast City, Queensland, 4227, Australia" highway bus_stop 0.201 Australia FALSE
+centre for medical research and innovation au Oceania Australia and New Zealand FALSE 4 2021-02-03 151744793 way "Centre for Medical Research, Royal Parade, Melbourne Innovation District, Parkville, Melbourne, City of Melbourne, Victoria, 3000, Australia" building yes 0.501 Australia FALSE
+griffith university au Oceania Australia and New Zealand FALSE 4 2021-02-03 226907634 way "Griffith University, South East Busway, Mount Gravatt, Brisbane City, Queensland, 4121, Australia" amenity bus_station 0.201 Australia FALSE
+national space council au Oceania Australia and New Zealand FALSE 4 2021-02-03 300387881 way "Rend-a-space, Marsden Park, Sydney, Blacktown City Council, New South Wales, 2765, Australia" landuse commercial 0.4 Australia FALSE
+sirius au Oceania Australia and New Zealand FALSE 4 2021-02-03 209425686 way "Sirius, 36-50, Cumberland Street, Dawes Point, Sydney, Council of the City of Sydney, New South Wales, 2000, Australia" building apartments 0.358218474293395 Australia FALSE
+university of south australia au Oceania Australia and New Zealand FALSE 4 2021-02-03 44559024 node "University of South Australia, Wireless Road West, Suttontown, Mount Gambier, City of Mount Gambier, South Australia, 5290, Australia" building university 0.401 Australia FALSE
+bec at Europe Western Europe FALSE 4 2021-02-03 258128656 relation "Wien, Österreich" boundary administrative 0.769412325825045 Österreich FALSE
+armenia am Asia Western Asia FALSE 4 2021-02-03 257747794 relation Õ€Õ¡ÕµÕ¡Õ½Õ¿Õ¡Õ¶ boundary administrative 0.731601485333362 Õ€Õ¡ÕµÕ¡Õ½Õ¿Õ¡Õ¶ FALSE
+dfid zm Africa Eastern Africa FALSE 3 2021-02-03 57737308 node "Department for International Development (DFID), Independence Avenue, Ridgeway, Lusaka, Lusaka District, Lusaka Province, 10101, Zambia" office government 0.101 Zambia FALSE
+south african astronomical observatory za Africa Southern Africa FALSE 3 2021-02-03 149374012 way "South African Astronomical Observatory, Observatory, Cape Town Ward 57, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" landuse observatory 0.6 South Africa FALSE
+university of johannesburg za Africa Southern Africa FALSE 3 2021-02-03 112776222 way "University of Johannesburg, Kingsway Avenue, Rossmore, Johannesburg Ward 69, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" amenity university 0.301 South Africa FALSE
+nsb ye Asia Western Asia FALSE 3 2021-02-03 12427666 node "نصب, مديرية ميدي, Ù…ØاÙ<81>ظة Øجة, اليمن" place island 0.325 اليمن FALSE
+uzbekistan uz Asia Central Asia FALSE 3 2021-02-03 257555259 relation Oʻzbekiston boundary administrative 0.709755684022544 Oʻzbekiston FALSE
+aamc us Americas Northern America FALSE 3 2021-02-03 113401404 way "Anne Arundel Medical Center, 2001, Medical Parkway, Bestgate Terrace, Annapolis, Anne Arundel County, Maryland, 21401, United States" amenity hospital 0.271596680569804 United States FALSE
+academy us Americas Northern America FALSE 3 2021-02-03 259255631 relation "Academy, City of Saint Louis, Missouri, United States" boundary administrative 0.386244954737813 United States FALSE
+accuweather us Americas Northern America FALSE 3 2021-02-03 177586041 way "AccuWeather, 385, Science Park Road, Science Park, State College, Centre County, Pennsylvania, 16803, United States" office company 0.101 United States FALSE
+american association us Americas Northern America FALSE 3 2021-02-03 165272985 way "Japanese American Citizens League, 12937, Cortez Avenue, Cortez Growers Association, Turlock, Merced County, California, 95380, United States" building public 0.201 United States FALSE
+american medical association us Americas Northern America FALSE 3 2021-02-03 124480513 way "American Medical Association, 515, North State Street, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States" building office 0.301 United States FALSE
+american meteorological society us Americas Northern America FALSE 3 2021-02-03 80718663 node "American Meteorological Society, 45, Beacon Street, Downtown Crossing, Beacon Hill, Boston, Suffolk County, Massachusetts, 02108, United States" office association 0.301 United States FALSE
+animal and plant health inspection service us Americas Northern America FALSE 3 2021-02-03 27351108 node "Animal & Plant Health Inspection Service, Concourse Drive, Thornecrest, Roanoke County, Virginia, 24017, United States" office government 0.501 United States FALSE
+appalachian state university us Americas Northern America FALSE 3 2021-02-03 202064702 way "Appalachian State University, Blowing Rock Road, Downtown, Boone, Watauga County, North Carolina, 28607, United States" amenity university 0.739395713780889 United States FALSE
+arianespace us Americas Northern America FALSE 3 2021-02-03 79847733 node "Arianespace, Inc., 5335, Wisconsin Avenue Northwest, Friendship Heights, Washington, District of Columbia, 20007, United States" office company 0.101 United States FALSE
+army corps of engineers us Americas Northern America FALSE 3 2021-02-03 184369940 way "Army Corps of Engineers, Fort Street, Norfolk Redevelopment and Housing Authority, Norfolk, Virginia, 23510, United States" building garage 0.401 United States FALSE
+associated press us Americas Northern America FALSE 3 2021-02-03 152093424 way "Associated Press, 1299, Broadway, Bushwick, Brooklyn, Kings County, New York, 11221, United States" shop supermarket 0.201 United States FALSE
+auburn university us Americas Northern America FALSE 3 2021-02-03 259125839 relation "Auburn University, Lem Morrison Drive, Woodfield, Auburn, Lee County, Alabama, 36849, United States" amenity university 0.726936083135026 United States FALSE
+bell laboratories us Americas Northern America FALSE 3 2021-02-03 18501662 node "Bell Laboratories, Berkeley Heights, Union County, New Jersey, 07974, United States" place locality 0.325 United States FALSE
+cabell us Americas Northern America FALSE 3 2021-02-03 399746 node "Cabell, Wayne County, Kentucky, United States" place hamlet 0.35 United States FALSE
+caltech submillimeter observatory us Americas Northern America FALSE 3 2021-02-03 103887235 way "Caltech Submillimeter Observatory, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made observatory 0.662945678183792 United States FALSE
+cambridge university us Americas Northern America FALSE 3 2021-02-03 95023289 way "Cambridge Drive, University Park, Markham, Bremen Township, Cook County, Illinois, 60428, United States" highway residential 0.3 United States FALSE
+carnegie institution us Americas Northern America FALSE 3 2021-02-03 106777669 way "Carnegie Institution Building, 1530, P Street Northwest, Logan Circle/Shaw, Dupont Circle, Washington, District of Columbia, 2005, United States" building yes 0.374617736328324 United States FALSE
+cascades volcano observatory us Americas Northern America FALSE 3 2021-02-03 3002655 node "David A Johnston Cascades Volcano Observatory, Southeast Tech Center Drive, Columbia Tech Center, Vancouver, Clark County, Washington, 98683, United States" building yes 0.301 United States FALSE
+cedars-sinai medical center us Americas Northern America FALSE 3 2021-02-03 205008828 way "Cedars-Sinai Medical Center, 8700, Beverly Boulevard, Beverly Grove, Los Angeles, Los Angeles County, California, 90048, United States" amenity hospital 0.820535495325755 United States FALSE
+centre for research us Americas Northern America FALSE 3 2021-02-03 100783959 way "National Center for Atmospheric Research Mesa Lab, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" building government 0.591849073716688 United States FALSE
+chimp haven us Americas Northern America FALSE 3 2021-02-03 23953062 node "Chimp Haven, 13600, Caddo Drive, Caddo Parish, Louisiana, 71047, United States" tourism zoo 0.398387040368712 United States FALSE
+city college of new york us Americas Northern America FALSE 3 2021-02-03 115546934 way "The City College of New York, 160, Convent Avenue, Sugar Hill, Manhattan Community Board 9, Manhattan, New York County, New York, 10031, United States" amenity university 1.01231196067725 United States FALSE
+cleveland museum of natural history us Americas Northern America FALSE 3 2021-02-03 258196323 relation "Cleveland Museum of Natural History, 1, Wade Oval Drive, Magnolia-Wade Park Historic District, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States" tourism museum 0.839306791900516 United States FALSE
+cornell university library us Americas Northern America FALSE 3 2021-02-03 259012417 relation "Johnson Museum of Art, 114, Central Avenue, Ithaca, Ithaca Town, Tompkins County, New York, 14853, United States" tourism museum 0.378680902821112 United States FALSE
+cowen us Americas Northern America FALSE 3 2021-02-03 258460482 relation "Cowen, Webster County, West Virginia, 26206, United States" boundary administrative 0.453558714867367 United States FALSE
+creative commons us Americas Northern America FALSE 3 2021-02-03 2584381 node "Creative Learning Center School, Avenue of the Commons, Shrewsbury, Monmouth County, New Jersey, 07702, United States" amenity school 0.201 United States FALSE
+department of space us Americas Northern America FALSE 3 2021-02-03 2969423 node "Houston Fire Department Station 71, Space Center Boulevard, Houston, Harris County, Texas, 77058, United States" amenity fire_station 0.201 United States FALSE
+donald danforth plant science center us Americas Northern America FALSE 3 2021-02-03 257849720 way "Donald Danforth Plant Science Center, 975, North Warson Road, Olivette, Saint Louis County, Missouri, 63131, United States" office research 0.501 United States FALSE
+drexel university us Americas Northern America FALSE 3 2021-02-03 104178294 way "Drexel University, West Bank Greenway, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19104-2892, United States" amenity university 0.682066632905469 United States FALSE
+earth institute us Americas Northern America FALSE 3 2021-02-03 197272744 way "Southwestern College & New Earth Institute, 3960, San Felipe Road, Santa Fe, Santa Fe County, New Mexico, 87507, United States" amenity college 0.366903631515068 United States FALSE
+earth system research laboratory us Americas Northern America FALSE 3 2021-02-03 153944153 way "NOAA - Earth System Research Laboratory, 325, Broadway, Boulder, Boulder County, Colorado, 80305, United States" office government 0.401 United States FALSE
+eli lilly of indianapolis us Americas Northern America FALSE 3 2021-02-03 149502343 way "Eli Lilly Aviation, 2800, South High School Road, Indianapolis, Indiana, 46241, United States" aeroway hangar 0.301 United States FALSE
+emory us Americas Northern America FALSE 3 2021-02-03 259132524 relation "Emory, Rains County, Texas, United States" boundary administrative 0.565817363739394 United States FALSE
+environmental science & technology us Americas Northern America FALSE 3 2021-02-03 136610917 way "Environmental Education, Science & Technology (ENV SCI), 1704, West Mulberry Street, Denton, Denton County, Texas, 76201, United States" building university 0.301 United States FALSE
+exelon us Americas Northern America FALSE 3 2021-02-03 158115010 way "Exelon, Winfield Road, Warrenville, DuPage County, Illinois, 60563, United States" office company 0.101 United States FALSE
+exxon us Americas Northern America FALSE 3 2021-02-03 101855069 way "Exxon, Flower Mound, Denton County, Texas, United States" landuse retail 0.3 United States FALSE
+exxon mobil us Americas Northern America FALSE 3 2021-02-03 242205522 way "Exxon Mobil, Helena, Lewis and Clark County, Montana, United States" landuse industrial 0.4 United States FALSE
+florida atlantic university us Americas Northern America FALSE 3 2021-02-03 259120576 relation "Florida Atlantic University, 111, East Las Olas Boulevard, Fort Lauderdale, Broward County, Florida, 33301, United States" building yes 0.301 United States FALSE
+florida institute of technology us Americas Northern America FALSE 3 2021-02-03 159357166 way "Florida Institute of Technology, East Ashley Court, Melbourne, Brevard County, Florida, 32901, United States" amenity university 0.401 United States FALSE
+fordham university us Americas Northern America FALSE 3 2021-02-03 59136214 node "Fordham University, East Fordham Road, The Bronx, Bronx County, New York, 10458, United States" tourism information 0.201 United States FALSE
+foundation us Americas Northern America FALSE 3 2021-02-03 49534292 node "Foundation, Monahans, Ward County, Texas, 79756, United States" place neighbourhood 0.35 United States FALSE
+foundation for biomedical research us Americas Northern America FALSE 3 2021-02-03 2988264 node "Worcester Foundation for Biomedical Research, 222, Maple Avenue, Fairlawn, Shrewsbury, Worcester County, Massachusetts, 01545, United States" building yes 0.401 United States FALSE
+fox news us Americas Northern America FALSE 3 2021-02-03 64775737 node "Fox News, Terminal C, Grapevine, Tarrant County, Texas, 75261, United States" shop convenience 0.201 United States FALSE
+goldman us Americas Northern America FALSE 3 2021-02-03 386477 node "Goldman, Jefferson County, Missouri, United States" place hamlet 0.370074815609084 United States FALSE
+grinnell college us Americas Northern America FALSE 3 2021-02-03 97140884 way "Grinnell College, 1115, 8th Avenue, Grinnell, Poweshiek County, Iowa, 50112, United States" amenity university 0.634194405720176 United States FALSE
+guam us Americas Northern America FALSE 3 2021-02-03 258022039 relation "Guam, Santa Rita Municipality, Guam, United States" place island 0.789784943797409 United States FALSE
+harvard law school us Americas Northern America FALSE 3 2021-02-03 2990245 node "Harvard Law School Library, 1545, Massachusetts Avenue, Old Cambridge, Cambridge, Middlesex County, Massachusetts, 02138-2903, United States" amenity library 0.301 United States FALSE
+heart association us Americas Northern America FALSE 3 2021-02-03 167716675 way "Sacred Heart Church Hall, South Military Street, Morley Area Residents Association, Dearborn, Wayne County, Michigan, 481241, United States" amenity place_of_worship 0.201 United States FALSE
+homestake us Americas Northern America FALSE 3 2021-02-03 337921 node "Homestake, Jefferson County, Montana, United States" place hamlet 0.35 United States FALSE
+hubble us Americas Northern America FALSE 3 2021-02-03 417215 node "Hubble, Lincoln County, Kentucky, United States" place hamlet 0.307534521399027 United States FALSE
+hunter college us Americas Northern America FALSE 3 2021-02-03 113732474 way "Hunter College, 695, Park Avenue, Carnegie Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity college 0.682460766298975 United States FALSE
+incorporated research institutions for seismology us Americas Northern America FALSE 3 2021-02-03 127043663 way "IRIS PASSCAL Offices, South Road, Socorro, Socorro County, New Mexico, 87801, United States" office research 0.001 United States FALSE
+institute for astronomy us Americas Northern America FALSE 3 2021-02-03 253393324 way "Institute for Astronomy, 2680, Woodlawn Drive, Manoa, Honolulu, Honolulu County, Hawaii, 96813, United States" amenity university 0.691312669988132 United States FALSE
+institute for systems biology us Americas Northern America FALSE 3 2021-02-03 73935850 node "Institute for Systems Biology, 401, Terry Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109-5210, United States" office association 0.401 United States FALSE
+institute of international education us Americas Northern America FALSE 3 2021-02-03 2555719 node "Institute of International Education, 809, 1st Avenue, Tudor City, Manhattan Community Board 6, Manhattan, New York County, New York, 10017, United States" place house 0.401 United States FALSE
+international development research centre us Americas Northern America FALSE 3 2021-02-03 8421794 node "Office Of International Research & Development, 840, University City Boulevard, Longview Estates, McBryde Village, Blacksburg, Montgomery County, Virginia, 24060, United States" place house 0.301 United States FALSE
+las cumbres observatory us Americas Northern America FALSE 3 2021-02-03 81379623 node "Las Cumbres Observatory, Skyline Trail, Maui County, Hawaii, United States" man_made observatory 0.50962395537125 United States FALSE
+lick observatory us Americas Northern America FALSE 3 2021-02-03 251428619 way "Lick Observatory, Mount Hamilton Road, Santa Clara County, California, 95140, United States" leisure nature_reserve 0.201 United States FALSE
+lloyd us Americas Northern America FALSE 3 2021-02-03 506446 node "Lloyd, Town of Lloyd, Ulster County, New York, 12528, United States" place town 0.4 United States FALSE
+mauna kea us Americas Northern America FALSE 3 2021-02-03 21157190 node "Mauna Kea, Hawaiʻi County, Hawaii, United States" natural volcano 0.69306006360707 United States FALSE
+mcdonald us Americas Northern America FALSE 3 2021-02-03 258498766 relation "McDonald County, Missouri, United States" boundary administrative 0.61392452822884 United States FALSE
+medical university of south carolina us Americas Northern America FALSE 3 2021-02-03 258977557 relation "The Medical University of South Carolina, 171, Gadsden Green Homes, Charleston, Charleston County, South Carolina, 29425, United States" leisure park 0.862086077089553 United States FALSE
+medline us Americas Northern America FALSE 3 2021-02-03 207638209 way "Medline, 1900, Meadowville Technology Parkway, Meadowville, Chesterfield County, Virginia, 23836, United States" building yes 0.101 United States FALSE
+multidisciplinary association for psychedelic studies us Americas Northern America FALSE 3 2021-02-03 45297575 node "Multidisciplinary Association for Psychedelic Studies (MAPS), Mission Street, Mission Street Commercial Corridor, Westside, Santa Cruz, Santa Cruz County, California, 95060, United States" office financial 0.501 United States FALSE
+national audubon society us Americas Northern America FALSE 3 2021-02-03 227896739 way "Audubon Society, Sky Londa, San Mateo County, California, United States" boundary protected_area 0.325 United States FALSE
+national ignition facility us Americas Northern America FALSE 3 2021-02-03 145115666 way "National Ignition Facility, Greenville Road, Livermore, Alameda County, California, United States" building yes 0.71403442187005 United States FALSE
+navy us Americas Northern America FALSE 3 2021-02-03 471848 node "Navy, Fairfax County, Virginia, 22033, United States" place hamlet 0.35 United States FALSE
+northern arizona university us Americas Northern America FALSE 3 2021-02-03 138822770 way "Northern Arizona University, South Beaver Street, Flagstaff Normal Addition, Flagstaff, Coconino County, Arizona, 86001, United States" amenity university 0.751100009026849 United States FALSE
+northrop us Americas Northern America FALSE 3 2021-02-03 258364217 relation "Northrop, Martin County, Minnesota, 56075, United States" boundary administrative 0.527022409876486 United States FALSE
+novartis institutes for biomedical research us Americas Northern America FALSE 3 2021-02-03 133694482 way "Novartis Institutes for Biomedical Research, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" landuse commercial 0.7 United States FALSE
+office of management and budget us Americas Northern America FALSE 3 2021-02-03 152300809 way "Office of Management and Budget, 254, Calle Cruz, La Perla, San Juan Antiguo, San Juan, Puerto Rico, 00901, United States" office government 0.501 United States FALSE
+ogle us Americas Northern America FALSE 3 2021-02-03 258064016 relation "Ogle County, Illinois, United States" boundary administrative 0.619540947885713 United States FALSE
+oklahoma medical research foundation us Americas Northern America FALSE 3 2021-02-03 133234335 way "Oklahoma Medical Research Foundation, Northeast 15th Street, Howes Capitol, Oklahoma City, Oklahoma County, Oklahoma, 73104, United States" amenity social_facility 0.401 United States FALSE
+orbital atk us Americas Northern America FALSE 3 2021-02-03 121003549 way "Orbital ATK - Allegany Ballistics Laboratory, Bier, Allegany County, Maryland, United States" landuse area 0.405371759161912 United States FALSE
+palomar observatory us Americas Northern America FALSE 3 2021-02-03 61117750 node "Palomar Observatory, Canfield Road, San Diego County, California, 92060, United States" tourism attraction 0.816929691572276 United States FALSE
+pennsylvania state university in state college us Americas Northern America FALSE 3 2021-02-03 147721263 way "Air Quality Learning and Demonstration Center, Air Quality Lane, Ferguson Township, Centre County, Pennsylvania, 16803, United States" tourism attraction 0.401 United States FALSE
+people for the ethical treatment of animals us Americas Northern America FALSE 3 2021-02-03 251457165 way "People for the Ethical Treatment of Animals, Front Street, Norfolk, Virginia, 23510, United States" amenity social_facility 0.701 United States FALSE
+rsc us Americas Northern America FALSE 3 2021-02-03 122940481 way "RSC, Chambers Avenue, Eagle, Eagle County, Colorado, 81631, United States" building yes 0.101 United States FALSE
+san council us Americas Northern America FALSE 3 2021-02-03 93735273 way "The South Council, Plantation Heights, York County, Virginia, 23185, United States" highway residential 0.2 United States FALSE
+san diego zoo us Americas Northern America FALSE 3 2021-02-03 98616149 way "San Diego Zoo, 2920, Zoo Drive, Hillcrest, San Diego, San Diego County, California, 92103-3607, United States" tourism zoo 0.736514462001523 United States FALSE
+sanford burnham prebys medical discovery institute us Americas Northern America FALSE 3 2021-02-03 2879170 node "Sanford Burnham Prebys Medical Discovery Institute, N Coast Highway, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States" office research 0.601 United States FALSE
+scientific research us Americas Northern America FALSE 3 2021-02-03 220155051 way "Thermo Fisher Scientific, 5781, Van Allen Way, Carlsbad Research Center, Carlsbad, San Diego County, California, 92011, United States" building industrial 0.201 United States FALSE
+smithsonian environmental research center us Americas Northern America FALSE 3 2021-02-03 258721015 relation "Smithsonian Environmental Research Center, Anne Arundel County, Maryland, United States" boundary protected_area 0.702323854176492 United States FALSE
+southern company us Americas Northern America FALSE 3 2021-02-03 156893714 way "Southern Company, 30, Ivan Allen Jr Boulevard, Atlanta, Fulton County, Georgia, 30313, United States" building commercial 0.201 United States FALSE
+spirit us Americas Northern America FALSE 3 2021-02-03 373450 node "Spirit, Town of Spirit, Price County, Wisconsin, United States" place village 0.36851441835616 United States FALSE
+sta us Americas Northern America FALSE 3 2021-02-03 257939822 relation "Stark County, Ohio, United States" boundary administrative 0.622815857577427 United States FALSE
+state department us Americas Northern America FALSE 3 2021-02-03 69248957 node "C Street & 20th Street Northwest (State Department), C Street Northwest, Washington, District of Columbia, 20037, United States" highway bus_stop 0.201 United States FALSE
+tcm us Americas Northern America FALSE 3 2021-02-03 231854259 way "McChord Field, E Street, Oakswest Apartments, Pierce County, Washington, 98438, United States" aeroway aerodrome 0.001 United States FALSE
+texas a&m university us Americas Northern America FALSE 3 2021-02-03 259129741 relation "Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States" amenity university 1.05527727305854 United States FALSE
+texas state university us Americas Northern America FALSE 3 2021-02-03 297522715 relation "Texas State University, 601, University Drive, San Marcos, Texas, 78666, United States" amenity university 0.731950990386221 United States FALSE
+united states geological survey us Americas Northern America FALSE 3 2021-02-03 83553443 node "United States Geological Survey, 1849, C Street Northwest, Washington, District of Columbia, 20240, United States" office government 1.13534289613778 United States FALSE
+university of california at davis us Americas Northern America FALSE 3 2021-02-03 258689332 relation "University of California, Davis, Russell Boulevard, Davis, Yolo County, California, 95616, United States" amenity university 0.501 United States FALSE
+university of california in berkeley us Americas Northern America FALSE 3 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.0481943782617 United States FALSE
+university of california in davis us Americas Northern America FALSE 3 2021-02-03 258689332 relation "University of California, Davis, Russell Boulevard, Davis, Yolo County, California, 95616, United States" amenity university 0.401 United States FALSE
+university of california in santa barbara us Americas Northern America FALSE 3 2021-02-03 205319990 way "University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States" place locality 0.625 United States FALSE
+university of florence us Americas Northern America FALSE 3 2021-02-03 258686921 relation "Creighton University, North 19th Street, Omaha, Douglas County, Nebraska, 68110, United States" amenity university 0.558770852912237 United States FALSE
+university of idaho us Americas Northern America FALSE 3 2021-02-03 151457830 way "University of Idaho, South Main Street, Moscow, Latah County, Idaho, 83843, United States" amenity university 0.773119489546607 United States FALSE
+university of louisville us Americas Northern America FALSE 3 2021-02-03 259182645 relation "University of Louisville, East Brandeis Avenue, Louisville, Jefferson County, Kentucky, 40217, United States" amenity university 0.820740059627089 United States FALSE
+university of massachusetts lowell us Americas Northern America FALSE 3 2021-02-03 259071002 relation "University of Massachusetts Lowell, Central Street, The Acre, Lowell, Middlesex County, Massachusetts, 01852-9998, United States" amenity university 0.812219348874805 United States FALSE
+university of nebraska us Americas Northern America FALSE 3 2021-02-03 150693073 way "University of Nebraska, Lincoln - Practice Field, Avery Avenue, North Bottoms, Haymarket, Lincoln, Lancaster County, Nebraska, 68588, United States" leisure pitch 0.301 United States FALSE
+university of southern mississippi us Americas Northern America FALSE 3 2021-02-03 258509104 relation "University of Southern Mississippi, 118, College Drive, Hattiesburg, Forrest County, Mississippi, 39406, United States" amenity university 0.839494404593605 United States FALSE
+university of valencia us Americas Northern America FALSE 3 2021-02-03 2809389 node "Loyola University, Valencia Street, Westlake South, Westlake, Los Angeles, Los Angeles County, California, 90057-4101, United States" amenity school 0.565618504568294 United States FALSE
+us drug enforcement administration us Americas Northern America FALSE 3 2021-02-03 56632848 node "US Drug Enforcement Administration, 212, East Washington Avenue, James Madison Park, Madison, Dane County, Wisconsin, 53703, United States" office government 0.910733717290293 United States FALSE
+us national bureau of economic research us Americas Northern America FALSE 3 2021-02-03 97970473 way "National Bureau of Economic Research, 1050, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02138, United States" building yes 1.03403299384431 United States FALSE
+us national center for atmospheric research us Americas Northern America FALSE 3 2021-02-03 47686315 node "NCAR Exhibits, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" tourism museum 0.501 United States FALSE
+us national library of medicine us Americas Northern America FALSE 3 2021-02-03 100564321 way "NLM, 8600, Rockville Pike, Glenbrook, East Bethesda, Bethesda, Montgomery County, Maryland, 20894, United States" amenity library 0.574397490815619 United States FALSE
+us national weather service us Americas Northern America FALSE 3 2021-02-03 226762473 way "National Weather Service, Valley, Douglas County, Nebraska, United States" landuse commercial 0.5 United States FALSE
+utah state university us Americas Northern America FALSE 3 2021-02-03 258918205 relation "Utah State University, Bullen Hall, Logan, Cache County, Utah, 84341, United States" amenity university 0.779183015674592 United States FALSE
+vandenberg air force base us Americas Northern America FALSE 3 2021-02-03 121001923 way "Vandenberg Air Force Base, 13th Street, Vandenberg AFB, Santa Barbara County, California, 93437, United States" aeroway aerodrome 0.885549616017841 United States FALSE
+virginia commonwealth university us Americas Northern America FALSE 3 2021-02-03 151896182 way "Virginia Commonwealth University, South Harrison Street, Oregon Hill, Richmond, Virginia, 23220, United States" amenity university 0.782362468990463 United States FALSE
+wall street journal us Americas Northern America FALSE 3 2021-02-03 147759956 way "Wall Street Journal, 1701, Page Mill Road, Palo Alto, Santa Clara County, California, 94304, United States" building yes 0.301 United States FALSE
+whitehead institute us Americas Northern America FALSE 3 2021-02-03 300475537 way "Whitehead Institute, 455, Main Street, East Cambridge, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02142, United States" building office 0.533532730730458 United States FALSE
+wistar institute us Americas Northern America FALSE 3 2021-02-03 99114832 way "Wistar Institute, 3601, Spruce Street, University City, Philadelphia, Philadelphia County, Pennsylvania, 19104, United States" building university 0.485649467985799 United States FALSE
+working group us Americas Northern America FALSE 3 2021-02-03 52307556 node "Fresenius Kidney Care Working Group, 200, West Pleasant Street, Schlitz Park, Milwaukee, Milwaukee County, Wisconsin, 53212-3942, United States" amenity clinic 0.201 United States FALSE
+xprize foundation us Americas Northern America FALSE 3 2021-02-03 42269322 node "Xprize Foundation, 900, West Slauson Avenue, Fox Hills, Culver City, Los Angeles County, California, 90230-6482, United States" office company 0.201 United States FALSE
+foundation for innovative new diagnostics ug Africa Eastern Africa FALSE 3 2021-02-03 14070822 node "Foundation for Innovative New Diagnostics, Lumumba Avenue, Bat Valley, Wandegeya, Kampala Capital City, Kampala, Central Region, 21706, Uganda" office ngo 0.501 Uganda FALSE
+iavi ug Africa Eastern Africa FALSE 3 2021-02-03 200242272 way "MRC IAVI, Somero Road, Masaka, Central Region, 235, Uganda" building yes 0.101 Uganda FALSE
+malaria consortium ug Africa Eastern Africa FALSE 3 2021-02-03 5536278 node "Malaria Consortium, 25, Upper Naguru East Road, Kabira, Naguru, Kampala Capital City, Kampala, Central Region, 3021, Uganda" office company 0.201 Uganda FALSE
+uganda national council for science and technology ug Africa Eastern Africa FALSE 3 2021-02-03 44520158 node "Uganda National Council for Science and Technology, Plot 6, Kimera Road, Ministers Village, Ntinda, Kampala Capital City, Kampala, Central Region, 6884 KAMPALA, Uganda" office government 0.701 Uganda FALSE
+unaids ug Africa Eastern Africa FALSE 3 2021-02-03 44866079 node "UNAIDS, 60, Prince Charles Drive, Kisementi, Kololo, Kampala Capital City, Kampala, Central Region, 8352, Uganda" office quango 0.101 Uganda FALSE
+uber ua Europe Eastern Europe FALSE 3 2021-02-03 63503463 node "Uber, 3а, ОÑ<81>кара Кольберга вулицÑ<8f>, Цитадель, Галицький район, Львів, ЛьвівÑ<81>ька міÑ<81>ька громада, ЛьвівÑ<81>ький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 79013, Україна" office yes 0.101 Україна FALSE
+national taiwan university tw Asia Eastern Asia FALSE 3 2021-02-03 258571682 relation "國立臺ç<81>£å¤§å¸, 1, ç¾…æ–¯ç¦<8f>路四段, 文盛里, ä¸æ£å<8d>€, 公館, 臺北市, 10617, 臺ç<81>£" amenity university 0.525266971884114 臺ç<81>£ FALSE
+boğaziçi university tr Asia Western Asia FALSE 3 2021-02-03 101946622 way "BoÄŸaziçi Ãœniversitesi Güney YerleÅŸkesi, Amiral Fahri Ergin Sokağı, Rumeli Hisarı Mahallesi, Sarıyer, Ä°stanbul, Marmara Bölgesi, 34470, Türkiye" amenity university 0.5610714966844 Türkiye FALSE
+istanbul university tr Asia Western Asia FALSE 3 2021-02-03 747123 node "İstanbul Üniversitesi, Besim Ömerpaşa Caddesi, Süleymaniye Mahallesi, İstanbul, Fatih, İstanbul, Marmara Bölgesi, 34116, Türkiye" amenity university 0.521226339743682 Türkiye FALSE
+tübitak tr Asia Western Asia FALSE 3 2021-02-03 139775964 way "TÃœBÄ°TAK, 221, Atatürk Bulvarı, Remzi OÄŸuz Arık Mahallesi, Ankara, Çankaya, Ankara, İç Anadolu Bölgesi, 06100, Türkiye" office government 0.001 Türkiye FALSE
+tonga to Oceania Polynesia FALSE 3 2021-02-03 258595415 relation Tonga boundary administrative 0.73797603969758 Tonga FALSE
+thc th Asia South-Eastern Asia FALSE 3 2021-02-03 654670 node "ลพบุรี, ถนน วัดพระธาตุ, ลพบุรี, จังหวัดลพบุรี, 15000, ประเทศไทย" railway station 0.275244632729739 ประเทศไทย FALSE
+food and agriculture organization tg Africa Western Africa FALSE 3 2021-02-03 26752512 node "Food and Agriculture Organization, Avenue de Duisburg, Quartier Administratif, 1er Arrondissement, Lomé, BP: 353, Togo" office ngo 0.401 Togo FALSE
+state forestry administration so Africa Eastern Africa FALSE 3 2021-02-03 14692688 node "Forestry, Burco برعو, توجدير Togdheer, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال" place village 0.375 Soomaaliya الصومال FALSE
+university of bari so Africa Eastern Africa FALSE 3 2021-02-03 245042079 way "East African University, Ugaas Yaasiin Street, Boosaaso بوصاصو, Bossaso بوصاصو, Bariباري, Soomaaliya الصومال" amenity university 0.452344279227432 Soomaaliya الصومال FALSE
+karolinska sk Europe Eastern Europe FALSE 3 2021-02-03 42136560 node "KarolÃnska, KarolÃna, Želiezovce, okres Levice, Nitriansky kraj, Západné Slovensko, Slovensko" place locality 0.125 Slovensko FALSE
+ndp sk Europe Eastern Europe FALSE 3 2021-02-03 176840469 way "NDP, Liptovská Štiavnica, okres Ružomberok, Žilinský kraj, Stredné Slovensko, Slovensko" landuse meadow 0.3 Slovensko FALSE
+nanyang technological university sg Asia South-Eastern Asia FALSE 3 2021-02-03 115958975 way "Nanyang Technological University, Nanyang Green, Western Water Catchment, Southwest, 639667, Singapore" amenity university 0.765073041127411 Singapore FALSE
+european centre for disease prevention and control se Europe Northern Europe FALSE 3 2021-02-03 95487742 way "Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige" office government 0.550936419284163 Sverige FALSE
+royal institute of technology se Europe Northern Europe FALSE 3 2021-02-03 164817375 way "Kungliga Tekniska högskolan, Norrtullstunneln, Ruddammen, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 86, Sverige" amenity university 0.499138790121692 Sverige FALSE
+solomon islands sb Oceania Melanesia FALSE 3 2021-02-03 258291922 relation Solomon Islands boundary administrative 0.848279405728165 Solomon Islands FALSE
+coast guard sa Asia Western Asia FALSE 3 2021-02-03 177944934 way "Coast Guard, السعودية" place islet 0.45 السعودية FALSE
+king abdullah university of science and technology sa Asia Western Asia FALSE 3 2021-02-03 259476065 relation "جامعة الملك عبد الله للعلوم و التقنية, King Abdullah Boulevard, منطقة مكة المكرمة, 23955, السعودية" amenity university 0.57358213360648 السعودية FALSE
+kagra ru Europe Eastern Europe FALSE 3 2021-02-03 300995494 way "Кагра, УдомельÑ<81>кий городÑ<81>кой округ, ТверÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 171870, РоÑ<81>Ñ<81>иÑ<8f>" waterway river 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+moscow state university ru Europe Eastern Europe FALSE 3 2021-02-03 155606811 way "1, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f>" place neighbourhood 0.589514102962792 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+national geographic ru Europe Eastern Europe FALSE 3 2021-02-03 297123845 node "National Geographic, 1 Ñ<81>1, Ð<9d>оводмитровÑ<81>каÑ<8f> улица, БутырÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 127015, РоÑ<81>Ñ<81>иÑ<8f>" shop clothes 0.201 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+frb pt Europe Southern Europe FALSE 3 2021-02-03 20744600 node "Francos Bombeiros, Rua Engenheiro Ferreira Dias, Zona Industrial do Porto, Ramalde, Porto, Ã<81>rea Metropolitana do Porto, Norte, 4250-094, Portugal" highway bus_stop 0.001 Portugal FALSE
+institute of space sciences pt Europe Southern Europe FALSE 3 2021-02-03 76017683 node "Institute of Astrophysics and Space Sciences, Rua das Estrelas, Arrábida, Lordelo do Ouro, Lordelo do Ouro e Massarelos, Porto, Ã<81>rea Metropolitana do Porto, Norte, 4150-762, Portugal" office research 0.401 Portugal FALSE
+university of lisbon pt Europe Southern Europe FALSE 3 2021-02-03 194436086 way "Universidade de Lisboa - Cidade Universitária, Avenida das Forças Armadas, Sete Rios, Avenidas Novas, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1600-121, Portugal" amenity university 0.503005124858326 Portugal FALSE
+cultural organization ps Asia Western Asia FALSE 3 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 0.908162869304848 Palestinian Territory FALSE
+kpmg pl Europe Eastern Europe FALSE 3 2021-02-03 67019231 node "KPMG, 4A, Inflancka, Osiedle Prezydenckie, Muranów, Śródmieście, Warszawa, województwo mazowieckie, 00-189, Polska" place house 0.101 Polska FALSE
+national museum pl Europe Eastern Europe FALSE 3 2021-02-03 258352211 relation "Muzeum Narodowe, 3, Aleje Jerozolimskie, Śródmieście Południowe, Śródmieście, Warszawa, województwo mazowieckie, 00-495, Polska" tourism museum 0.490290314647502 Polska FALSE
+the lancet pl Europe Eastern Europe FALSE 3 2021-02-03 45795901 node "Lancet, 1a, KoÅ›cielna, BaÅ‚uty-DoÅ‚y, Å<81>ódź-BaÅ‚uty, Å<81>ódź, województwo łódzkie, 91-444, Polska" amenity veterinary 0.101 Polska FALSE
+vib pl Europe Eastern Europe FALSE 3 2021-02-03 255571885 way "VIB, BaÅ‚uty-DoÅ‚y, Å<81>ódź-BaÅ‚uty, Å<81>ódź, województwo łódzkie, Polska" landuse cemetery 0.3 Polska FALSE
+cabinet ph Asia South-Eastern Asia FALSE 3 2021-02-03 76081873 node "Cabinet, Agusan del Norte, Caraga, 6805, Luzon" place village 0.375 Luzon FALSE
+department of education ph Asia South-Eastern Asia FALSE 3 2021-02-03 97691861 way "Department of Education, Meralco Avenue, Oranbo, Pasig, Metro Manila, 1604, Luzon" office government 0.708010995739962 Luzon FALSE
+fcc ph Asia South-Eastern Asia FALSE 3 2021-02-03 99524539 way "First Cityland Condo, Rada, Legazpi, San Lorenzo, Makati 1st District, Makati, Fourth District, Metro Manila, 1200, Luzon" building yes 0.001 Luzon FALSE
+ims health ph Asia South-Eastern Asia FALSE 3 2021-02-03 71334061 node "IMS Health Care, Inc., National Road, Diaz Compound, Putatan, Muntinlupa, Fourth District, Metro Manila, 1770, Luzon" amenity clinic 0.201 Luzon FALSE
+international rice research institute ph Asia South-Eastern Asia FALSE 3 2021-02-03 258457516 relation "International Rice Research Institute, Sampaguita, Masaya, Los Baños, Bay, Laguna, Calabarzon, 4031, Luzon" amenity research_institute 0.775700293936422 Luzon FALSE
+southwest fisheries science center ph Asia South-Eastern Asia FALSE 3 2021-02-03 246594258 way "National Freshwater Fisheries Technology Center, Magtanggol Road, Roseville Heights Subdivision, Muñoz, Nueva Ecija, Central Luzon, 3121, Luzon" amenity research_institute 0.201 Luzon FALSE
+university of the andes pe Americas South America FALSE 3 2021-02-03 51366096 node "Universidad Peruana Los Andes - Sede Lima, 579, Avenida Cuba, Jesús MarÃa, Lima, 011, Perú" amenity school 0.101 Perú FALSE
+smithsonian tropical research institute pa Americas Central America FALSE 3 2021-02-03 176657993 way "Smithsonian Tropical Research Institute, Calle Portobelo, Ancón, Distrito Panamá, Panamá, 080807, Panamá" leisure nature_reserve 0.401 Panamá FALSE
+court of appeal nz Oceania Australia and New Zealand FALSE 3 2021-02-03 154422323 way "Court of Appeal, Aitken Street, Thorndon, Wellington, Wellington City, Wellington, 6140, New Zealand / Aotearoa" amenity courthouse 0.677073009909361 New Zealand / Aotearoa FALSE
+victoria university of wellington nz Oceania Australia and New Zealand FALSE 3 2021-02-03 176763739 way "Victoria University of Wellington, Kitchener Street, Britomart, Auckland Central, Auckland, WaitematÄ<81>, Auckland, 1010, New Zealand / Aotearoa" amenity university 0.401 New Zealand / Aotearoa FALSE
+washington university school of medicine nz Oceania Australia and New Zealand FALSE 3 2021-02-03 96976049 way "School of Medicine, Riccarton Avenue, Central City, Christchurch, Linwood-Central-Heathcote Community, Christchurch City, Canterbury, 84440, New Zealand / Aotearoa" amenity university 0.301 New Zealand / Aotearoa FALSE
+advanced cell technology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency for healthcare research and quality NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+alan turing institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred wegener institute of polar and marine research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazon environmental research institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazon institute of people NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association of university professors NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+american enterprise institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of hematology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal welfare institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+antarctic marine living resources NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+arc centre of excellence for coral reef studies NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+arrowhead pharmaceuticals NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+asapbio NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of european research libraries NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of public and land-grant universities NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+bdnf NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomolecular archaeology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology innovation organization NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg philanthropies NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston university school of public health NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+broad institute of harvard NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada foundation for innovation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+carbon engineering NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for genetics and society in berkeley NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international climate and environmental research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for severe weather research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for veterinary medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for science and technology studies NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+cfda NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+chan zuckerberg biohub NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+china academy of chinese medical sciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+china earthquake administration NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences institute of zoology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of social sciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate analytics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's lamont–doherty earth observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+congolese ministry of health NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortium of social science associations NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+convention on international trade in endangered species NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+darling basin authority NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+dendreon NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe office of science NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe's office of science NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+dynasty foundation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecological society of america conference NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+economic and social research council NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+eeoc NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+embo journal NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and enterprise initiative NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+entomological society of america NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental research letters NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's european space research and technology centre NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+faseb NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal register NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+fermi gamma-ray space telescope NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+five star movement NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for applied molecular evolution NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for food and agriculture research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+fraunhofer society NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+french agricultural research centre for international development NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national trade union of scientific researchers NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+gbsi NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic engineering approval committee NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetics society of america NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+geophysical fluid dynamics laboratory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+george church of harvard medical school NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+german research centre for geosciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ginkgo bioworks NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+gladstone institute of cardiovascular disease NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+gsi helmholtz centre for heavy ion research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+herschel space observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+hfcs NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on science NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of commons science and technology committee NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+igib NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+innovative genomics institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of evolutionary biology in barcelona NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+intellia therapeutics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+"international association of scientific, technical and medical publishers" NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cellular medicine society NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on stratigraphy NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international committee for weights and measures NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international committee on taxonomy of viruses NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international conference on high energy physics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union of pure NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+isscr NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+iupac NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+james martin center for nonproliferation studies NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+jiangmen underground neutrino observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint dark energy mission NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint institute for nuclear research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of geophysical research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of the american medical association NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaiser family foundation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli institute for systems neuroscience NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+kitt peak national observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute of marine sciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ligo scientific collaboration NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mario negri institute for pharmacological research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for biology of ageing NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for terrestrial microbiology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcti NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical hypotheses NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council laboratory of molecular biology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mercator research institute on global commons NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+metropolitan autonomous university NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mhra NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+michoacan university of saint nicholas of hidalgo NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mount sinai school of medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc centre for regenerative medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national collaborative research infrastructure strategy NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national development and reform commission NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for agricultural research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for astrophysics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for research on safety and quality NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of environmental health sciences in research triangle park NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of geophysics and volcanology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of neurological disorders NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national natural science foundation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national sea grant college program NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural history museum of denmark NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature chemical biology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature nanotechnology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+navigenics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+neural information processing systems NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+new hope fertility center NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+newlink genetics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nhgri NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsabb NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nserc NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuffield council on bioethics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of polar programs NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+organisation for the prohibition of chemical weapons NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ottawa hospital research institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+peruvian amazon NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+peter doherty institute for infection and immunity NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew environment group NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+physical review letters NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+physicians for human rights NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+pierre louis institute of epidemiology and public health NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+precision physics research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+presidential commission for the study of bioethical issues NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+recombinetics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+research excellence framework NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+restriction of chemicals NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+santa cruz biotechnology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+sarepta therapeutics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+schmidt ocean institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+science advisory board NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+science mission directorate NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+science translational medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+scripps translational science institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+secure world foundation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+sequenom NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai institutes for biological sciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+simons observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ska organization NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+social sciences and humanities research council NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for conservation biology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of environmental toxicology and chemistry NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of vertebrate paleontology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+south african radio astronomy observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanley center for psychiatric research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+stfc NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+structural genomics consortium NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+sudbury neutrino observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+supreme council of antiquities NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology strategy board NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+toyama chemical NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+treatment action group NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk atomic energy authority NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+united kingdom research and innovation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+"united nations educational, scientific and cultural organization" NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations general assembly NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pittsburgh school of medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of regensburg NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us energy information administration NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us equal employment opportunity commission NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national human genome research institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanographic and atmospheric administration NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us nuclear regulatory commission NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us office of research integrity NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house national security council NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+xishuangbanna tropical botanical garden NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale school of medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg no Europe Northern Europe FALSE 3 2021-02-03 57874557 node "Bloomberg, Stranda, Møre og Romsdal, Norge" waterway waterfall 0.35 Norge FALSE
+norwegian institute of public health no Europe Northern Europe FALSE 3 2021-02-03 52153314 node "Folkehelseinstituttet, Lovisenberggata, Lovisenberg, St. Hanshaugen, Oslo, 0456, Norge" office government 0.001 Norge FALSE
+opcw nl Europe Western Europe FALSE 3 2021-02-03 82494868 node "OPCW, 32, Johan de Wittlaan, Zorgvliet, Den Haag, Zuid-Holland, Nederland, 2517JR, Nederland" place house 0.536046957362672 Nederland FALSE
+sab nl Europe Western Europe FALSE 3 2021-02-03 121229693 way "Juancho E. Yrausquin Airport, The Road, Zions Hill, Saba, Nederland" aeroway aerodrome 0.44859234613195 Nederland FALSE
+imo ng Africa Western Africa FALSE 3 2021-02-03 258539785 relation "Imo, Nigeria" boundary administrative 0.578975498982342 Nigeria FALSE
+ncdc ng Africa Western Africa FALSE 3 2021-02-03 54956799 node "NCDC, Solomon Lar Way, Jabi, Abuja, Municipal Area Council, Federal Capital Territory, 900108, Nigeria" office government 0.101 Nigeria FALSE
+mariana trench NA Africa Southern Africa FALSE 3 2021-02-03 259298637 relation Mariana Trench National Wildlife Refuge boundary protected_area 0.325 NA FALSE
+norwegian polar institute NA Africa Southern Africa FALSE 3 2021-02-03 109644344 way "Troll workshop, Flyplassveien, Troll" shop car_repair 0.001 NA FALSE
+us antarctic program NA Africa Southern Africa FALSE 3 2021-02-03 17620139 node "Concordia Station, Route 66, Camp d'été, Concordia Station" tourism attraction 0.347285603202449 NA FALSE
+apl mz Africa Eastern Africa FALSE 3 2021-02-03 154933581 way "Aeroporto Internacional de Nampula, N1, Cidade de Nampula, Meconta, Nampula, Moçambique" aeroway aerodrome 0.302778707896871 Moçambique FALSE
+nerc my Asia South-Eastern Asia FALSE 3 2021-02-03 70807306 node "NERC, Mersing, Johor, Malaysia" leisure park 0.25 Malaysia FALSE
+agricultural research for development mw Africa Eastern Africa FALSE 3 2021-02-03 162111456 way "Centre for Agricultural Research and Development, S125, Mitundu, Lilongwe, Central Region, Malawi" building yes 0.401 Malawi FALSE
+malta mt Europe Southern Europe FALSE 3 2021-02-03 258431458 relation Malta boundary administrative 0.812750360639362 Malta FALSE
+gwa mm Asia South-Eastern Asia FALSE 3 2021-02-03 259030031 relation "ဂွမြá€á€¯á€·á€”ယ်, သံá€<90>ွဲá€<81>ရá€á€¯á€„, ရá€<81>á€á€¯á€„်ပြည်နယ် (Rakhine), 07182, မြန်မာ" boundary administrative 0.283208261767925 မြန်မာ FALSE
+gao ml Africa Western Africa FALSE 3 2021-02-03 297990 node "Gao, Cercle de Gao, Gao, Mali" place city 0.585315627887998 Mali FALSE
+constitutional court md Europe Eastern Europe FALSE 3 2021-02-03 216698368 way "Curtea Constituțională, 28, Strada Alexandru Lăpușneanu, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2004, Moldova" office government 0.370639694209592 Moldova FALSE
+monaco mc Europe Western Europe FALSE 3 2021-02-03 257226999 relation Monaco boundary land_area 0.789644598497058 Monaco FALSE
+latvia lv Europe Northern Europe FALSE 3 2021-02-03 257910781 relation Latvija boundary administrative 0.744567200497597 Latvija FALSE
+nida lt Europe Northern Europe FALSE 3 2021-02-03 190180 node "Nida, Neringa, Neringos savivaldybÄ—, KlaipÄ—dos apskritis, 93121, Lietuva" place suburb 0.49975765213835 Lietuva FALSE
+partners in health lr Africa Western Africa FALSE 3 2021-02-03 73765026 node "Partners in Health, Tubman Boulevard, Peace Island (Congo Town), Congo Town, Monrovia, Greater Monrovia, Montserrado County, 00231, Liberia" office ngo 0.301 Liberia FALSE
+international water management institute lk Asia Southern Asia FALSE 3 2021-02-03 204762144 way "International Water Management Institute, Sunil Mawatha, Palam Thuna Junction, Pelawatte, බස්නà·<8f>හිර පළà·<8f>à¶, 10120, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office ngo 0.401 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+un environment programme lc Americas Caribbean FALSE 3 2021-02-03 48669497 node "Global Environment Facility Small Grants Programmme United nations Development Programme (GEF SGP UNDP), Desir Avenue, L'anse Road, Sans Souci, Castries, 1487, Saint Lucia" office yes 0.301 Saint Lucia FALSE
+international vaccine institute kr Asia Eastern Asia FALSE 3 2021-02-03 190407343 way "êµì œë°±ì‹ 연구소, 1, 관악로, ê±´ì˜<81>아파트, ì²ë£¡ë<8f>™, 관악구, 서울, 08826, 대한민êµ" office research 0.001 ëŒ€í•œë¯¼êµ FALSE
+korea university kr Asia Eastern Asia FALSE 3 2021-02-03 66060178 node "ê³ ë ¤ëŒ€, 안암로, 종암ë<8f>™, 성ë¶<81>구, 서울, 02800, 대한민êµ" railway station 0.001 ëŒ€í•œë¯¼êµ FALSE
+national institute of ecology kr Asia Eastern Asia FALSE 3 2021-02-03 248455668 way "êµë¦½ìƒ<9d>태ì›<90>, 금강로, 송내리, 서천군, 33657, 대한민êµ" leisure garden 0.001 ëŒ€í•œë¯¼êµ FALSE
+pohang university of science and technology kr Asia Eastern Asia FALSE 3 2021-02-03 259443543 relation "í<8f>¬í•ê³µê³¼ëŒ€í•™êµ<90>, 77, ì²ì•”ë¡œ, 효곡ë<8f>™, 남구, í<8f>¬í•ì‹œ, ê²½ìƒ<81>ë¶<81>ë<8f>„, 37673, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+sungkyunkwan university kr Asia Eastern Asia FALSE 3 2021-02-03 66580260 node "ì„±ê· ê´€ëŒ€, 화산로, 장안구, 수ì›<90>ì‹œ, 16360, 대한민êµ" railway stop 0.001 ëŒ€í•œë¯¼êµ FALSE
+ki ki Oceania Micronesia FALSE 3 2021-02-03 258555103 relation Kiribati boundary administrative 0.718215660119049 Kiribati FALSE
+kyrgyzstan kg Asia Central Asia FALSE 3 2021-02-03 257857355 relation КыргызÑ<81>тан boundary administrative 0.699471525334594 КыргызÑ<81>тан FALSE
+kenya medical research institute ke Africa Eastern Africa FALSE 3 2021-02-03 202184361 way "Kenya Medical Research Institute, Kisumu-Busia Road, Kisumu, Nyanza, 40100, Kenya" office research 0.401 Kenya FALSE
+democratic party of japan jp Asia Eastern Asia FALSE 3 2021-02-03 122578456 way "自由民主会館, 23, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8910, 日本" office political_party 0.001 日本 FALSE
+hiroshima university jp Asia Eastern Asia FALSE 3 2021-02-03 6038414 node "Hiroshima Universityã€€åºƒå³¶å¤§å¦ æ<9d>±åºƒå³¶ã‚ャンパス, 出会ã<81>„ã<81>®é<81>“, 西æ<9d>¡ä¸‹è¦‹, æ<9d>±åºƒå³¶å¸‚, 広島県, 739-0047, 日本" amenity university 0.702899469290669 日本 FALSE
+japan atomic energy agency jp Asia Eastern Asia FALSE 3 2021-02-03 220860551 way "Japan Atomic Energy Agency, 765-1, ã<81>¯ã<81>ªã<81>¿ã<81>šã<81><8d>通り, æ<9d>±æµ·æ<9d>‘, é‚£ç<8f>‚郡, 茨城県, 319-1184, 日本" building yes 0.401 日本 FALSE
+japan meteorological agency jp Asia Eastern Asia FALSE 3 2021-02-03 258888416 relation "気象åº<81>, å†…å €é€šã‚Š, 大手町1, 大手町, 神田, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0004, 日本" building public 0.528920419784088 日本 FALSE
+ministry of justice jp Asia Eastern Asia FALSE 3 2021-02-03 60332920 node "法務çœ<81>, 桜田通り, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" office government 0.492769930727232 日本 FALSE
+nagasaki university jp Asia Eastern Asia FALSE 3 2021-02-03 110381378 way "長崎大å¦, 県é<81>“113å<8f>·ç·š, 長崎市, 長崎県, 850-8685, 日本" amenity university 0.466329902238883 日本 FALSE
+ngo jp Asia Eastern Asia FALSE 3 2021-02-03 104188006 way "ä¸éƒ¨å›½éš›ç©ºæ¸¯ã‚»ãƒ³ãƒˆãƒ¬ã‚¢, セントレアライン;ä¸éƒ¨å›½éš›ç©ºæ¸¯é€£çµ¡é<81>“è·¯, 常滑市, 愛知県, 479-0881, 日本" aeroway aerodrome 0.490333550285453 日本 FALSE
+riken brain science institute jp Asia Eastern Asia FALSE 3 2021-02-03 151778643 way "脳科å¦ç·<8f>å<90>ˆç ”究センター æ<9d>±æ£Ÿ, 新座ãƒ<90>イパス, 和光市, 埼玉県, 351-0106, 日本" building yes 0.001 日本 FALSE
+the times jp Asia Eastern Asia FALSE 3 2021-02-03 135747411 way "タイムズ, 御æˆ<90>町, å°<8f>町1, 鎌倉市, 神奈å·<9d>県, 日本" landuse construction 0.343190432299382 日本 FALSE
+tohoku jp Asia Eastern Asia FALSE 3 2021-02-03 258878374 relation "æ<9d>±åŒ—町, 上北郡, é<9d>’森県, 日本" boundary administrative 0.402513658204824 日本 FALSE
+toyota jp Asia Eastern Asia FALSE 3 2021-02-03 258878294 relation "豊田市, 愛知県, 日本" boundary administrative 0.4 日本 FALSE
+university of tsukuba jp Asia Eastern Asia FALSE 3 2021-02-03 134217312 way "ç‘波大å¦, ã<81>™ã<81>šã<81>‹ã<81>‘通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 303-0006, 日本" amenity university 0.540351531466865 日本 FALSE
+npg jm Americas Caribbean FALSE 3 2021-02-03 177301691 way "NPG, Tobago Avenue, New Kingston, Saint Andrew, Surrey County, KINGSTON 5, Jamaica" building commercial 0.101 Jamaica FALSE
+vanity fair jm Americas Caribbean FALSE 3 2021-02-03 76246848 node "Vanity Fair, Saint Mary, Middlesex County, Jamaica" place hamlet 0.45 Jamaica FALSE
+chamber of deputies it Europe Southern Europe FALSE 3 2021-02-03 61264691 node "Camera dei deputati, Piazza del Parlamento, Rione III Colonna, Municipio Roma I, Roma, Roma Capitale, Lazio, 00186, Italia" office government 0.553523844412523 Italia FALSE
+cia it Europe Southern Europe FALSE 3 2021-02-03 94840491 way "Aeroporto di Roma-Ciampino, Via Palmiro Togliatti, Ciampino, Roma Capitale, Lazio, 00043, Italia" aeroway aerodrome 0.548980991840454 Italia FALSE
+crisanti it Europe Southern Europe FALSE 3 2021-02-03 37862607 node "Casa Crisanti, Scillato, Palermo, Sicilia, 90020, Italia" place isolated_dwelling 0.3 Italia FALSE
+ferrari it Europe Southern Europe FALSE 3 2021-02-03 107882148 way "Museo Galleria Ferrari, 43, Viale Alfredo Dino Ferrari, Bell'Italia, Maranello, Unione dei comuni del Distretto Ceramico, Modena, Emilia-Romagna, 41053, Italia" tourism museum 0.427161274702289 Italia FALSE
+icr it Europe Southern Europe FALSE 3 2021-02-03 257993141 way "ICR, Casa Malaspina, Lodi, Lombardia, Italia" landuse industrial 0.3 Italia FALSE
+joint research centre it Europe Southern Europe FALSE 3 2021-02-03 233423450 way "Joint Research Centre, Barza, Ispra, Varese, Lombardia, Italia" landuse industrial 0.663793454953531 Italia FALSE
+university of bologna it Europe Southern Europe FALSE 3 2021-02-03 45355087 node "Johns Hopkins University, 11, Via Belmeloro, Irnerio, Santo Stefano, Bologna, Emilia-Romagna, 40126, Italia" amenity university 0.201 Italia FALSE
+university of pavia it Europe Southern Europe FALSE 3 2021-02-03 4601061 node "Università di Pavia, Largo Giorgio La Pira, Borgo Ticino, Pavia, Lombardia, 27100, Italia" amenity university 0.602616832398112 Italia FALSE
+university of trento it Europe Southern Europe FALSE 3 2021-02-03 102238581 way "ex Biblioteca universitaria centrale, Via Giuseppe Verdi, Laboratorio Sociale Officina Piedicastello, Piedicastello, Trento, Territorio Val d'Adige, Provincia di Trento, Trentino-Alto Adige/Südtirol, 38122, Italia" building university 0.201 Italia FALSE
+decode genetics is Europe Northern Europe FALSE 3 2021-02-03 81109668 node "Ã<8d>slensk erfðagreining, 8, Sturlugata, Háskóli, Miðborg, ReykjavÃkurborg, Höfuðborgarsvæðið, 102, Ã<8d>sland" office company 0.001 Ã<8d>sland FALSE
+university of iceland is Europe Northern Europe FALSE 3 2021-02-03 259157894 relation "Háskóli Ã<8d>slands, Ingunnargata, Háskóli, Miðborg, ReykjavÃkurborg, Höfuðborgarsvæðið, 102, Ã<8d>sland" amenity university 0.460302392667561 Ã<8d>sland FALSE
+institute for research in fundamental sciences ir Asia Southern Asia FALSE 3 2021-02-03 133035312 way "پژوهشگاه دانش‌های بنیادی, دکتر باهنر, Øصار بوعلی, نیاوران, منطقه Û± شهر تهران, شهر تهران, بخش رودبار قصران, شهرستان شمیرانات, استان تهران, ١٩٧٨٧٣٧٤٨٣, ایران" amenity university 0.31689306175332 ایران FALSE
+ministry of science ir Asia Southern Asia FALSE 3 2021-02-03 216486765 way "وزارت علوم، تØقیقات Ùˆ Ù<81>ناوری, پیروزان جنوبی, شهرک غرب, منطقه Û² شهر تهران, شهرداری تهران منطقه شش ساختمان انبار مرکزی, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1466913734, ایران" office government 0.4318394385017 ایران FALSE
+sony ir Asia Southern Asia FALSE 3 2021-02-03 83913921 node "sony xperia نمایندگی سونی, 1, خیابان بهشت, بهشت, ناØیه۲ منطقه Û±, منطقه Û±, شهر مشهد, بخش مرکزی شهرستان مشهد, شهرستان مشهد, استان خراسان رضوی, 9183717469, ایران" shop mobile_phone 0.594712396341918 ایران FALSE
+university of tehran ir Asia Southern Asia FALSE 3 2021-02-03 180641108 way "پردیس مرکزی دانشگاه‌ تهران, Û±Û¶ آذر, دانشگاه تهران, منطقه Û¶ شهر تهران, شهرداری تهران منطقه شش ناØیه سه, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1418893844, ایران" amenity university 0.317252435362624 ایران FALSE
+blood institute in Asia Southern Asia FALSE 3 2021-02-03 73364002 node "Cumbala Hill Hospital And Heart Institute Blood Bank, NS Patkar Marg, Grant Road, D Ward, Zone 1, Mumbai, Mumbai City, Maharashtra, 400036, India" amenity blood_bank 0.201 India FALSE
+christian medical college in Asia Southern Asia FALSE 3 2021-02-03 55073123 node "Christian Medical College, NH38, Vellore, Vellore District, Tamil Nadu, 632002, India" highway bus_stop 0.301 India FALSE
+department of atomic energy in Asia Southern Asia FALSE 3 2021-02-03 250761108 way "Department Of Atomic Energy, Poojappura Main Road, Thirumala, Poojappura, 38 MSP Nagar, Thiruvananthapuram, Kerala, 695012, India" office government 0.401 India FALSE
+giant metrewave radio telescope in Asia Southern Asia FALSE 3 2021-02-03 259119626 relation "Giant Metrewave Radio Telescope, SH53, Ambegaon, Pune District, Maharashtra, India" amenity research_institute 0.401 India FALSE
+indian council of medical research in Asia Southern Asia FALSE 3 2021-02-03 176721424 way "Indian Council of Medical Research, Sadahalli, Devanahalli taluk, Bangalore Rural, Karnataka, India" landuse commercial 0.7 India FALSE
+indian national science academy in Asia Southern Asia FALSE 3 2021-02-03 65559222 node "à¤à¤¾à¤°à¤¤à¥€à¤¯ राषà¥<8d>टà¥<8d>रीय विजà¥<8d>ञान अकादमी, 2, Bahadur Shah Zafar Marg, Delhi, Kotwali Tehsil, Central Delhi, Delhi, 110002, India" tourism attraction 0.001 India FALSE
+institute of space in Asia Southern Asia FALSE 3 2021-02-03 176056727 way "Indian Institute of Space Science and Technology, Trivandrum, Manoorkonam-panacode, Maannoorkkonam, Nedumangad, Thiruvananthapuram, Kerala, 695547, India" amenity university 0.676937105996802 India FALSE
+jama in Asia Southern Asia FALSE 3 2021-02-03 259341928 relation "Jama, Dumka, Jharkhand, 814110, India" boundary administrative 0.55 India FALSE
+university of delhi in Asia Southern Asia FALSE 3 2021-02-03 156201546 way "University of Delhi South Campus, Benito Juarez Marg, Delhi Cantonment, New Delhi, Delhi, 110021, India" amenity university 0.301 India FALSE
+iom im Europe Northern Europe FALSE 3 2021-02-03 105663494 way "Isle of Man Airport, Balthane Road, Malew, Rushen, IM9 2AH, Isle of Man" aeroway aerodrome 0.447526724801917 Isle of Man FALSE
+allergan ie Europe Northern Europe FALSE 3 2021-02-03 296678202 way "Allergan, Westport northern bypass, Westport Harbour, Westport Rural ED, Westport-Belmullet Municipal District, County Mayo, Connacht, F28 KX88, Éire / Ireland" building industrial 0.101 Éire / Ireland FALSE
+iarc ie Europe Northern Europe FALSE 3 2021-02-03 70264067 node "Irish Ancestry Research Centre, O'Connell Street, Shannon B, The Metropolitan District of Limerick City, County Limerick, Munster, V94 951K, Éire / Ireland" office association 0.001 Éire / Ireland FALSE
+republic of ireland ie Europe Northern Europe FALSE 3 2021-02-03 258361977 relation Éire / Ireland boundary administrative 0.873845787392843 Éire / Ireland FALSE
+us department of defense ie Europe Northern Europe FALSE 3 2021-02-03 258792189 relation "Department of Defense, Station Road, Morristownbiller ED, The Municipal District of Kildare — Newbridge, County Kildare, Leinster, W12 AD93, Éire / Ireland" office government 0.622075306013723 Éire / Ireland FALSE
+nasem id Asia South-Eastern Asia FALSE 3 2021-02-03 13768087 node "Nasem, Merauke, Papua, Indonesia" place locality 0.225 Indonesia FALSE
+ceu hu Europe Eastern Europe FALSE 3 2021-02-03 165252734 way "Central European University, Október 6. utca, Lipótváros, V. kerület, Budapest, Közép-Magyarország, 1051, Magyarország" amenity university 0.449444237200763 Magyarország FALSE
+cnsa ht Americas Caribbean FALSE 3 2021-02-03 172983686 way "Coordination Nationale de la Sécurité Alimentaire, 93, Impasse Pétion, Coeur de Palmier, 7e Bellevue Chardonnières, Petyonvil, Arrondissement de Port-au-Prince, Département de l'Ouest, HT6141, Ayiti" building public 0.001 Ayiti FALSE
+eso hr Europe Southern Europe FALSE 3 2021-02-03 259184791 relation "Iž, Grad Zadar, Zadarska županija, 23284, Hrvatska" place island 0.409231479174104 Hrvatska FALSE
+mesopotamia gr Europe Southern Europe FALSE 3 2021-02-03 980059 node "Μεσοποταμία, Δήμος ΚαστοÏ<81>ιάς, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚαστοÏ<81>ιάς, ΠεÏ<81>ιφÎÏ<81>εια Δυτικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΗπείÏ<81>ου - Δυτικής Μακεδονίας, 52050, Ελλάδα" place town 0.449569974883352 Ελλάδα FALSE
+gambia gm Africa Western Africa FALSE 3 2021-02-03 258194808 relation Gambia boundary administrative 0.752242698231784 Gambia FALSE
+thule gl Americas Northern America FALSE 3 2021-02-03 1195220 node "Qaanaaq, Avannaata, 3971, Kalaallit Nunaat" place town 0.454011689337226 Kalaallit Nunaat FALSE
+ifdc gh Africa Western Africa FALSE 3 2021-02-03 19062776 node "IFDC, Abafun Crescent, Labone, La, Accra Metropolitan, Greater Accra Region, 10408, Ghana" office foundation 0.101 Ghana FALSE
+astronomical society gb Europe Northern Europe FALSE 3 2021-02-03 2216386 node "Royal Astronomical Society, Burlington Arcade, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1J 0ET, United Kingdom" office association 0.694024211333493 United Kingdom FALSE
+bedford gb Europe Northern Europe FALSE 3 2021-02-03 108624 node "Bedford, East of England, England, MK40 1SU, United Kingdom" place town 0.611289942268227 United Kingdom FALSE
+biobank gb Europe Northern Europe FALSE 3 2021-02-03 77681818 node "Biobank, Pincents Kiln Industrial Park, Tilehurst, Theale, West Berkshire, South East, England, RG31 7SD, United Kingdom" office company 0.101 United Kingdom FALSE
+cabinet office gb Europe Northern Europe FALSE 3 2021-02-03 100375252 way "Cabinet Office, 70, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2AS, United Kingdom" office government 0.648641885623921 United Kingdom FALSE
+central institute of mental health gb Europe Northern Europe FALSE 3 2021-02-03 140482817 way "Institute of Mental Health, Triumph Road, Wollaton Park, City of Nottingham, East Midlands, England, NG8 1FD, United Kingdom" building yes 0.401 United Kingdom FALSE
+centre for ecology and hydrology gb Europe Northern Europe FALSE 3 2021-02-03 101917409 way "Centre for Ecology and Hydrology, Benson Lane, Preston Crowmarsh, Benson, Crowmarsh Gifford, South Oxfordshire, Oxfordshire, South East, England, OX10 8BB, United Kingdom" amenity research_institute 0.754365194683011 United Kingdom FALSE
+charity cancer research uk gb Europe Northern Europe FALSE 3 2021-02-03 72590969 node "Cancer Research UK (charity shop), East Street, Shoreham-by-Sea, Adur, West Sussex, South East, England, BN43 5ZE, United Kingdom" shop clothes 0.401 United Kingdom FALSE
+climate institute gb Europe Northern Europe FALSE 3 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.472343749103071 United Kingdom FALSE
+coalition s gb Europe Northern Europe FALSE 3 2021-02-03 15861155 node "Coalition, King's Road, Queen's Park, Brighton, Brighton and Hove, South East, England, BN1 1NB, United Kingdom" amenity nightclub 0.201 United Kingdom FALSE
+crick institute gb Europe Northern Europe FALSE 3 2021-02-03 121182065 way "The Francis Crick Institute, 1, Midland Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 1AT, United Kingdom" amenity research_institute 0.584723197268746 United Kingdom FALSE
+defra gb Europe Northern Europe FALSE 3 2021-02-03 120106481 way "National Agri-Food Innovation Campus York, Sand Hutton, Ryedale, North Yorkshire, Yorkshire and the Humber, England, YO41 1LZ, United Kingdom" landuse commercial 0.2 United Kingdom FALSE
+department for transport gb Europe Northern Europe FALSE 3 2021-02-03 96766515 way "Department for Transport, 33, Horseferry Road, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 4DR, United Kingdom" office government 0.768431032071491 United Kingdom FALSE
+dod gb Europe Northern Europe FALSE 3 2021-02-03 45654910 node "The Dod, Dumfries and Galloway, Scotland, DG4 6EZ, United Kingdom" natural peak 0.4 United Kingdom FALSE
+home office gb Europe Northern Europe FALSE 3 2021-02-03 117457078 way "Home Office, 2, Marsham Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 4DF, United Kingdom" office government 0.201 United Kingdom FALSE
+honeywell gb Europe Northern Europe FALSE 3 2021-02-03 42965726 node "Honeywell, Barnsley, Yorkshire and the Humber, England, S71 1LR, United Kingdom" place neighbourhood 0.35 United Kingdom FALSE
+human tissue authority gb Europe Northern Europe FALSE 3 2021-02-03 17570009 node "Human Tissue Authority, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.301 United Kingdom FALSE
+iwc gb Europe Northern Europe FALSE 3 2021-02-03 64405196 node "IWC, 138, New Bond Street, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1S 2SE, United Kingdom" shop watches 0.101 United Kingdom FALSE
+loughborough university gb Europe Northern Europe FALSE 3 2021-02-03 87123611 way "Loughborough University, Epinal Way, Loughborough, Charnwood, Leicestershire, East Midlands, England, LE11 3QN, United Kingdom" amenity university 0.685315627887998 United Kingdom FALSE
+national institute of mental health gb Europe Northern Europe FALSE 3 2021-02-03 140482817 way "Institute of Mental Health, Triumph Road, Wollaton Park, City of Nottingham, East Midlands, England, NG8 1FD, United Kingdom" building yes 0.401 United Kingdom FALSE
+national science and technology council gb Europe Northern Europe FALSE 3 2021-02-03 183761570 way "Dartford Science & Technology College, Dartford Technology College, Dartford, Kent, South East, England, DA1 2LY, United Kingdom" amenity school 0.613179143195807 United Kingdom FALSE
+oxford martin school gb Europe Northern Europe FALSE 3 2021-02-03 108491139 way "Oxford Martin School, 34, Broad Street, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 3BD, United Kingdom" building university 0.646843791996006 United Kingdom FALSE
+oxfordshire gb Europe Northern Europe FALSE 3 2021-02-03 258306804 relation "Oxfordshire, South East, England, United Kingdom" boundary administrative 0.703092947092873 United Kingdom FALSE
+panasonic avionics corporation gb Europe Northern Europe FALSE 3 2021-02-03 134628820 way "Panasonic Avionics Corporation, Heron Drive, Heathrow West Business Park, Langley, Slough, South East, England, SL3 8XP, United Kingdom" building commercial 0.301 United Kingdom FALSE
+royal academy of engineering gb Europe Northern Europe FALSE 3 2021-02-03 42032172 node "Royal Academy of Engineering, 3, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5DG, United Kingdom" building yes 0.401 United Kingdom FALSE
+royal veterinary college gb Europe Northern Europe FALSE 3 2021-02-03 107180102 way "Royal Veterinary College, Camden Campus, Royal College Street, Somers Town, London Borough of Camden, London, Greater London, England, NW1 0TH, United Kingdom" amenity university 0.707433058758147 United Kingdom FALSE
+taylor & francis gb Europe Northern Europe FALSE 3 2021-02-03 120087526 way "Taylor and Francis, 4, Park Square, Milton Park, Milton, Vale of White Horse, Oxfordshire, South East, England, OX14 4RN, United Kingdom" office company 0.201 United Kingdom FALSE
+uk science and technology facilities council gb Europe Northern Europe FALSE 3 2021-02-03 103985987 way "Royal Observatory, Edinburgh, Observatory Road, Blackford Hill, Blackford, City of Edinburgh, Scotland, EH9 3HJ, United Kingdom" tourism attraction 0.460151663261328 United Kingdom FALSE
+university of lincoln gb Europe Northern Europe FALSE 3 2021-02-03 4219519 node "University of Lincoln, Brayford Way, New Boultham, Lincoln, Lincolnshire, East Midlands, England, LN1 1RD, United Kingdom" highway bus_stop 0.301 United Kingdom FALSE
+usra gb Europe Northern Europe FALSE 3 2021-02-03 69244558 node "USRA, 19, Darin Court, Crownhill, Shenley Church End, Milton Keynes, South East, England, MK8 0AD, United Kingdom" amenity fast_food 0.101 United Kingdom FALSE
+world conservation monitoring centre gb Europe Northern Europe FALSE 3 2021-02-03 125654147 way "World Conservation Monitoring Centre, 219c, Huntingdon Road, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0DL, United Kingdom" building yes 0.401 United Kingdom FALSE
+bia fr Europe Western Europe FALSE 3 2021-02-03 101203382 way "Aéroport international de Bastia-Poretta, Route de l'Aéroport, Poretta, Lucciana, Bastia, Haute-Corse, Corse, France métropolitaine, 20290, France" aeroway aerodrome 0.427383538249758 France FALSE
+bipm fr Europe Western Europe FALSE 3 2021-02-03 131402735 way "Bureau International des Poids et Mesures, Allée du Mail, Saint-Cloud, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92210, France" amenity public_building 0.358338814941197 France FALSE
+bmj fr Europe Western Europe FALSE 3 2021-02-03 78287453 node "BMJ, Avenue Robert Schuman, Croix-Rouge, Reims, Marne, Grand Est, France métropolitaine, 51100, France" office company 0.101 France FALSE
+chiron fr Europe Western Europe FALSE 3 2021-02-03 72434563 node "Chiron, Jalognes, Bourges, Cher, Centre-Val de Loire, France métropolitaine, 18300, France" place hamlet 0.35 France FALSE
+cirm fr Europe Western Europe FALSE 3 2021-02-03 211615805 way "CIRM, Le Redon, 9e Arrondissement, Marseille, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13009, France" leisure park 0.25 France FALSE
+cnr fr Europe Western Europe FALSE 3 2021-02-03 108877742 way "Barrage de Génissiat, Route du Barrage, Chez Mazza, Franclens, Saint-Julien-en-Genevois, Haute-Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 74910, France" tourism attraction 0.348376470606964 France FALSE
+dea fr Europe Western Europe FALSE 3 2021-02-03 257783355 relation "Die, Drôme, Auvergne-Rhône-Alpes, France métropolitaine, 26150, France" boundary administrative 0.519081808694247 France FALSE
+edf fr Europe Western Europe FALSE 3 2021-02-03 107960916 way "Barrage de Bort, D 683, Granges, Lanobre, Mauriac, Cantal, Auvergne-Rhône-Alpes, France métropolitaine, 15270, France" tourism attraction 0.323710213530857 France FALSE
+esf fr Europe Western Europe FALSE 3 2021-02-03 64479978 node "ESF, D 615, Chastreix-Sancy, Chastreix, Issoire, Puy-de-Dôme, Auvergne-Rhône-Alpes, France métropolitaine, 63680, France" amenity ski_school 0.101 France FALSE
+eurasia fr Europe Western Europe FALSE 3 2021-02-03 54313918 node "Eurasia, Place Jean-Pierre Pincemin, Plaine de Champbertrand, Sens, Yonne, Bourgogne-Franche-Comté, France métropolitaine, 89100, France" amenity restaurant 0.101 France FALSE
+geac fr Europe Western Europe FALSE 3 2021-02-03 48072741 node "Géac, Marennes, Marennes-Hiers-Brouage, Rochefort, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17320, France" place neighbourhood 0.25 France FALSE
+geron fr Europe Western Europe FALSE 3 2021-02-03 11058034 node "Geron, Le Tréhou, Brest, Finistère, Bretagne, France métropolitaine, 29450, France" place hamlet 0.35 France FALSE
+infn fr Europe Western Europe FALSE 3 2021-02-03 145095025 way "Institut national des formations notariales site de Nantes, Rue Gaston Turpin, Coulmiers, Saint-Donatien, Malakoff - Saint-Donatien, Nantes, Loire-Atlantique, Pays de la Loire, France métropolitaine, 44000, France" amenity college 0.001 France FALSE
+inra fr Europe Western Europe FALSE 3 2021-02-03 107855804 way "Institut National de la Recherche Agronomique, Rue Malar, Quartier du Gros-Caillou, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75007, France" office government 0.44821536212669 France FALSE
+insead fr Europe Western Europe FALSE 3 2021-02-03 144761314 way "Institut Européen d'Administration des Affaires, Route de l'Ermitage, Faisanderie, Fontainebleau, Seine-et-Marne, Île-de-France, France métropolitaine, 77300, France" amenity university 0.45279198506882 France FALSE
+lmu fr Europe Western Europe FALSE 3 2021-02-03 258528246 relation "Lemuy, Dole, Jura, Bourgogne-Franche-Comté, France métropolitaine, 39110, France" boundary administrative 0.531077603671255 France FALSE
+nazis fr Europe Western Europe FALSE 3 2021-02-03 298629865 way "Ruisseau des Nazis, Le Trillol, Rouffiac-des-Corbières, Narbonne, Aude, Occitanie, France métropolitaine, 11350, France" waterway stream 0.3 France FALSE
+ori fr Europe Western Europe FALSE 3 2021-02-03 258365623 relation "Auray, Lorient, Morbihan, Bretagne, France métropolitaine, 56400, France" boundary administrative 0.616662915473728 France FALSE
+pla fr Europe Western Europe FALSE 3 2021-02-03 258567039 relation "Le Pla, Foix, Ariège, Occitanie, France métropolitaine, 09460, France" boundary administrative 0.613138446783058 France FALSE
+sorbonne university fr Europe Western Europe FALSE 3 2021-02-03 258943206 relation "Sorbonne Université - Faculté des Sciences et Ingénierie, Rue Jussieu, Quartier Saint-Victor, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France" amenity university 0.450501936383412 France FALSE
+sun fr Europe Western Europe FALSE 3 2021-02-03 257932113 relation "Île-de-Sein, Quimper, Finistère, Bretagne, France métropolitaine, 29990, France" place island 0.460372709160497 France FALSE
+tsca fr Europe Western Europe FALSE 3 2021-02-03 79543194 node "TSCA, Grande Rue Nazareth, Capitole, Toulouse Centre, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31000, France" amenity driving_school 0.101 France FALSE
+university of bordeaux fr Europe Western Europe FALSE 3 2021-02-03 20434734 node "Broca 2, Rue Paul Broca, Victoire, Bordeaux Sud, Bordeaux, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33000, France" amenity university 0.101 France FALSE
+university of paris-saclay fr Europe Western Europe FALSE 3 2021-02-03 259420663 relation "Université Paris-Saclay à Palaiseau, 10;2, Boulevard Thomas Gobert, Rocher de Lozère, Les Taupiniaux, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91120, France" amenity university 0.201 France FALSE
+hanken school of economics fi Europe Northern Europe FALSE 3 2021-02-03 119630076 way "Svenska Handelshögskolan, Runeberginkatu, Etu-Töölö, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00100, Suomi / Finland" amenity university 0.389895770819526 Suomi / Finland FALSE
+beis es Europe Southern Europe FALSE 3 2021-02-03 46711873 node "Beis, Cis, Oza-Cesuras, Betanzos, A Coruña, Galicia, 15388, España" place hamlet 0.35 España FALSE
+cea es Europe Southern Europe FALSE 3 2021-02-03 257723188 relation "Cea, León, Castilla y León, España" boundary administrative 0.577556182714715 España FALSE
+iac es Europe Southern Europe FALSE 3 2021-02-03 136488779 way "Instituto de Astrofisica de Canarias, TF-180, Curva de Gracia, Gracia, La Cuesta, San Cristóbal de La Laguna, Santa Cruz de Tenerife, Canarias, 38207, España" amenity university 0.283827688081076 España FALSE
+napster es Europe Southern Europe FALSE 3 2021-02-03 54168575 node "Napster, Plaza de la Libertad, La Charca, Allende, Miranda de Ebro, Burgos, Castilla y León, 09200, España" amenity cafe 0.101 España FALSE
+pmi es Europe Southern Europe FALSE 3 2021-02-03 259549987 relation "Aeroport de Palma - Son Sant Joan, Camà de Can Pastilla, Can Pastilla, Palma, Illes Balears, 07610, España" aeroway aerodrome 0.487548679886816 España FALSE
+ucar es Europe Southern Europe FALSE 3 2021-02-03 258478044 relation "Ucar, Navarra - Nafarroa, 31154, España" boundary administrative 0.606410528784134 España FALSE
+university of zaragoza es Europe Southern Europe FALSE 3 2021-02-03 65211540 node "The University of Beer, 8, Calle Arzobispo Apaolaza, Romareda, Universidad, Zaragoza, Aragón, 50005, España" amenity cafe 0.301 España FALSE
+niels bohr institute dk Europe Northern Europe FALSE 3 2021-02-03 143629556 way "University of Copenhagen, Niels Bohr Institute, Blegdamsvej, Østerbro, København, Københavns Kommune, Region Hovedstaden, 1357, Danmark" office educational_institution 0.707266933591874 Danmark FALSE
+ernst de Europe Western Europe FALSE 3 2021-02-03 258503577 relation "Ernst, Cochem, Landkreis Cochem-Zell, Rheinland-Pfalz, Deutschland" boundary administrative 0.402323854176492 Deutschland FALSE
+european central bank de Europe Western Europe FALSE 3 2021-02-03 44670175 node "Europäische Zentralbank, 20, Sonnemannstraße, Ostend, Bornheim/Ostend, Frankfurt am Main, Hessen, 60314, Deutschland" office government 0.667340246660332 Deutschland FALSE
+german research foundation de Europe Western Europe FALSE 3 2021-02-03 58931236 node "Deutsche Stiftung Friedensforschung, 3-5, Am Ledenhof, Altstadt, Innenstadt, Osnabrück, Niedersachsen, 49074, Deutschland" office foundation 0.230361546636441 Deutschland FALSE
+leibniz institute for zoo and wildlife research de Europe Western Europe FALSE 3 2021-02-03 169300978 way "Leibniz-Institut für Zoo- und Wildtierforschung (IZW), Alfred-Kowalke-Straße, Reihenhäuser Kalinka, Friedrichsfelde, Lichtenberg, Berlin, 10315, Deutschland" office research 0.401 Deutschland FALSE
+max planck institute for developmental biology de Europe Western Europe FALSE 3 2021-02-03 103844203 way "Max-Planck-Institut für Entwicklungsbiologie, 5, Max-Planck-Ring, Max-Planck-Institut, Schönblick / Winkelwiese, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland" building yes 0.201 Deutschland FALSE
+max planck institute for extraterrestrial physics de Europe Western Europe FALSE 3 2021-02-03 14838537 node "Max-Planck-Institut für extraterrestrische Physik, 1, Gießenbachstraße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" office research 0.668804350670811 Deutschland FALSE
+max planck institute of biochemistry de Europe Western Europe FALSE 3 2021-02-03 22667364 node "Max-Planck-Institut für Biochemie, 18, Am Klopferspitz, Martinsried, Planegg, Landkreis München, Bayern, 82152, Deutschland" amenity university 0.565781769297865 Deutschland FALSE
+proxima centauri de Europe Western Europe FALSE 3 2021-02-03 58951540 node "Proxima Centauri, Milchweg, Haingebiet, Inselstadt, Bamberg, Bayern, 96049, Deutschland" tourism information 0.201 Deutschland FALSE
+university of stuttgart de Europe Western Europe FALSE 3 2021-02-03 123666613 way "Universität Hohenheim, Mühlweg, Hohenheim, Plieningen, Stuttgart, Aichtal, Baden-Württemberg, 70599, Deutschland" amenity university 0.54210101824834 Deutschland FALSE
+charles university cz Europe Eastern Europe FALSE 3 2021-02-03 11772836 node "Farmaceutická fakulta UK, Akademika Heyrovského, U Orlice, Hradec Králové, okres Hradec Králové, Královéhradecký kraj, Severovýchod, 50012, Česko" amenity university 0.001 Česko FALSE
+vertex cz Europe Eastern Europe FALSE 3 2021-02-03 99141481 way "Vertex, NedoÅ¡Ãn, LitomyÅ¡l, okres Svitavy, Pardubický kraj, Severovýchod, ÄŒesko" landuse industrial 0.3 ÄŒesko FALSE
+university of havana cu Americas Caribbean FALSE 3 2021-02-03 135439351 way "Universidad de las Ciencias Informáticas (UCI), Km. 2 ½, Autopista Novia del MediodÃa, La Lisa, La Habana, La Lisa, Cuba" amenity university 0.260958143076972 Cuba FALSE
+yugoslavia cu Americas Caribbean FALSE 3 2021-02-03 297426759 way "Yugoslavia, Reynold GarcÃa (Pastorita), Peñas Altas, Ciudad de Matanzas, Matanzas, Cuba" natural beach 0.3 Cuba FALSE
+university of antioquia co Americas South America FALSE 3 2021-02-03 129472917 way "Universidad Católica del Norte, Calle 34, Alto de la Mina, Vereda Las Cruces, Santa Rosa de Osos, Norte, Antioquia, Región Andina, Colombia" amenity university 0.101 Colombia FALSE
+communist party of china cn Asia Eastern Asia FALSE 3 2021-02-03 204074725 way "ä¸å…±æ±•å¤´å¸‚委员会, 8å<8f>·, 海滨路, 海安街é<81>“, 金平区, 汕头市, 广东çœ<81>, 515031, ä¸å›½" office political_party 0.001 ä¸å›½ FALSE
+dalian university of technology cn Asia Eastern Asia FALSE 3 2021-02-03 190857010 way "大连ç<90>†å·¥å¤§å¦, 2å<8f>·, 红凌路, 甘井å<90>区, 凌水街é<81>“, 甘井å<90>区, 大连市, è¾½å®<81>çœ<81>, 116024, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+duke kunshan university cn Asia Eastern Asia FALSE 3 2021-02-03 181887054 way "Duke Kunshan University, æ<9d>œå…‹å¤§é<81>“, 玉山镇, 昆山市, è‹<8f>州市, ä¸å›½" amenity university 0.703405604298285 ä¸å›½ FALSE
+henan cn Asia Eastern Asia FALSE 3 2021-02-03 258289127 relation "æ²³å<8d>—çœ<81>, ä¸å›½" boundary administrative 0.699353793876879 ä¸å›½ FALSE
+imperial college cn Asia Eastern Asia FALSE 3 2021-02-03 98640872 way "国å<90>监, 五é<81>“è<90>¥èƒ¡å<90>Œ, 东城区, 北京市, 100010, ä¸å›½" tourism attraction 0.375002297808295 ä¸å›½ FALSE
+inner mongolia cn Asia Eastern Asia FALSE 3 2021-02-03 257842595 relation "内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½" boundary administrative 0.65384947808461 ä¸å›½ FALSE
+jiangsu cn Asia Eastern Asia FALSE 3 2021-02-03 296043922 relation "江è‹<8f>çœ<81>, ä¸å›½" boundary administrative 0.67413115257446 ä¸å›½ FALSE
+jilin university cn Asia Eastern Asia FALSE 3 2021-02-03 160258991 way "å<90>‰æž—大å¦ï¼ˆæœ<9d>é˜³æ ¡åŒºï¼‰, 西民主大街 West Minzhu St, 清和街é<81>“, æœ<9d>阳区, 长春市, å<90>‰æž—çœ<81>, 130000, ä¸å›½" amenity university 0.446917790002857 ä¸å›½ FALSE
+lanzhou university cn Asia Eastern Asia FALSE 3 2021-02-03 71262039 node "兰州大å¦, 天水ä¸è·¯, 团结新æ<9d>‘è¡—é<81>“, 兰州市, 城关区, 兰州市, 甘肃çœ<81>, 730001, ä¸å›½" railway station 0.042720323856182 ä¸å›½ FALSE
+liaoning cn Asia Eastern Asia FALSE 3 2021-02-03 257963869 relation "è¾½å®<81>çœ<81>, ä¸å›½" boundary administrative 0.655891404596791 ä¸å›½ FALSE
+nanjing university cn Asia Eastern Asia FALSE 3 2021-02-03 110545344 way "å<8d>—京大å¦, å<8d>«å··, 鼓楼区, 玄æ¦åŒº, å<8d>—京市, 210093, ä¸å›½" amenity university 0.498289975489913 ä¸å›½ FALSE
+research institute cn Asia Eastern Asia FALSE 3 2021-02-03 235380215 way "research institute, Foot Path, é›<81>塔区 (Yanta), 西安市, 陕西çœ<81>, 710048, ä¸å›½" office research 0.201 ä¸å›½ FALSE
+shaanxi cn Asia Eastern Asia FALSE 3 2021-02-03 258564458 relation "陕西çœ<81>, ä¸å›½" boundary administrative 0.672615420866457 ä¸å›½ FALSE
+shandong cn Asia Eastern Asia FALSE 3 2021-02-03 257941393 relation "山东çœ<81>, ä¸å›½" boundary administrative 0.718289642729985 ä¸å›½ FALSE
+shanxi cn Asia Eastern Asia FALSE 3 2021-02-03 258080027 relation "山西çœ<81>, ä¸å›½" boundary administrative 0.673000372829377 ä¸å›½ FALSE
+sinopharm cn Asia Eastern Asia FALSE 3 2021-02-03 300321655 node "Sinopharm, é¾™å<8d>Žä¸œè·¯, 五里桥街é<81>“, 上海市, 黄浦区, 1072, ä¸å›½" office yes 0.101 ä¸å›½ FALSE
+wenchang satellite launch center cn Asia Eastern Asia FALSE 3 2021-02-03 166967645 way "文昌å<8d>«æ˜Ÿå<8f>‘射场, S206, 东郊镇, 文昌市, æµ·å<8d>—çœ<81>, ä¸å›½" aeroway spaceport 0.428336328616045 ä¸å›½ FALSE
+xiamen university cn Asia Eastern Asia FALSE 3 2021-02-03 126438748 way "厦门大å¦, 422, æ€<9d>明å<8d>—è·¯, 厦港街é<81>“, æ€<9d>明区, 厦门市, æ€<9d>明区, 厦门市, ç¦<8f>建çœ<81>, 361005, ä¸å›½" amenity university 0.451951803030286 ä¸å›½ FALSE
+zhejiang cn Asia Eastern Asia FALSE 3 2021-02-03 258327108 relation "浙江çœ<81>, ä¸å›½" boundary administrative 0.684734858394146 ä¸å›½ FALSE
+international institute of tropical agriculture cm Africa Middle Africa FALSE 3 2021-02-03 259457036 relation "Institut International d'Agriculture Tropicale, Rue 6.501, Nkolbisson, Yaoundé VII, Communauté urbaine de Yaoundé, Mfoundi, Centre, PB. 185 YAOUNDÉ, Cameroun" amenity college 0.301 Cameroun FALSE
+cerro armazones cl Americas South America FALSE 3 2021-02-03 6398940 node "Cerro Armazones, Antofagasta, Provincia de Antofagasta, Región de Antofagasta, Chile" natural peak 0.489701883147039 Chile FALSE
+incyte ch Europe Western Europe FALSE 3 2021-02-03 258303830 relation "Incyte, Morges, District de Morges, Vaud, 1110, Schweiz/Suisse/Svizzera/Svizra" landuse industrial 0.3 Schweiz/Suisse/Svizzera/Svizra FALSE
+paul scherrer institute ch Europe Western Europe FALSE 3 2021-02-03 300115214 way "Paul Scherrer Institut, 111, Forschungsstrasse, Würenlingen, Bezirk Baden, Aargau, 5232, Schweiz/Suisse/Svizzera/Svizra" amenity research_institute 0.567865768074584 Schweiz/Suisse/Svizzera/Svizra FALSE
+swiss national science foundation ch Europe Western Europe FALSE 3 2021-02-03 23413803 node "Schweizerischer Nationalfonds (SNF), Wildhainweg, Stadtbach, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra" office government 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of lausanne ch Europe Western Europe FALSE 3 2021-02-03 95776304 way "Université de Lausanne, A1a, Quartier Chamberonne, Chavannes-près-Renens, District de l'Ouest lausannois, Vaud, 1022, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.616266928066907 Schweiz/Suisse/Svizzera/Svizra FALSE
+world health organisation ch Europe Western Europe FALSE 3 2021-02-03 91298032 way "Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building commercial 0.676611286810515 Schweiz/Suisse/Svizzera/Svizra FALSE
+army cf Africa Middle Africa FALSE 3 2021-02-03 51674182 node "Army, Vakaga, Ködörösêse tî Bêafrîka - République Centrafricaine" place village 0.375 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+mbari cf Africa Middle Africa FALSE 3 2021-02-03 258465218 relation "Mbari, Mbomou, Ködörösêse tî Bêafrîka - République Centrafricaine" waterway river 0.4 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+canadian space agency ca Americas Northern America FALSE 3 2021-02-03 156978929 way "Canadian Space Agency, Resources Row, Saskatoon, Saskatoon (city), Saskatchewan, S7N 3R3, Canada" building industrial 0.301 Canada FALSE
+chime ca Americas Northern America FALSE 3 2021-02-03 210495198 way "Canadian Hydrogen Intensity Mapping Experiment, White Lake Trail - East, Area I (Skaha West/Kaleden/Apex), Regional District of Okanagan-Similkameen, British Columbia, V0H 1R4, Canada" man_made telescope 0.320054390558144 Canada FALSE
+first nations ca Americas Northern America FALSE 3 2021-02-03 5550556 node "First Nations, West Mall, University of British Columbia, Electoral Area A, Metro Vancouver Regional District, British Columbia, V6T 1Z2, Canada" emergency phone 0.201 Canada FALSE
+international civil aviation organization ca Americas Northern America FALSE 3 2021-02-03 114910153 way "Organisation de l'Aviation Civile Internationale, 999, Boulevard Robert-Bourassa, René-Lévesque, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3C 5H7, Canada" office international_organization 0.301 Canada FALSE
+manitoba ca Americas Northern America FALSE 3 2021-02-03 258500059 relation "Manitoba, Canada" boundary administrative 0.758017394476413 Canada FALSE
+northwest territories ca Americas Northern America FALSE 3 2021-02-03 258121655 relation "Northwest Territories, Canada" boundary administrative 0.798189772893837 Canada FALSE
+nunavut ca Americas Northern America FALSE 3 2021-02-03 257857561 relation "ᓄᓇᕗᑦ Nunavut, Canada" boundary administrative 0.712760363996049 Canada FALSE
+professional institute of the public service of canada ca Americas Northern America FALSE 3 2021-02-03 64283995 node "Professional Institute Of The Public Service Of Canada, 250, Tremblay Road, Alta Vista, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1G 3H5, Canada" office association 0.801 Canada FALSE
+queen's university in kingston ca Americas Northern America FALSE 3 2021-02-03 85363828 way "Queen's University - West Campus, West Campus Lane, Portsmouth, Kingston, Eastern Ontario, Ontario, K7M 6G4, Canada" amenity university 0.501 Canada FALSE
+rural affairs ca Americas Northern America FALSE 3 2021-02-03 122759813 way "Ontario Ministry of Agriculture, Food, and Rural Affairs, 1, Stone Road West, Guelph, Southwestern Ontario, Ontario, N1G 0A9, Canada" office government 0.201 Canada FALSE
+university of windsor ca Americas Northern America FALSE 3 2021-02-03 259225016 relation "University of Windsor, California Avenue, Windsor, Southwestern Ontario, Ontario, N9B 2Z8, Canada" amenity university 0.744009006305759 Canada FALSE
+atp by Europe Eastern Europe FALSE 3 2021-02-03 206941011 way "Ð<90>ТП, ВерхнедвинÑ<81>к, ВерхнедвинÑ<81>кий район, ВитебÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, БеларуÑ<81>ÑŒ" landuse industrial 0.2 БеларуÑ<81>ÑŒ FALSE
+belarus by Europe Eastern Europe FALSE 3 2021-02-03 257723650 relation БеларуÑ<81>ÑŒ boundary administrative 0.756896296328902 БеларуÑ<81>ÑŒ FALSE
+ministry of agriculture bw Africa Southern Africa FALSE 3 2021-02-03 178648159 way "Ministry of Agriculture, Gaborone, South-East District, Botswana" landuse commercial 0.5 Botswana FALSE
+biomed central br Americas South America FALSE 3 2021-02-03 53650511 node "BioMed, 761, Rua Venâncio Aires, Centro Histórico, Centro, Cruz Alta, Região Geográfica Imediata de Cruz Alta, Região Geográfica Intermediária de Passo Fundo, Rio Grande do Sul, Região Sul, 98005-020, Brasil" shop yes 0.101 Brasil FALSE
+ebay br Americas South America FALSE 3 2021-02-03 83811700 node "eBay Jataizinho, 9513, Rodovia Melo Peixoto, Jataizinho, Região Geográfica Imediata de Londrina, Região Geográfica Intermediária de Londrina, Paraná, Região Sul, 86210-000, Brasil" shop yes 0.677751877815445 Brasil FALSE
+federal university of pernambuco br Americas South America FALSE 3 2021-02-03 197192851 way "Universidade Federal de Pernambuco, 1235, Avenida Professor Moraes Rego, Cidade Universitária, Recife, Região Geográfica Imediata do Recife, Região Metropolitana do Recife, Pernambuco, Região Nordeste, 50670-420, Brasil" amenity university 0.301 Brasil FALSE
+federal university of rio grande br Americas South America FALSE 3 2021-02-03 258468678 relation "Universidade Federal do Rio de Janeiro, Rua Dalias, Vila Residencial dos Funcionários, Cidade Universitária, Zona Norte do Rio de Janeiro, Rio de Janeiro, Região Geográfica Imediata do Rio de Janeiro, Região Metropolitana do Rio de Janeiro, Região Geográfica Intermediária do Rio de Janeiro, Rio de Janeiro, Região Sudeste, 21941-907, Brasil" amenity university 0.696203816091948 Brasil FALSE
+nejm br Americas South America FALSE 3 2021-02-03 174188055 way "Seme Nagib Nejm, Centro, Irati, Região Geográfica Imediata de Irati, Região Geográfica Intermediária de Ponta Grossa, Paraná, Região Sul, 84500-236, Brasil" highway residential 0.2 Brasil FALSE
+novozymes br Americas South America FALSE 3 2021-02-03 182674703 way "Novozymes, Araucária, Região Geográfica Imediata de Curitiba, Região Metropolitana de Curitiba, Região Geográfica Intermediária de Curitiba, Paraná, Região Sul, Brasil" landuse industrial 0.3 Brasil FALSE
+ufrj br Americas South America FALSE 3 2021-02-03 258468678 relation "Universidade Federal do Rio de Janeiro, Rua Dalias, Vila Residencial dos Funcionários, Cidade Universitária, Zona Norte do Rio de Janeiro, Rio de Janeiro, Região Geográfica Imediata do Rio de Janeiro, Região Metropolitana do Rio de Janeiro, Região Geográfica Intermediária do Rio de Janeiro, Rio de Janeiro, Região Sudeste, 21941-907, Brasil" amenity university 0.496203816091948 Brasil FALSE
+erasmus university medical center be Europe Western Europe FALSE 3 2021-02-03 314840 node "Erasme - Erasmus, Route de Lennik - Lennikse Baan, Anderlecht, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1070, België / Belgique / Belgien" railway station 0.444585942469205 België / Belgique / Belgien FALSE
+university of antwerp be Europe Western Europe FALSE 3 2021-02-03 85049624 way "Campus Middelheim Universiteit Antwerpen, Lindendreef, Middelheim, Antwerpen, Vlaanderen, 2020, België / Belgique / Belgien" amenity university 0.219931111449547 België / Belgique / Belgien FALSE
+university of leuven be Europe Western Europe FALSE 3 2021-02-03 110607812 way "University Snooker, 106, Hertogstraat, Matadi, Heverlee, Leuven, Vlaams-Brabant, Vlaanderen, 3001, België / Belgique / Belgien" amenity bar 0.201 België / Belgique / Belgien FALSE
+atomic energy commission bd Asia Southern Asia FALSE 3 2021-02-03 160816975 way "Atomic Energy Commission, বিà¦<8f>নপি বাজার-আগারগাà¦<81>ও পানির টà§<8d>যাংকি রোড, তালতলা, পশà§<8d>চিম আগারগাà¦<81>ও, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1207, বাংলাদেশ" office government 0.301 বাংলাদেশ FALSE
+daca bd Asia Southern Asia FALSE 3 2021-02-03 44550743 node "ঢাকা, Chanpara Bazar, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1230, বাংলাদেশ" place city 0.610110109270811 বাংলাদেশ FALSE
+arctic council au Oceania Australia and New Zealand FALSE 3 2021-02-03 158850149 way "Arctic Way, Kellyville Ridge, Sydney, Blacktown City Council, New South Wales, 2769, Australia" highway residential 0.3 Australia FALSE
+australia institute au Oceania Australia and New Zealand FALSE 3 2021-02-03 47173025 node "Fitness Institute Australia, Elizabeth Street, Melbourne Innovation District, Melbourne, City of Melbourne, Victoria, 3000, Australia" office company 0.201 Australia FALSE
+australian science media centre au Oceania Australia and New Zealand FALSE 3 2021-02-03 56940969 node "Australian Science Media Centre, 55, Exchange Place, Adelaide, Adelaide City Council, South Australia, 5000, Australia" office yes 0.401 Australia FALSE
+charles sturt university au Oceania Australia and New Zealand FALSE 3 2021-02-03 258986170 relation "Charles Sturt University, Wagga Wagga City Council, New South Wales, 2678, Australia" boundary administrative 0.55 Australia FALSE
+garvan institute of medical research au Oceania Australia and New Zealand FALSE 3 2021-02-03 212333308 way "Garvan Institute of Medical Research, Chaplin Street, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia" building yes 0.791360254031496 Australia FALSE
+general medical council au Oceania Australia and New Zealand FALSE 3 2021-02-03 212333308 way "Garvan Institute of Medical Research, Chaplin Street, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia" building yes 0.491360254031496 Australia FALSE
+murdoch university au Oceania Australia and New Zealand FALSE 3 2021-02-03 84018837 way "Murdoch University, Banksia Terrace, Murdoch, City Of Melville, Western Australia, 6150, Australia" amenity university 0.620333972314475 Australia FALSE
+parkes observatory au Oceania Australia and New Zealand FALSE 3 2021-02-03 267335 node "Parkes Observatory, Telescope Road, Parkes, Parkes Shire Council, New South Wales, 2870, Australia" tourism attraction 0.201 Australia FALSE
+rmit university au Oceania Australia and New Zealand FALSE 3 2021-02-03 134618167 way "RMIT University, Hamilton - Chatsworth Road, Tarrington, Hamilton, Shire of Southern Grampians, Victoria, 3300, Australia" amenity university 0.201 Australia FALSE
+science exchange au Oceania Australia and New Zealand FALSE 3 2021-02-03 144377931 way "The Science Exchange, 55, Exchange Place, Adelaide, Adelaide City Council, South Australia, 5000, Australia" building yes 0.201 Australia FALSE
+sunday times au Oceania Australia and New Zealand FALSE 3 2021-02-03 124957593 way "The Sunday Times, James Street, Perth, City of Perth, Western Australia, 6000, Australia" building yes 0.201 Australia FALSE
+swinburne university of technology au Oceania Australia and New Zealand FALSE 3 2021-02-03 258895413 relation "Swinburne University of Technology (Hawthorn Campus), John Street, Hawthorn, City of Boroondara, Victoria, 3122, Australia" amenity university 0.814183292472317 Australia FALSE
+graz university of technology at Europe Western Europe FALSE 3 2021-02-03 258643242 relation "Technische Universität Graz, Eduard-Richter-Gasse, Herz-Jesu-Viertel, Sankt Leonhard, Graz, Steiermark, 8010, Österreich" amenity university 0.532228989952608 Österreich FALSE
+ibs at Europe Western Europe FALSE 3 2021-02-03 110424761 way "22, IBS, Teufenbach, Teufenbach-Katsch, Bezirk Murau, Steiermark, 8833, Österreich" landuse industrial 0.3 Österreich FALSE
+international institute for applied systems analysis at Europe Western Europe FALSE 3 2021-02-03 41950525 node "IIASA, 1, Schlossplatz, Laxenburg, Gemeinde Laxenburg, Bezirk Mödling, Niederösterreich, 2361, Österreich" office research 0.001 Österreich FALSE
+paho at Europe Western Europe FALSE 3 2021-02-03 1154495 node "Per-Albin-Hansson-Siedlung Ost, KG Oberlaa Stadt, Favoriten, Wien, 1100, Österreich" place neighbourhood 0.25 Österreich FALSE
+space research institute at Europe Western Europe FALSE 3 2021-02-03 119966043 way "Österreichische Akademie der Wissenschaften, Institut für Weltraumforschung, 6, Schmiedlstraße, Messendorfberg, Sankt Peter, Graz, Steiermark, 8042, Österreich" amenity public_building 0.001 Österreich FALSE
+vienna university of technology at Europe Western Europe FALSE 3 2021-02-03 258307874 relation "TU Wien, Hauptgebäude, Olga-Wisinger-Florian-Platz, Wieden, KG Wieden, Wieden, Wien, 1040, Österreich" building university 0.286834742964615 Österreich FALSE
+pierre auger observatory ar Americas South America FALSE 3 2021-02-03 10519055 node "Observatorio Pierre Auger, 304, Avenida San MartÃn (Norte), Malargüe, Distrito Ciudad de Malargüe, Departamento Malargüe, Mendoza, Argentina" tourism attraction 0.53489332460211 Argentina FALSE
+subaru ar Americas South America FALSE 3 2021-02-03 201692997 way "Subaru, MartÃnez Oeste, MartÃnez, Partido de San Isidro, Buenos Aires, Argentina" landuse industrial 0.3 Argentina FALSE
+university of zimbabwe zw Africa Eastern Africa FALSE 2 2021-02-03 182258631 way "University of Zimbabwe, 630, Churchill Avenue, Avondale, Harare, Harare Province, 04-263, Zimbabwe" amenity university 0.685910756155564 Zimbabwe FALSE
+arthur mcdonald za Africa Southern Africa FALSE 2 2021-02-03 139766772 way "Arthur McDonald Avenue, Edleen, Ekurhuleni Ward 16, Kempton Park, City of Ekurhuleni Metropolitan Municipality, Gauteng, 1619, South Africa" highway residential 0.3 South Africa FALSE
+department of environmental affairs za Africa Southern Africa FALSE 2 2021-02-03 202039404 way "Department of Economic Development and Environmental Affairs, 5, Huntley Street, Makana Ward 8, Makhanda (Grahamstown), Makana Local Municipality, Sarah Baartman District Municipality, Eastern Cape, 6139, South Africa" office government 0.401 South Africa FALSE
+east asian observatory za Africa Southern Africa FALSE 2 2021-02-03 120613 node "Observatory, Lynton Road, Observatory, Cape Town Ward 57, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" railway station 0.241913844040538 South Africa FALSE
+international court of justice za Africa Southern Africa FALSE 2 2021-02-03 230999389 way "Curious Minds International School, 1016, Justice Mahomed Street, Menlo Park, Tshwane Ward 82, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0011, South Africa" amenity kindergarten 0.301 South Africa FALSE
+monash za Africa Southern Africa FALSE 2 2021-02-03 101123044 way "Monash, Monash Boulevard, Johannesburg Ward 97, Roodepoort, City of Johannesburg Metropolitan Municipality, Gauteng, South Africa" amenity university 0.373081870492623 South Africa FALSE
+ska observatory za Africa Southern Africa FALSE 2 2021-02-03 54591242 node "SKA South Africa, Park Road, Maitland Garden Village, Cape Town Ward 53, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" office ngo 0.101 South Africa FALSE
+south african medical research council za Africa Southern Africa FALSE 2 2021-02-03 230613646 way "South African Medical Research Council, 1, Soutpansberg Road, Tshwane Ward 58, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0007, South Africa" office research 0.501 South Africa FALSE
+university of south africa za Africa Southern Africa FALSE 2 2021-02-03 126210070 way "University of South Africa, Rabe Street, Polokwane Ward 22, Polokwane, Polokwane Local Municipality, Capricorn District Municipality, Limpopo, 0690, South Africa" amenity university 0.401 South Africa FALSE
+university of the free state za Africa Southern Africa FALSE 2 2021-02-03 10968312 node "University of the Free State, 205, Nelson Mandela Drive, Brandwag, Mangaung Ward 22, Bloemfontein, Mangaung Metropolitan Municipality, Free State, 9321, South Africa" amenity school 0.89425812326797 South Africa FALSE
+hadza ye Asia Western Asia FALSE 2 2021-02-03 12334974 node "Øجة, مديرية مدينة Øجة, Ù…ØاÙ<81>ظة Øجة, اليمن" place town 0.409632994596587 اليمن FALSE
+samoa ws Oceania Polynesia FALSE 2 2021-02-03 258569989 relation SÄ<81>moa boundary administrative 0.643977564870154 SÄ<81>moa FALSE
+htv vn Asia South-Eastern Asia FALSE 2 2021-02-03 127533062 way "9, Ä<90>aÌ€i Truyền hiÌ€nh TP.HCM (HTV), PhÆ°á»<9d>ng Bến Nghé, Quáºn 1, Thà nh phố Hồ Chà Minh, Việt Nam" landuse commercial 0.3 Việt Nam FALSE
+enea ve Americas South America FALSE 2 2021-02-03 255171662 way "La Enea, Parroquia Urbana Biruaca, Municipio Biruaca, Apure, Venezuela" place town 0.4 Venezuela FALSE
+pontifical academy of sciences va Europe Southern Europe FALSE 2 2021-02-03 58730114 node "Pontificia Accademia delle Scienze, Viale del Giardino Quadrato, Città del Vaticano, 00120, Città del Vaticano" office educational_institution 0.483796693268388 Città del Vaticano FALSE
+abbott laboratories us Americas Northern America FALSE 2 2021-02-03 214402852 way "Abbott Laboratories, North Chicago, Lake County, Illinois, United States" landuse industrial 0.660548150210851 United States FALSE
+acad us Americas Northern America FALSE 2 2021-02-03 88308109 way "Acad, Parlier, Fresno County, California, 93662, United States" highway residential 0.2 United States FALSE
+accuweather in state college us Americas Northern America FALSE 2 2021-02-03 177586041 way "AccuWeather, 385, Science Park Road, Science Park, State College, Centre County, Pennsylvania, 16803, United States" office company 0.301 United States FALSE
+aerospace corporation us Americas Northern America FALSE 2 2021-02-03 258788014 relation "The Aerospace Corporation, 2310, East El Segundo Boulevard, El Segundo, Los Angeles County, California, 90245, United States" office research 0.506728041583383 United States FALSE
+agios pharmaceuticals us Americas Northern America FALSE 2 2021-02-03 43500306 node "Agios Pharmaceuticals, 38, Sidney Street, University Park, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" place house 0.201 United States FALSE
+aia us Americas Northern America FALSE 2 2021-02-03 104903713 way "American Institute of Architects, 1735, New York Avenue Northwest, Washington, District of Columbia, 20006, United States" office ngo 0.482165402797397 United States FALSE
+alliance us Americas Northern America FALSE 2 2021-02-03 257848637 relation "Alliance, Box Butte County, Nebraska, 69301, United States" boundary administrative 0.545502923866838 United States FALSE
+alnylam pharmaceuticals us Americas Northern America FALSE 2 2021-02-03 43655569 node "Alnylam Pharmaceuticals, 300, Third Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" office research 0.201 United States FALSE
+american cancer society us Americas Northern America FALSE 2 2021-02-03 296512848 node "American Cancer Society, 3709, West Jetton Avenue, Palma Ceia, Tampa, Hillsborough County, Florida, 33629, United States" office ngo 0.301 United States FALSE
+american institute of physics us Americas Northern America FALSE 2 2021-02-03 210348591 way "American Institute of Physics, 500, Sunnyside Boulevard, Oyster Bay, Nassau County, New York, 11797, United States" building university 0.401 United States FALSE
+american lung association us Americas Northern America FALSE 2 2021-02-03 76922142 node "American Lung Association, 3000, Kelly Lane, Springfield, Sangamon County, Illinois, 62711, United States" amenity social_facility 0.301 United States FALSE
+american veterinary medical association us Americas Northern America FALSE 2 2021-02-03 75706148 node "AHVMA, 37, Kensington Parkway, Box Hill North, Harford County, Maryland, 21009, United States" office yes 0.001 United States FALSE
+amherst college us Americas Northern America FALSE 2 2021-02-03 162492573 way "Amherst College, Barrett Hill Road, Amherst, Hampshire County, Massachusetts, 01002, United States" amenity college 0.715982514090231 United States FALSE
+amo us Americas Northern America FALSE 2 2021-02-03 258145410 relation "Amo, Hendricks County, Indiana, 46103, United States" boundary administrative 0.415802194348805 United States FALSE
+aphis us Americas Northern America FALSE 2 2021-02-03 259242165 relation "Lake Aphis, Klamath County, Oregon, United States" natural water 0.3 United States FALSE
+appalachia us Americas Northern America FALSE 2 2021-02-03 257877414 relation "Appalachia, Wise County, Virginia, 24216, United States" boundary administrative 0.462086077089553 United States FALSE
+armstrong flight research center us Americas Northern America FALSE 2 2021-02-03 243644685 way "Armstrong Flight Research Center, Forbes Avenue, Kern County, California, 93524, United States" aeroway aerodrome 0.401 United States FALSE
+arnold us Americas Northern America FALSE 2 2021-02-03 257968026 relation "Arnold, Jefferson County, Missouri, 63010, United States" boundary administrative 0.513360018065774 United States FALSE
+atlantis bank us Americas Northern America FALSE 2 2021-02-03 258253193 relation "Atlantis, Palm Beach County, Florida, United States" boundary administrative 0.514922298920702 United States FALSE
+autism research centre us Americas Northern America FALSE 2 2021-02-03 171350220 way "Burkhart Center for Autism Education & Research, 2902, 18th Street, Lubbock, Lubbock County, Texas, 79409, United States" building college 0.201 United States FALSE
+b612 foundation us Americas Northern America FALSE 2 2021-02-03 80081794 node "B612 Foundation, 20, Sunnyside Avenue, Mill Valley, Marin County, California, 94941, United States" office foundation 0.201 United States FALSE
+bayer crop science us Americas Northern America FALSE 2 2021-02-03 194221252 way "Bayer Crop Science, East 50th Street, Lubbock, Lubbock County, Texas, 79404, United States" building yes 0.301 United States FALSE
+baylor university us Americas Northern America FALSE 2 2021-02-03 129265508 way "Baylor University, 1301, South University Parks Drive, Waco, McLennan County, Texas, 76706, United States" amenity university 0.719338807988632 United States FALSE
+bell labs us Americas Northern America FALSE 2 2021-02-03 177283205 way "Bell Labs Sewage Treatment, Ramanessin Trail, Holmdel, Holmdel Township, Monmouth County, New Jersey, 07733, United States" man_made wastewater_plant 0.201 United States FALSE
+betty moore foundation us Americas Northern America FALSE 2 2021-02-03 76687108 node "Annual Reviews, 4116 Park Boulevard, Palo Alto, CA 94306, Palo Alto, Santa Clara County, California, 94306, United States" shop bookmaker 0.001 United States FALSE
+binghamton university us Americas Northern America FALSE 2 2021-02-03 217349557 way "Binghamton University Nature Preserve, Vestal Town, Broome County, New York, United States" leisure park 0.35 United States FALSE
+black lives matter us Americas Northern America FALSE 2 2021-02-03 193863362 way "Black Lives Matter Plaza Northwest, Golden Triangle, Washington, District of Columbia, 20012, United States" highway secondary 0.4 United States FALSE
+books & arts us Americas Northern America FALSE 2 2021-02-03 137492216 way "Plaza: Cake Arts, Nevermore Books, Tombstone Tattoo, Twice But Nice, 2852, West Sylvania Avenue, Deaveaux, Fitch, Toledo, Lucas County, Ohio, 43613, United States" building yes 0.201 United States FALSE
+boston biomedical research institute us Americas Northern America FALSE 2 2021-02-03 97416620 way "Boston Biomedical Research Institute, 64, Grove Street, East Watertown, Watertown, Middlesex County, Massachusetts, 02135, United States" building yes 0.401 United States FALSE
+boston globe us Americas Northern America FALSE 2 2021-02-03 92324871 way "Boston Street, Globe, Gila County, Arizona, 85501, United States" highway residential 0.3 United States FALSE
+boston medical center us Americas Northern America FALSE 2 2021-02-03 257699340 relation "Boston Medical Center, 1, Albany Street, South End, Boston, Suffolk County, Massachusetts, 02118, United States" amenity hospital 0.615802194348806 United States FALSE
+brain institute us Americas Northern America FALSE 2 2021-02-03 157960992 way "McKnight Brain Institute, 1149, Newell Drive, Gainesville, Alachua County, Florida, 32610, United States" office research 0.528069876897978 United States FALSE
+brookhaven us Americas Northern America FALSE 2 2021-02-03 259194909 relation "Brookhaven, Lincoln County, Mississippi, 39601, United States" boundary administrative 0.571820093574305 United States FALSE
+bruins us Americas Northern America FALSE 2 2021-02-03 354197 node "Bruins, Crittenden County, Arkansas, United States" place hamlet 0.35 United States FALSE
+bureau of land management us Americas Northern America FALSE 2 2021-02-03 83548763 node "Bureau of Land Management, 1849, C Street Northwest, Washington, District of Columbia, 20240, United States" office government 0.910062690742063 United States FALSE
+burke museum of natural history and culture us Americas Northern America FALSE 2 2021-02-03 127334627 way "Burke Museum of Natural History and Culture, 4300, 15th Avenue Northeast, University District, Seattle, King County, Washington, 98105, United States" tourism museum 1.04572520594953 United States FALSE
+california air resources board us Americas Northern America FALSE 2 2021-02-03 51708475 node "California Air Resources Board, 1001, I Street, Sacramento, Sacramento County, California, 95814, United States" office government 0.780761518938055 United States FALSE
+california state polytechnic university us Americas Northern America FALSE 2 2021-02-03 259490882 relation "California State Polytechnic University, Pomona, 3801, Temple Avenue, Pomona, Los Angeles County, California, 91768, United States" amenity university 0.401 United States FALSE
+carnegie observatories us Americas Northern America FALSE 2 2021-02-03 158103230 way "The Carnegie Observatories, 813, Santa Barbara Street, Bungalow Heaven, Pasadena, Los Angeles County, California, 91101, United States" office research 0.201 United States FALSE
+cascadia us Americas Northern America FALSE 2 2021-02-03 321395 node "Cascadia, Linn County, Oregon, United States" place hamlet 0.399042266993274 United States FALSE
+cell research us Americas Northern America FALSE 2 2021-02-03 137785222 way "Former GM Fuel Cell Research Facility, Honeoye Falls, Mendon, Monroe County, New York, United States" landuse industrial 0.4 United States FALSE
+center for infectious disease research us Americas Northern America FALSE 2 2021-02-03 53565038 node "Center for Infectious Disease Research, 307, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office research 0.501 United States FALSE
+center for physics research us Americas Northern America FALSE 2 2021-02-03 96734346 way "American Center for Physics, Physics Ellipse Drive, University of Maryland Research Park, Riverdale Park, Prince George's County, Maryland, 20737, United States" building office 0.401 United States FALSE
+center for research us Americas Northern America FALSE 2 2021-02-03 100783959 way "National Center for Atmospheric Research Mesa Lab, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" building government 0.691849073716688 United States FALSE
+central south university us Americas Northern America FALSE 2 2021-02-03 151708639 way "South University, 709, Mall Boulevard, Grove Park, Savannah, Chatham County, Georgia, 31406-4805, United States" amenity schoolgrounds 0.201 United States FALSE
+chinook us Americas Northern America FALSE 2 2021-02-03 258340210 relation "Chinook, Blaine County, Montana, 59523, United States" boundary administrative 0.445725205949526 United States FALSE
+cincinnati children's hospital medical center us Americas Northern America FALSE 2 2021-02-03 104904209 way "Cincinnati Children’s Hospital Medical Center, 3333, Burnet Avenue, Pill Hill, Corryville, Cincinnati, Hamilton County, Ohio, 45229-3026, United States" amenity hospital 0.883827688081076 United States FALSE
+clinical center us Americas Northern America FALSE 2 2021-02-03 97490319 way "Clinical Center, Deaconess Road, Boston, Suffolk County, Massachusetts, 02120, United States" building yes 0.201 United States FALSE
+colby college us Americas Northern America FALSE 2 2021-02-03 101282151 way "Colby College, 4000, Mayflower Hill Drive, Waterville, Kennebec County, Maine, 04901, United States" amenity college 0.640907941903285 United States FALSE
+colorado school of mines us Americas Northern America FALSE 2 2021-02-03 98946169 way "Colorado School of Mines, 1500, Illinois Street, Golden, Jefferson County, Colorado, 80401, United States" amenity university 0.401 United States FALSE
+complete genomics us Americas Northern America FALSE 2 2021-02-03 94062190 way "Complete Genomics, Inc., 2071, Stierlin Court, Britannia Shoreline Technology Park, Mountain View, Santa Clara County, California, 94043, United States" building yes 0.201 United States FALSE
+concord university us Americas Northern America FALSE 2 2021-02-03 181466493 way "Concord University, Oxley Road, Mercer County, West Virginia, 24712, United States" amenity university 0.533256970094253 United States FALSE
+congressional us Americas Northern America FALSE 2 2021-02-03 85947506 way "Congressional, La Quinta, Riverside County, California, 92247, United States" highway residential 0.2 United States FALSE
+conservation biology us Americas Northern America FALSE 2 2021-02-03 259518942 relation "Smithsonian Conservation Biology Institute, Front Royal, Warren County, Virginia, United States" boundary national_park 0.534080577887678 United States FALSE
+cornell laboratory of ornithology us Americas Northern America FALSE 2 2021-02-03 544921 node "159, Cornell Laboratory of Ornithology, Lansing, Lansing Town, Tompkins County, New York, 14850, United States" place locality 0.525 United States FALSE
+cos us Americas Northern America FALSE 2 2021-02-03 258401206 relation "Coshocton County, Ohio, United States" boundary administrative 0.614671596762107 United States FALSE
+council us Americas Northern America FALSE 2 2021-02-03 257438176 relation "Council, Adams County, Idaho, United States" boundary administrative 0.474154132137857 United States FALSE
+cowen and company us Americas Northern America FALSE 2 2021-02-03 258460482 relation "Cowen, Webster County, West Virginia, 26206, United States" boundary administrative 0.453558714867367 United States FALSE
+david geffen school of medicine us Americas Northern America FALSE 2 2021-02-03 147422515 way "David Geffen School of Medicine, Tiverton Drive, Westwood Village, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity university 0.842480646342894 United States FALSE
+delta us Americas Northern America FALSE 2 2021-02-03 258432495 relation "Delta County, Texas, United States" boundary administrative 0.656415995814331 United States FALSE
+department of state us Americas Northern America FALSE 2 2021-02-03 46783150 node "National foreign affairs, training center, Shultz, department of state, 4000, NFATC, Alcova Heights, Arlington, Arlington County, Virginia, 22204, United States" place house 0.301 United States FALSE
+desert research institute us Americas Northern America FALSE 2 2021-02-03 97296899 way "Desert Research Institute, University Center Drive, Hughes Center, Paradise, Clark County, Nevada, 89169-4813, United States" amenity university 0.301 United States FALSE
+digitalglobe us Americas Northern America FALSE 2 2021-02-03 104916466 way "DigitalGlobe, 12076, Grant Street, Thornton, Adams County, Colorado, 80241, United States" office company 0.503582454919981 United States FALSE
+doherty earth observatory us Americas Northern America FALSE 2 2021-02-03 101655405 way "Lamont-Doherty Earth Observatory, Ludlow Lane, Palisades, Town of Orangetown, Rockland County, New York, 10964, United States" amenity university 0.301 United States FALSE
+eagle us Americas Northern America FALSE 2 2021-02-03 258059994 relation "Eagle County, Colorado, United States" boundary administrative 0.607744508540787 United States FALSE
+electric power research institute us Americas Northern America FALSE 2 2021-02-03 236587227 way "Electric Power Research Institute, Corridor Park Boulevard, Knox County, Tennessee, 37932, United States" office research 0.401 United States FALSE
+eli us Americas Northern America FALSE 2 2021-02-03 258404300 relation "Ely, White Pine County, Nevada, United States" boundary administrative 0.445859697073655 United States FALSE
+emory university school of medicine us Americas Northern America FALSE 2 2021-02-03 101031365 way "Emory University School of Medicine, McTyeire Drive Northeast, Emory Highlands, Druid Hills, DeKalb County, Georgia, 30322, United States" amenity college 0.501 United States FALSE
+ericsson us Americas Northern America FALSE 2 2021-02-03 258529699 relation "Ericsson, Nokomis, Minneapolis, Hennepin County, Minnesota, United States" boundary administrative 0.395064603083614 United States FALSE
+esc us Americas Northern America FALSE 2 2021-02-03 98380724 way "Delta County Airport, Birch Street, Woodland Estates, Escanaba, Delta County, Michigan, 49829, United States" aeroway aerodrome 0.4004701084432 United States FALSE
+farber cancer institute us Americas Northern America FALSE 2 2021-02-03 145616376 way "Dana-Farber Cancer Institute, 450, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States" amenity hospital 0.61689306175332 United States FALSE
+federal aviation administration us Americas Northern America FALSE 2 2021-02-03 129948979 way "Federal Aviation Administration, Bernalillo County, New Mexico, United States" boundary administrative 0.65 United States FALSE
+federal communications commission us Americas Northern America FALSE 2 2021-02-03 301202937 node "Federal Communications Commission, 45, L Street Northeast, NoMa, Near Northeast, Washington, District of Columbia, 20554, United States" office government 0.894765406107107 United States FALSE
+fermi national laboratory us Americas Northern America FALSE 2 2021-02-03 99059145 way "Fermi National Accelerator Laboratory, DuPage County, Illinois, United States" landuse industrial 0.763054296170657 United States FALSE
+fertile crescent us Americas Northern America FALSE 2 2021-02-03 92672618 way "Fertile Crescent, Prince William County, Virginia, United States" highway residential 0.3 United States FALSE
+florida fish and wildlife conservation commission us Americas Northern America FALSE 2 2021-02-03 59942908 node "Split Oak Forest Wildlife & Environmental, Clapp Simms Duda Road, Orange County, Florida, 34771-9208, United States" tourism information 0.201 United States FALSE
+ford us Americas Northern America FALSE 2 2021-02-03 258207918 relation "Ford County, Illinois, United States" boundary administrative 0.635552540995357 United States FALSE
+forest service us Americas Northern America FALSE 2 2021-02-03 88138445 way "Forest Service, Calaveras County, California, United States" highway residential 0.3 United States FALSE
+future of research us Americas Northern America FALSE 2 2021-02-03 258950849 relation "Future Energy and Advanced Manufacturing, Technology Trail, GE Global Research Center, Niskayuna, Schenectady County, New York, 12309, United States" building industrial 0.201 United States FALSE
+gallaudet us Americas Northern America FALSE 2 2021-02-03 49650415 node "Bison Shop, Lincoln Circle, Ivy City, Washington, District of Columbia, 20242, United States" shop books 0.001 United States FALSE
+gettysburg college us Americas Northern America FALSE 2 2021-02-03 162608659 way "Gettysburg College, Carlisle Street, Gettysburg, Adams County, Pennsylvania, 17325, United States" amenity university 0.634194405720176 United States FALSE
+green bank observatory us Americas Northern America FALSE 2 2021-02-03 299024599 relation "Green Bank Observatory, ICB Road, Green Bank, Pocahontas County, West Virginia, 24944, United States" amenity research_institute 0.301 United States FALSE
+green bank telescope us Americas Northern America FALSE 2 2021-02-03 102881650 way "Green Bank Telescope, Slavin Hollow Road, Pocahontas County, West Virginia, 24944, United States" man_made telescope 0.690988572487363 United States FALSE
+greenfield us Americas Northern America FALSE 2 2021-02-03 258666758 relation "Greenfield, Franklin County, Massachusetts, 01301, United States" boundary administrative 0.56861574469538 United States FALSE
+hawc us Americas Northern America FALSE 2 2021-02-03 225795834 way "Gym / HAWC, Telluride Street, Aurora, Arapahoe County, Colorado, 80017, United States" leisure fitness_centre 0.101 United States FALSE
+heidelberg university us Americas Northern America FALSE 2 2021-02-03 164310513 way "Heidelberg University, Governor's Trail, College Hill, Tiffin, Seneca County, Ohio, 44883, United States" amenity university 0.519018527529768 United States FALSE
+heritage foundation us Americas Northern America FALSE 2 2021-02-03 104211345 way "The Heritage Foundation, 214, Massachusetts Avenue Northeast, Stanton Park, Washington, District of Columbia, 20002, United States" building yes 0.201 United States FALSE
+hertz us Americas Northern America FALSE 2 2021-02-03 103372207 way "Hertz, Westchester, Los Angeles, Los Angeles County, California, United States" landuse commercial 0.3 United States FALSE
+huffington post us Americas Northern America FALSE 2 2021-02-03 301205265 way "Beaver-Huffington Dam, Mesa County, Colorado, United States" waterway dam 0.35 United States FALSE
+hyundai motor us Americas Northern America FALSE 2 2021-02-03 133389707 way "Lithia Hyundai Of Odessa, John Ben Shepperd Parkway Boulevard, ASB Replat, Odessa, Ector County, Texas, 79762, United States" shop car 0.101 United States FALSE
+ieee-usa us Americas Northern America FALSE 2 2021-02-03 258920692 relation "IEEE, 445, Hoes Lane, Piscataway Township, Middlesex County, New Jersey, 08854, United States" building yes 0.101 United States FALSE
+ihs energy us Americas Northern America FALSE 2 2021-02-03 17408922 node "Texaco, Kapouka Place, City Center, Makakilo City, Kapolei, Honolulu County, Hawaii, 96707, United States" amenity fuel 0.001 United States FALSE
+institute for advanced study us Americas Northern America FALSE 2 2021-02-03 96388432 way "Institute for Advanced Study, Goldman Lane, Princeton, Mercer County, New Jersey, 08540, United States" amenity university 0.9343793531708 United States FALSE
+institute of virology us Americas Northern America FALSE 2 2021-02-03 171936676 way "Institute of Human Virology, 725, West Lombard Street, Ridgely's Delight, Baltimore, Maryland, 21201, United States" building university 0.301 United States FALSE
+international commission us Americas Northern America FALSE 2 2021-02-03 71043842 node "Great Commission Church International, 16152, Gale Avenue, Hacienda Heights, Industry, Los Angeles County, California, 91745, United States" amenity place_of_worship 0.201 United States FALSE
+iowa state us Americas Northern America FALSE 2 2021-02-03 91448035 way "Iowa State, Fawn Creek Court, Maquoketa, Jackson County, Iowa, 52060, United States" highway service 0.275 United States FALSE
+iowa state university in ames us Americas Northern America FALSE 2 2021-02-03 258786807 relation "Iowa State University, US 30, Ames, Story County, Iowa, 50011, United States" amenity university 0.929769585619443 United States FALSE
+iridium us Americas Northern America FALSE 2 2021-02-03 69858803 node "Iridium, 1330, North Milwaukee Avenue, Wicker Park, West Town, Chicago, Cook County, Illinois, 60622, United States" shop clothes 0.101 United States FALSE
+island conservation us Americas Northern America FALSE 2 2021-02-03 57458246 node "Brooks Island, Concord, Middlesex County, Massachusetts, 01733, United States" place island 0.425 United States FALSE
+jackson lab us Americas Northern America FALSE 2 2021-02-03 87279896 way "Jackson, Castleberry, Conecuh County, Alabama, 36432, United States" highway primary 0.3 United States FALSE
+janelia farm research campus us Americas Northern America FALSE 2 2021-02-03 258401070 relation "Janelia Research Campus, 19700, Helix Drive, Ashburn, Loudoun County, Virginia, 20147, United States" amenity research_institute 0.546981559290857 United States FALSE
+janelia research campus us Americas Northern America FALSE 2 2021-02-03 258401070 relation "Janelia Research Campus, 19700, Helix Drive, Ashburn, Loudoun County, Virginia, 20147, United States" amenity research_institute 0.546981559290857 United States FALSE
+joint genome institute us Americas Northern America FALSE 2 2021-02-03 235834399 way "Joint Genome Institute, Smoot Road, Berkeley, Alameda County, California, 94720, United States" building yes 0.610439474412231 United States FALSE
+joint global change research institute us Americas Northern America FALSE 2 2021-02-03 24146752 node "Joint Global Change Research Institute, 5825, University Research Court, University of Maryland Research Park, Riverdale Park, Prince George's County, Maryland, 20740, United States" amenity research_institute 0.635420222661424 United States FALSE
+justice us Americas Northern America FALSE 2 2021-02-03 258429262 relation "Justice, Lyons Township, Cook County, Illinois, 60458, United States" boundary administrative 0.566266067536779 United States FALSE
+keck observatory us Americas Northern America FALSE 2 2021-02-03 215780342 way "Keck Observatory, 124th Street South, Pierce County, Washington, 98447, United States" man_made observatory 0.201 United States FALSE
+keystone xl us Americas Northern America FALSE 2 2021-02-03 83355450 node "Keystone XL Whitewater Heliport, East Whitewater Road, Whitewater, Phillips County, Montana, 59544, United States" aeroway helipad 0.201 United States FALSE
+langley research center us Americas Northern America FALSE 2 2021-02-03 259101253 relation "NASA Langley Research Center, Hampton, Virginia, United States" landuse military 0.744328937907079 United States FALSE
+lawrence berkeley national laboratory in berkeley us Americas Northern America FALSE 2 2021-02-03 201093023 way "Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States" amenity research_institute 0.501 United States FALSE
+lcls us Americas Northern America FALSE 2 2021-02-03 113981149 way "LCLS X-Ray Transport Tunnel, Stanford Hills, San Mateo County, California, 94028, United States" highway service 0.175 United States FALSE
+liberal-national us Americas Northern America FALSE 2 2021-02-03 258136520 relation "Liberal, Seward County, Kansas, United States" boundary administrative 0.57453184281069 United States FALSE
+locus biosciences us Americas Northern America FALSE 2 2021-02-03 73461690 node "Locus Biosciences, 523, Davis Drive, Research Triangle Park, Morrisville, Durham County, North Carolina, 27560, United States" office company 0.201 United States FALSE
+lsu us Americas Northern America FALSE 2 2021-02-03 100338394 way "Louisiana State University, West Lakeshore Drive, College Town, Baton Rouge, East Baton Rouge Parish, Louisiana, 70802, United States" amenity university 0.550358843721885 United States FALSE
+mci us Americas Northern America FALSE 2 2021-02-03 140762532 way "Kansas City International Airport, 1, Northwest Cookingham Drive, Kansas City, Platte County, Missouri, 64153, United States" aeroway aerodrome 0.411679724670082 United States FALSE
+medicine foundation us Americas Northern America FALSE 2 2021-02-03 10663071 node "OU Physicians Reproductive Medicine, 840, Research Parkway, Presbyterian Health Foundation, Oklahoma City, Oklahoma County, Oklahoma, 73104, United States" amenity doctors 0.201 United States FALSE
+miami university in oxford us Americas Northern America FALSE 2 2021-02-03 134890642 way "Miami University, McKee Avenue, Oxford, Oxford Township, Butler County, Ohio, 45056, United States" amenity university 0.801832830623064 United States FALSE
+missouri state university us Americas Northern America FALSE 2 2021-02-03 2719859 node "Missouri State University, 901, South National Avenue, Phelps Grove/University Heights, Springfield, Greene County, Missouri, 65807, United States" amenity university 0.732450490278609 United States FALSE
+moffitt cancer center us Americas Northern America FALSE 2 2021-02-03 196997535 way "H. Lee Moffitt Cancer Center, 12902, USF Magnolia Drive, Tampa, Hillsborough County, Florida, 33612, United States" amenity hospital 0.64030088440925 United States FALSE
+monell chemical senses center us Americas Northern America FALSE 2 2021-02-03 237615520 way "Monell Chemical Senses Center, Market Street, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19104, United States" building yes 0.401 United States FALSE
+montana state university in bozeman us Americas Northern America FALSE 2 2021-02-03 165822886 way "Montana State University, West College Street, Bozeman, Gallatin County, Montana, 59715, United States" amenity university 0.929796188420265 United States FALSE
+mount st helens us Americas Northern America FALSE 2 2021-02-03 2373758 node "Mount St. Helens, Skamania County, Washington, United States" natural volcano 0.790999852984371 United States FALSE
+national centre us Americas Northern America FALSE 2 2021-02-03 418056 node "National, Monongalia County, West Virginia, United States" place hamlet 0.389139026272805 United States FALSE
+national institute for public health us Americas Northern America FALSE 2 2021-02-03 35683102 node "Washington University, Institute for Public Health, 600, South Taylor Avenue, WashU, City of Saint Louis, Missouri, 63110, United States" office university 0.401 United States FALSE
+national mining association us Americas Northern America FALSE 2 2021-02-03 3185607 node "Western Minnesota Mining Association Placer Mine, Mazourka Canyon Road, Inyo County, California, United States" landuse quarry 0.201 United States FALSE
+national optical astronomy observatory us Americas Northern America FALSE 2 2021-02-03 39657118 node "National Optical Astronomy Observatory, 950, North Cherry Avenue, Tucson, Pima County, Arizona, 85721, United States" amenity research_institute 0.401 United States FALSE
+national park service us Americas Northern America FALSE 2 2021-02-03 97935238 way "The Battle of Bunker Hill Museum, 43, Monument Square, Charlestown, Boston, Suffolk County, Massachusetts, 02129, United States" tourism museum 0.479827038246968 United States FALSE
+national solar observatory us Americas Northern America FALSE 2 2021-02-03 51609551 node "National Solar Observatory, 3665, Discovery Drive, Boulder, Boulder County, Colorado, 80303, United States" office research 0.56358119422997 United States FALSE
+natural history museum of utah us Americas Northern America FALSE 2 2021-02-03 126656490 way "Natural History Museum Of Utah, 301, Wakara Way, Research Park, Salt Lake City, Salt Lake County, Utah, 84108, United States" tourism museum 0.787418940697571 United States FALSE
+nature conservancy us Americas Northern America FALSE 2 2021-02-03 175509415 way "Nature Conservancy, Ballston, Arlington, Arlington County, Virginia, United States" leisure park 0.35 United States FALSE
+navajo nation us Americas Northern America FALSE 2 2021-02-03 259240483 relation "Navajo Nation, United States" boundary aboriginal_lands 0.692311230103081 United States FALSE
+needham & company us Americas Northern America FALSE 2 2021-02-03 97473265 way "Needham, Choctaw County, Alabama, United States" place town 0.507183702790066 United States FALSE
+neptune us Americas Northern America FALSE 2 2021-02-03 22534659 node "Neptune, Neptune Township, Monmouth County, New Jersey, 07753, United States" place town 0.4 United States FALSE
+new mexico state university us Americas Northern America FALSE 2 2021-02-03 258148480 relation "New Mexico State University, Triviz Drive, Las Cruces, Doña Ana County, New Mexico, 88003, United States" amenity university 0.861659299619142 United States FALSE
+new york university langone medical center us Americas Northern America FALSE 2 2021-02-03 125494622 way "NYU Langone Medical Center, East 30th Street, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10016, United States" amenity hospital 0.853159798268413 United States FALSE
+noaa earth system research laboratory us Americas Northern America FALSE 2 2021-02-03 153944153 way "NOAA - Earth System Research Laboratory, 325, Broadway, Boulder, Boulder County, Colorado, 80305, United States" office government 0.501 United States FALSE
+north dakota state university us Americas Northern America FALSE 2 2021-02-03 127054506 way "North Dakota State University, 13th Avenue North, Roosevelt/NDSU, Fargo, Cass County, North Dakota, 58102, United States" amenity university 0.852950729263141 United States FALSE
+north-west university us Americas Northern America FALSE 2 2021-02-03 133962677 way "Northwest University, 5520, 108th Avenue Northeast, Kirkland, King County, Washington, 98033, United States" amenity university 0.64030088440925 United States FALSE
+northern illinois university in dekalb us Americas Northern America FALSE 2 2021-02-03 192458528 way "Northern Illinois University, Stadium Drive, DeKalb, DeKalb County, Illinois, 60115, United States" amenity university 0.501 United States FALSE
+northrop grumman us Americas Northern America FALSE 2 2021-02-03 240632398 way "Northrop Grumman, Mesa, Maricopa County, Arizona, United States" landuse industrial 0.4 United States FALSE
+northwestern university feinberg school of medicine us Americas Northern America FALSE 2 2021-02-03 2270537 node "Northwestern University Feinberg School of Medicine, East Superior Street, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States" amenity school 0.945725205949526 United States FALSE
+nps us Americas Northern America FALSE 2 2021-02-03 132103655 way "Martin Luther King Jr. National Historic Site, 450, Auburn Avenue Northeast, Sweet Auburn, Atlanta, Fulton County, Georgia, 30312, United States" tourism museum 0.387764501888856 United States FALSE
+nssc us Americas Northern America FALSE 2 2021-02-03 153141063 way "NSSC, CSS-1, CSS-3, Clark Street, Waipahu, Honolulu County, Hawaii, 9818, United States" office government 0.101 United States FALSE
+nvidia us Americas Northern America FALSE 2 2021-02-03 101896241 way "Nvidia, Santa Clara, Santa Clara County, California, United States" landuse commercial 0.3 United States FALSE
+oh us Americas Northern America FALSE 2 2021-02-03 295875618 relation "Ohio, United States" boundary administrative 0.8407357649767 United States FALSE
+oneweb us Americas Northern America FALSE 2 2021-02-03 219129611 way "OneWeb Satellites Manufacturing Facility, Odyssey Way, Brevard County, Florida, United States" building industrial 0.447724269818501 United States FALSE
+pacific gas and electric company us Americas Northern America FALSE 2 2021-02-03 144924090 way "Pacific Gas and Electric Company, 6121, Bollinger Canyon Road, Bishop Ranch Business Park, San Ramon, Contra Costa County, California, 94583, United States" building yes 0.501 United States FALSE
+pamela us Americas Northern America FALSE 2 2021-02-03 86413400 way "Pamela, Taylor, Wayne County, Michigan, 48180, United States" highway residential 0.2 United States FALSE
+parker foundation us Americas Northern America FALSE 2 2021-02-03 185560955 way "Allen Park, Metropolitan, Monahans, Ward County, Texas, United States" leisure park 0.15 United States FALSE
+parker institute us Americas Northern America FALSE 2 2021-02-03 297677026 way "Quad Park, Institute, Jefferson, Kanawha County, West Virginia, United States" leisure park 0.25 United States FALSE
+peninsula medical school us Americas Northern America FALSE 2 2021-02-03 191165616 way "Peninsula Regional Medical Center, 100, East Carroll Street, Salisbury, Wicomico County, Maryland, 21801, United States" amenity hospital 0.46691348680426 United States FALSE
+penn state us Americas Northern America FALSE 2 2021-02-03 258601905 relation "Penn State University, Mount Nittany Expressway, Houserville, College Township, Centre County, Pennsylvania, 16802-2604, United States" amenity university 0.762656889872636 United States FALSE
+personal genome diagnostics us Americas Northern America FALSE 2 2021-02-03 54194328 node "Personal Genome Diagnostics (PGDx), 2809, Boston Street, Canton, Baltimore, Maryland, 21224, United States" office company 0.301 United States FALSE
+pg&e us Americas Northern America FALSE 2 2021-02-03 105553435 way "PG&E, Fresno, Fresno County, California, United States" landuse industrial 0.4 United States FALSE
+piper jaffray us Americas Northern America FALSE 2 2021-02-03 11509658 node "Piper Jaffray, 53, Vantis Drive, Vantis, Aliso Viejo, Orange County, California, 92656, United States" shop financial_services 0.201 United States FALSE
+planetary society us Americas Northern America FALSE 2 2021-02-03 188431321 way "The Planetary Society, Cordova Street, Pasadena, Los Angeles County, California, 91129, United States" building yes 0.201 United States FALSE
+pomona college us Americas Northern America FALSE 2 2021-02-03 193227969 way "Pomona College, Harrison Avenue, Claremont, Los Angeles County, California, 91711, United States" amenity university 0.649611830504229 United States FALSE
+portland state university us Americas Northern America FALSE 2 2021-02-03 258656375 relation "Portland State University, Southwest Terwilliger Boulevard, Marquam Hill, Homestead, Portland, Metro, Oregon, 97201, United States" amenity university 0.773801459429994 United States FALSE
+post us Americas Northern America FALSE 2 2021-02-03 259216694 relation "Post, Garza County, Texas, United States" boundary administrative 0.567279572790411 United States FALSE
+preparedness and response branch us Americas Northern America FALSE 2 2021-02-03 2976629 node "Office of Emergency Preparedness and Response, 3661, East Virginia Beach Boulevard, Ingleside, Norfolk, Virginia, 23502, United States" amenity public_building 0.301 United States FALSE
+purdue us Americas Northern America FALSE 2 2021-02-03 87684719 way "Purdue, Auburn Heights, Auburn Hills, Oakland County, Michigan, 48326-2766, United States" highway residential 0.2 United States FALSE
+qualcomm us Americas Northern America FALSE 2 2021-02-03 98480927 way "Qualcomm, 10555, Sorrento Valley Road, San Diego, San Diego County, California, 92140, United States" building yes 0.101 United States FALSE
+rand corporation us Americas Northern America FALSE 2 2021-02-03 259211702 relation "RAND Corporation, Main Street, Santa Monica, Los Angeles County, California, 90401-2405, United States" building office 0.201 United States FALSE
+relativistic heavy ion collider us Americas Northern America FALSE 2 2021-02-03 258938147 relation "NSLS II, Brookhaven National Laboratory, Suffolk County, New York, 11961, United States" place locality 0.225 United States FALSE
+rensselaer polytechnic institute in troy us Americas Northern America FALSE 2 2021-02-03 259514286 relation "Rensselaer Polytechnic Institute, 110, 8th Street, Downtown, City of Troy, Rensselaer County, New York, 12180, United States" amenity university 0.985127795668338 United States FALSE
+research on research institute us Americas Northern America FALSE 2 2021-02-03 175713833 way "Buck Institute for Research on Aging, 8001, Redwood Boulevard, Novato, Marin County, California, 94945, United States" place house 0.712019878936673 United States FALSE
+rockefeller foundation us Americas Northern America FALSE 2 2021-02-03 302150637 node "Rockefeller Foundation, 420, 5th Avenue, Midtown South, Manhattan Community Board 5, Manhattan, New York County, New York, 10035, United States" office foundation 0.201 United States FALSE
+rowan university us Americas Northern America FALSE 2 2021-02-03 96572300 way "Rowan University, High Street West, Glassboro, Gloucester County, New Jersey, 08028, United States" amenity university 0.601881525490356 United States FALSE
+rti international us Americas Northern America FALSE 2 2021-02-03 161347827 way "RTI International, Durham County, North Carolina, United States" landuse commercial 0.4 United States FALSE
+rutgers us Americas Northern America FALSE 2 2021-02-03 246008043 way "Rutgers, Cherry Street, Two Bridges, Manhattan Community Board 3, Manhattan, New York County, New York, 10002, United States" building yes 0.101 United States FALSE
+saint louis zoo us Americas Northern America FALSE 2 2021-02-03 96373365 way "Saint Louis Zoo, 1, Government Drive, City of Saint Louis, Missouri, 63110, United States" tourism zoo 0.623386683132434 United States FALSE
+san diego natural history museum us Americas Northern America FALSE 2 2021-02-03 108650649 way "San Diego Natural History Museum, Plaza de Balboa, San Diego, San Diego County, California, United States" tourism museum 0.83489332460211 United States FALSE
+san diego state university us Americas Northern America FALSE 2 2021-02-03 259507492 relation "San Diego State University, 1, Campanile Mall, Montezuma Mesa, Del Cerro, San Diego, San Diego County, California, 92182, United States" amenity university 0.909716528793983 United States FALSE
+san josé state university us Americas Northern America FALSE 2 2021-02-03 258921314 relation "San José State University, Woodborough Place, San Jose, Santa Clara County, California, 95116-2246, United States" amenity university 0.896654046833393 United States FALSE
+security board us Americas Northern America FALSE 2 2021-02-03 48301592 node "Social Security Administration, 123, William Street, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10038, United States" office government 0.201 United States FALSE
+sharp us Americas Northern America FALSE 2 2021-02-03 258286474 relation "Sharp County, Arkansas, United States" boundary administrative 0.596809881048835 United States FALSE
+sierra club us Americas Northern America FALSE 2 2021-02-03 129277947 way "Yosemite Conservation Heritage Center, Valley Loop Trail, Curry Village, Mariposa County, California, 95389, United States" tourism museum 0.349235472656649 United States FALSE
+sloan digital sky survey us Americas Northern America FALSE 2 2021-02-03 3752682 node "Sloan Digital Sky Survey telescope, Apache Point Road, Otero County, New Mexico, 88349, United States" man_made telescope 0.401 United States FALSE
+smith college us Americas Northern America FALSE 2 2021-02-03 213618475 way "Smith College, Main Street, Northampton, Hampshire County, Massachusetts, 01060, United States" amenity college 0.201 United States FALSE
+smithsonian national air and space museum us Americas Northern America FALSE 2 2021-02-03 106698268 way "National Air and Space Museum, 655, Jefferson Drive Southwest, Washington, District of Columbia, 20560, United States" tourism museum 0.942899315724623 United States FALSE
+southern illinois university us Americas Northern America FALSE 2 2021-02-03 196119226 way "Southern Illinois University, University Park Drive, Edwardsville, Madison County, Illinois, 62025, United States" amenity university 0.301 United States FALSE
+stanford university in california us Americas Northern America FALSE 2 2021-02-03 97833344 way "Stanford University, 408, Panama Mall, Stanford, Santa Clara County, California, 94305, United States" amenity university 0.955492545367418 United States FALSE
+stantec consulting us Americas Northern America FALSE 2 2021-02-03 302290273 node "Stantec Consulting, 584, West 5th Avenue, Naperville, DuPage County, Illinois, 60563, United States" place house 0.201 United States FALSE
+state oceanic administration us Americas Northern America FALSE 2 2021-02-03 477271 node "Oceanic, Rumson, Monmouth County, New Jersey, 07760, United States" place hamlet 0.542954744060451 United States FALSE
+stetson university us Americas Northern America FALSE 2 2021-02-03 258984879 relation "Stetson University, 421, DeLand Greenway, DeLand, Volusia County, Florida, 32723, United States" amenity university 0.601059138797379 United States FALSE
+swarthmore college us Americas Northern America FALSE 2 2021-02-03 258051478 relation "Swarthmore College, 500, College Avenue, Swarthmore, Delaware County, Pennsylvania, 19081, United States" amenity university 0.691042593901044 United States FALSE
+teva pharmaceuticals us Americas Northern America FALSE 2 2021-02-03 188636672 way "Teva Pharmaceuticals, 1090, Horsham Road, Montgomeryville, North Wales, Montgomery County, Pennsylvania, 19454, United States" building industrial 0.201 United States FALSE
+texas a&m university in corpus christi us Americas Northern America FALSE 2 2021-02-03 81754693 node "Texas A&M University, Ocean Drive, Corpus Christi, Nueces County, Texas, 78418, United States" highway bus_stop 0.601 United States FALSE
+texas commission on environmental quality us Americas Northern America FALSE 2 2021-02-03 134581871 way "Texas Commission on Environmental Quality, South Interstate 35, Parker Lane, Austin, Travis County, Texas, 78704-5639, United States" building yes 0.501 United States FALSE
+the new york times us Americas Northern America FALSE 2 2021-02-03 138755486 way "The New York Times, Woodbridge Avenue, Bonhamtown, Edison, Middlesex County, New Jersey, 08818, United States" building warehouse 0.401 United States FALSE
+the university of texas md anderson cancer center us Americas Northern America FALSE 2 2021-02-03 103450497 way "University of Texas MD Anderson Cancer Center, 1515, Holcombe Boulevard, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity hospital 1.04319043229938 United States FALSE
+the washington post us Americas Northern America FALSE 2 2021-02-03 259037983 relation "Washington, District of Columbia, United States" boundary administrative 0.849288898611582 United States FALSE
+thermo fisher scientific us Americas Northern America FALSE 2 2021-02-03 192725475 way "Thermo-Fisher Scientific, Northeast Hillsboro, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, United States" landuse industrial 0.5 United States FALSE
+time us Americas Northern America FALSE 2 2021-02-03 258313454 relation "Time, Pike County, Illinois, United States" boundary administrative 0.524684773212593 United States FALSE
+time machine us Americas Northern America FALSE 2 2021-02-03 256915027 way "Time Machine, 4600, Sea Breeze, Rochester, Monroe County, New York, 14622, United States" natural scree 0.4 United States FALSE
+transportation us Americas Northern America FALSE 2 2021-02-03 248523248 way "Transportation, Willard, Greene County, Missouri, 65781, United States" highway unclassified 0.2 United States FALSE
+trump administration us Americas Northern America FALSE 2 2021-02-03 445769 node "Trump, Baltimore County, Maryland, 21161, United States" place hamlet 0.375244632729739 United States FALSE
+turner us Americas Northern America FALSE 2 2021-02-03 258422326 relation "Turner County, South Dakota, United States" boundary administrative 0.573546604210725 United States FALSE
+un children's fund us Americas Northern America FALSE 2 2021-02-03 3035691 node "Children's Trust Fund Resource Library, 350, Washington Street, Downtown Crossing, Financial District, Boston, Suffolk County, Massachusetts, 02110-1301, United States" amenity library 0.401 United States FALSE
+unavco us Americas Northern America FALSE 2 2021-02-03 125153322 way "UNAVCO, Inc, 6350, Nautilus Drive, Boulder, Boulder County, Colorado, 80301, United States" building office 0.26265143530573 United States FALSE
+united states department of agriculture us Americas Northern America FALSE 2 2021-02-03 21512544 node "United States Department of Agriculture, Jefferson Drive Southwest, Washington, District of Columbia, 20013, United States" office government 0.501 United States FALSE
+universities us Americas Northern America FALSE 2 2021-02-03 58939938 node "Universities, Troost Avenue, Kansas City, Jackson County, Missouri, 64131, United States" highway bus_stop 0.101 United States FALSE
+university of alaska anchorage us Americas Northern America FALSE 2 2021-02-03 230804355 way "University of Alaska Anchorage, 3211, Providence Drive, Anchorage, Alaska, 99508, United States" amenity university 0.795478606702112 United States FALSE
+university of athens us Americas Northern America FALSE 2 2021-02-03 259130044 relation "University of Georgia, East Green Street, Athens-Clarke County Unified Government, Athens-Clarke County, Georgia, 30602, United States" amenity university 0.854309471737941 United States FALSE
+university of california at santa barbara us Americas Northern America FALSE 2 2021-02-03 205319990 way "University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States" place locality 0.725 United States FALSE
+university of california hastings college us Americas Northern America FALSE 2 2021-02-03 163487930 way "University of California, Hastings College of the Law, Larkin Street, Civic Center, San Francisco, San Francisco City and County, California, 94102, United States" amenity university 0.882401781952281 United States FALSE
+university of california in santa cruz us Americas Northern America FALSE 2 2021-02-03 75590962 node "University of California, Santa Cruz, Coolidge Drive, Santa Cruz, Santa Cruz County, California, 95064, United States" tourism information 0.501 United States FALSE
+university of california los angeles us Americas Northern America FALSE 2 2021-02-03 258998179 relation "University of California, Los Angeles, Westholme Avenue, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity university 0.501 United States FALSE
+university of california san francisco us Americas Northern America FALSE 2 2021-02-03 99733448 way "University of California, San Francisco, Irving Street, Inner Sunset, San Francisco, San Francisco City and County, California, 94122, United States" amenity university 0.979827038246968 United States FALSE
+university of california santa cruz us Americas Northern America FALSE 2 2021-02-03 224580983 way "University of California Santa Cruz, CA 9, Santa Cruz, Santa Cruz County, California, 95064, United States" amenity university 1.00220825756689 United States FALSE
+"university of california, merced" us Americas Northern America FALSE 2 2021-02-03 129779241 way "University of California, Merced, 5200, Mineral King Road, Merced County, California, 95343, United States" amenity university 0.813735597530124 United States FALSE
+"university of california, riverside" us Americas Northern America FALSE 2 2021-02-03 33709158 node "UCR ARTSblock, 3824, Main Street, Riverside, Riverside County, California, 92501, United States" tourism museum 0.458218474293395 United States FALSE
+university of denver us Americas Northern America FALSE 2 2021-02-03 14604373 node "University of Denver, 1901, East Buchtel Boulevard, Denver, Denver County, Colorado, 80210, United States" railway station 0.466903631515068 United States FALSE
+university of maryland at college park us Americas Northern America FALSE 2 2021-02-03 198712103 way "University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States" amenity university 1.15966453785279 United States FALSE
+"university of maryland, college park" us Americas Northern America FALSE 2 2021-02-03 198712103 way "University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States" amenity university 1.05966453785279 United States FALSE
+"university of massachusetts," us Americas Northern America FALSE 2 2021-02-03 75830459 node "Cold Spring Orchard, 391, Sabin Street, Cold Spring, Belchertown, Hampshire County, Massachusetts, 01009, United States" shop farm 0.101 United States FALSE
+university of memphis us Americas Northern America FALSE 2 2021-02-03 103281268 way "The University of Memphis, University, Normal, Memphis, Shelby County, Tennessee, 38152, United States" amenity university 0.779389836000794 United States FALSE
+university of minnesota duluth us Americas Northern America FALSE 2 2021-02-03 117000042 way "University of Minnesota Duluth, West Saint Marie Street, Duluth, Saint Louis County, Minnesota, 55803, United States" amenity university 0.808420514850446 United States FALSE
+university of mississippi medical center us Americas Northern America FALSE 2 2021-02-03 198707196 way "University of Mississippi Medical Center, 2500, North State Street, Woodland Hills, Jackson, Hinds County, Mississippi, 39216, United States" amenity hospital 0.820054390558144 United States FALSE
+university of nebraska-lincoln us Americas Northern America FALSE 2 2021-02-03 105525403 way "Sheldon Museum of Art, North 12th Street, Downtown, Haymarket, Lincoln, Lancaster County, Nebraska, 68588-0300, United States" tourism gallery 0.603230229325644 United States FALSE
+university of north texas us Americas Northern America FALSE 2 2021-02-03 259116319 relation "University of North Texas, 1155, Union Circle, Denton, Denton County, Texas, 76203, United States" amenity university 0.884465837950001 United States FALSE
+university of pittsburgh medical center us Americas Northern America FALSE 2 2021-02-03 258622513 relation "University of Pittsburgh, Strip District, Pittsburgh, Allegheny County, Pennsylvania, United States" amenity university 0.870726964523873 United States FALSE
+university of southern california in los angeles us Americas Northern America FALSE 2 2021-02-03 128225751 way "University of Southern California, West Jefferson Boulevard, University Park, Los Angeles, Los Angeles County, California, 90089, United States" amenity university 1.21587616839984 United States FALSE
+university of texas marine science institute us Americas Northern America FALSE 2 2021-02-03 202308911 way "University of Texas Marine Science Institute, 750, Channel View Drive, Port Aransas, Nueces County, Texas, 78373, United States" amenity university 0.601 United States FALSE
+university of ulster us Americas Northern America FALSE 2 2021-02-03 43591523 node "University Police, Southside Loop Road, New Paltz, Town of New Paltz, Ulster County, New York, 12561, United States" amenity police 0.301 United States FALSE
+us census bureau us Americas Northern America FALSE 2 2021-02-03 64680847 node "US Census Bureau, 32, Old Slip, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10005, United States" office government 0.567719150556049 United States FALSE
+us federal bureau of investigation us Americas Northern America FALSE 2 2021-02-03 295889146 relation "Federal Bureau of Investigation, 935, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20535, United States" amenity police 0.742718151065986 United States FALSE
+us federal trade commission us Americas Northern America FALSE 2 2021-02-03 258221902 relation "Federal Trade Commission, 600, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20565, United States" office government 0.474617736328324 United States FALSE
+us justice department us Americas Northern America FALSE 2 2021-02-03 75624556 node "US Justice Department, 9257, Lee Avenue, Manassas, Prince William County, Virginia, 20110, United States" office government 0.301 United States FALSE
+us national science board us Americas Northern America FALSE 2 2021-02-03 12578717 node "NYU School of Medicine, 562, 1st Avenue, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10017-6927, United States" amenity university 0.499286093607089 United States FALSE
+us national security agency us Americas Northern America FALSE 2 2021-02-03 135361590 way "National Security Agency, Anne Arundel County, Maryland, United States" landuse government 0.866177100706018 United States FALSE
+usfws us Americas Northern America FALSE 2 2021-02-03 126924258 way "USFWS, Gallatin County, Montana, United States" boundary protected_area 0.225 United States FALSE
+vanderbilt us Americas Northern America FALSE 2 2021-02-03 257898818 relation "Vanderbilt, Fayette County, Pennsylvania, United States" boundary administrative 0.400938798149577 United States FALSE
+vermont law school us Americas Northern America FALSE 2 2021-02-03 2406305 node "Vermont Law School, Chelsea Street, South Royalton, Royalton, Windsor County, Vermont, 05068, United States" amenity school 0.612795139465266 United States FALSE
+villanova university us Americas Northern America FALSE 2 2021-02-03 106294586 way "Villanova University, Aldwyn Lane, Villanova, Radnor, Radnor Township, Delaware County, Pennsylvania, 19085, United States" amenity university 0.700710894545203 United States FALSE
+virginia polytechnic institute and state university us Americas Northern America FALSE 2 2021-02-03 258252884 relation "Virginia Polytechnic Institute and State University, Drillfield Drive, Blacksburg, Montgomery County, Virginia, 24061, United States" amenity university 1.12437784952094 United States FALSE
+vocs us Americas Northern America FALSE 2 2021-02-03 302296009 node "Voc's Westside Pizza, 273, West Main Street, Thamesville, Norwich, New London County, Connecticut, 06360, United States" amenity restaurant 0.001 United States FALSE
+vu university medical center us Americas Northern America FALSE 2 2021-02-03 201868510 way "The Vue, Fayetteville, Washington County, Arkansas, United States" place neighbourhood 0.35 United States FALSE
+w. m. keck observatory us Americas Northern America FALSE 2 2021-02-03 102803081 way "W. M. Keck Observatory, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made observatory 0.890613845045925 United States FALSE
+wake forest school of medicine us Americas Northern America FALSE 2 2021-02-03 33980201 node "Wake Forest School of Medicine, 1, Medical Center Boulevard, Ardmore, Winston-Salem, Forsyth County, North Carolina, 27157, United States" amenity university 0.755351334110971 United States FALSE
+walgreens us Americas Northern America FALSE 2 2021-02-03 210267533 way "Walgreens, Westwood Manor, Ardencroft, New Castle County, Delaware, United States" landuse retail 0.3 United States FALSE
+walter reed army institute of research us Americas Northern America FALSE 2 2021-02-03 179850833 way "Walter Reed Army Institute of Research, Robert Grant Avenue, Linden, Lyttonsville, Silver Spring, Montgomery County, Maryland, 20895-3199, United States" office research 0.601 United States FALSE
+warner us Americas Northern America FALSE 2 2021-02-03 257311026 relation "Warner, Brown County, South Dakota, 57479, United States" boundary administrative 0.448159836291227 United States FALSE
+washington post us Americas Northern America FALSE 2 2021-02-03 259037983 relation "Washington, District of Columbia, United States" boundary administrative 0.849288898611582 United States FALSE
+wesleyan university us Americas Northern America FALSE 2 2021-02-03 259300886 relation "Wesleyan University, High Street, Middletown, Middlesex County, Connecticut, 06457, United States" amenity university 0.717126371953885 United States FALSE
+western washington university us Americas Northern America FALSE 2 2021-02-03 16114905 node "Campus Services, 2001, Bill McDonald Parkway, WWU, Bellingham, Whatcom County, Washington, 98225-8225, United States" tourism information 0.101 United States FALSE
+white house office of management and budget us Americas Northern America FALSE 2 2021-02-03 152300809 way "Office of Management and Budget, 254, Calle Cruz, La Perla, San Juan Antiguo, San Juan, Puerto Rico, 00901, United States" office government 0.501 United States FALSE
+whitman college us Americas Northern America FALSE 2 2021-02-03 2986474 node "Whitman College, Princeton, Mercer County, New Jersey, 08544, United States" place locality 0.325 United States FALSE
+williams college us Americas Northern America FALSE 2 2021-02-03 2700617 node "Williams College, Hopkins Hall Drive, Williamstown, Berkshire County, Massachusetts, 01267, United States" amenity college 0.705335713109323 United States FALSE
+wisconsin national primate research center us Americas Northern America FALSE 2 2021-02-03 131313097 way "Wisconsin National Primate Research Center, 1220, Capitol Court, South Campus, Bowens Addition, Madison, Dane County, Wisconsin, 53715, United States" building university 0.501 United States FALSE
+wri us Americas Northern America FALSE 2 2021-02-03 229580679 way "McGuire Air Force Base, Polking Road, New Hanover Township, Burlington County, New Jersey, 08641, United States" aeroway aerodrome 0.461279597273909 United States FALSE
+wyss institute us Americas Northern America FALSE 2 2021-02-03 22973651 node "Wyss Institute, 3, Blackfan Street, Boston, Suffolk County, Massachusetts, 02120, United States" office research 0.201 United States FALSE
+xcor aerospace us Americas Northern America FALSE 2 2021-02-03 296995407 way "Xcor Aerospace, Earhart Drive, Midland Spaceport Business Park, Midland, Midland County, Texas, United States" aeroway hangar 0.201 United States FALSE
+yerkes national primate research center us Americas Northern America FALSE 2 2021-02-03 3028732 node "Yerkes Primate Research Center, Gatewood Road Northeast, Druid Hills, DeKalb County, Georgia, 30329, United States" building yes 0.401 United States FALSE
+makerere university ug Africa Eastern Africa FALSE 2 2021-02-03 171750869 way "Makerere University, Makerere Hill Road, Makerere Kivulu, Nakulabye, Kampala Capital City, Kampala, Central Region, P.O BOX 9 MBARARA, Uganda" amenity university 0.655626604417121 Uganda FALSE
+risk network ug Africa Eastern Africa FALSE 2 2021-02-03 63292544 node "Children At Risk Action Network, Willis Road, Namirembe, Mengo, Kampala Capital City, Kampala, Central Region, 33903, Uganda" office association 0.201 Uganda FALSE
+ashg ua Europe Eastern Europe FALSE 2 2021-02-03 182600471 way "м.Южне, Ð<90>ШГ, Хіміків вулицÑ<8f>, Южне, ОдеÑ<81>ький район, ОдеÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 65481-65489, Україна" amenity school 0.001 Україна FALSE
+bogolyubov institute for theoretical physics ua Europe Eastern Europe FALSE 2 2021-02-03 117826903 way "ІнÑ<81>титут теоретичної фізики ім. Ðœ.Ðœ. Боголюбова Ð<9d>Ð<90>Ð<9d> України, 14б/1, Метрологічна вулицÑ<8f>, Ñ<81>елище Ð<9d>аукове, ФеофаніÑ<8f>, ГолоÑ<81>іївÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 03143, Україна" office research 0.001 Україна FALSE
+tokyo medical university ua Europe Eastern Europe FALSE 2 2021-02-03 17911626 node "Медичний універÑ<81>итет, ЛичаківÑ<81>ька вулицÑ<8f>, Личаків, ЛичаківÑ<81>ький район, Львів, ЛьвівÑ<81>ька міÑ<81>ька громада, ЛьвівÑ<81>ький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 79010, Україна" railway tram_stop 0.001 Україна FALSE
+ua ua Europe Eastern Europe FALSE 2 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна FALSE
+uea ua Europe Eastern Europe FALSE 2 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна FALSE
+national institute for medical research tz Africa Eastern Africa FALSE 2 2021-02-03 68851905 node "National Institute for Medical Research, Makuburi Rd, Makuburi, Dar es Salaam, Coastal Zone, 21493, Tanzania" office educational_institution 0.501 Tanzania FALSE
+national sun yat-sen university tw Asia Eastern Asia FALSE 2 2021-02-03 259320035 relation "國立ä¸å±±å¤§å¸, 70, 蓮海路, 桃æº<90>里, 鼓山å<8d>€, 高雄市, 804, 臺ç<81>£" amenity university 0.444647217327514 臺ç<81>£ FALSE
+adf tr Asia Western Asia FALSE 2 2021-02-03 122265582 way "Adıyaman Havalimanı, 02-26, Adıyaman merkez, Adıyaman, Güneydoğu Anadolu Bölgesi, Türkiye" aeroway aerodrome 0.274532111506442 Türkiye FALSE
+eric tr Asia Western Asia FALSE 2 2021-02-03 15819058 node "Eriç, Kemah, Erzincan, Doğu Anadolu Bölgesi, Türkiye" place village 0.289139026272805 Türkiye FALSE
+middle east technical university tr Asia Western Asia FALSE 2 2021-02-03 259201298 relation "Orta Doğu Teknik Üniversitesi, 1, 1580. Sokak, Çiğdem Mahallesi, Ankara, Çankaya, Ankara, İç Anadolu Bölgesi, 06800, Türkiye" amenity university 0.473631673098451 Türkiye FALSE
+nif tr Asia Western Asia FALSE 2 2021-02-03 302529699 node "Nif, Fethiye, Muğla, Ege Bölgesi, Türkiye" place village 0.375 Türkiye FALSE
+european bank for reconstruction and development tm Asia Central Asia FALSE 2 2021-02-03 48191450 node "European Bank for Reconstruction and Development, 82, Atatürk (1972) köçesi, Berzeňňi (Berzengi), Aşgabat, Köpetdag etraby, 744000, Türkmenistan" amenity bank 0.601 Türkmenistan FALSE
+nma th Asia South-Eastern Asia FALSE 2 2021-02-03 258233320 relation "จังหวัดนครราชสีมา, ประเทศไทย" boundary administrative 0.493204619476859 ประเทศไทย FALSE
+pri th Asia South-Eastern Asia FALSE 2 2021-02-03 258679311 relation "จังหวัดปราจีนบุรี, ประเทศไทย" boundary administrative 0.47016384498111 ประเทศไทย FALSE
+togo tg Africa Western Africa FALSE 2 2021-02-03 257546531 relation Togo boundary administrative 0.759992633432734 Togo FALSE
+swaziland sz Africa Southern Africa FALSE 2 2021-02-03 257310894 relation eSwatini boundary administrative 0.621640856732353 eSwatini FALSE
+african institute for mathematical sciences sn Africa Western Africa FALSE 2 2021-02-03 245500132 way "African Institute for Mathematical Sciences, Accès IRD, M'bour, Thiès, 23000, Sénégal" amenity university 0.501 Sénégal FALSE
+ras sk Europe Eastern Europe FALSE 2 2021-02-03 258705009 relation "HraÅ¡ovÃk, okres KoÅ¡ice - okolie, KoÅ¡ický kraj, Východné Slovensko, Slovensko" boundary administrative 0.468214832002329 Slovensko FALSE
+goce si Europe Southern Europe FALSE 2 2021-02-03 4307950 node "GoÄ<8d>e, Vipava, 5271, Slovenija" place village 0.311234742212342 Slovenija FALSE
+university of ljubljana si Europe Southern Europe FALSE 2 2021-02-03 146644115 way "Astronomsko geofizikalni observatorij Golovec, 25, Pot na Golovec, Rakovnik, Ljubljana, Upravna Enota Ljubljana, 1000, Slovenija" tourism attraction 0.387641222780259 Slovenija FALSE
+essec business school sg Asia South-Eastern Asia FALSE 2 2021-02-03 184053844 way "ESSEC Business School, Asia-Pacific, Nepal Park, Nepal Hill, Queenstown, Southwest, 138502, Singapore" building school 0.301 Singapore FALSE
+atcc se Europe Northern Europe FALSE 2 2021-02-03 91884358 way "LFV ATCC, Luftleden, Sigtuna kommun, Stockholms län, 19060, Sverige" building office 0.101 Sverige FALSE
+ecdc se Europe Northern Europe FALSE 2 2021-02-03 95487742 way "Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige" office government 0.450936419284163 Sverige FALSE
+naver se Europe Northern Europe FALSE 2 2021-02-03 80191509 node "Näver, Årjängs kommun, Värmlands län, Sverige" place isolated_dwelling 0.2 Sverige FALSE
+the sudan sd Africa Northern Africa FALSE 2 2021-02-03 258367505 relation السودان boundary administrative 0.696406722929938 السودان FALSE
+university of khartoum sd Africa Northern Africa FALSE 2 2021-02-03 164806297 way "جامعة الخرطوم, شارع النيل, قاردن سيتي, الخرطوم, ولاية الخرطوم, 11111, السودان" amenity university 0.401608614050897 السودان FALSE
+leru sb Oceania Melanesia FALSE 2 2021-02-03 103487137 way "Leru, Central, Solomon Islands" place island 0.425 Solomon Islands FALSE
+dian fossey gorilla fund international rw Africa Eastern Africa FALSE 2 2021-02-03 155569354 way "The Dian Fossey Gorilla Fund International, Ruhengeri - Gisenyi Road, Musanze, Muhoza, Musanze, Majyaruguru, Rwanda" office ngo 0.501 Rwanda FALSE
+university of rwanda rw Africa Eastern Africa FALSE 2 2021-02-03 241100019 way "Dusaidi Hostel, KN 7 Avenue, Nyamirambo, Kigali, Akarere ka Nyarugenge, Umujyi wa Kigali, 250, Rwanda" tourism hostel 0.101 Rwanda FALSE
+enso ru Europe Eastern Europe FALSE 2 2021-02-03 258512122 relation "СветогорÑ<81>к, СветогорÑ<81>кое городÑ<81>кое поÑ<81>еление, ВыборгÑ<81>кий район, ЛенинградÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Северо-Западный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place town 0.495333231609556 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+higher school of economics ru Europe Eastern Europe FALSE 2 2021-02-03 107832324 way "Ð<9d>ИУ ВШРСПб, ОП ФилологиÑ<8f>, 123, набережнаÑ<8f> канала Грибоедова, Ð<90>дмиралтейÑ<81>кий округ, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" amenity college 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+iaea ru Europe Eastern Europe FALSE 2 2021-02-03 258389991 relation "Ð<90>Ñ<8d>ропорт Игарка, улица Большого Театра, Игарка, городÑ<81>кое поÑ<81>еление Игарка, ТуруханÑ<81>кий район, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>кий край, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.435101173083885 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+isas ru Europe Eastern Europe FALSE 2 2021-02-03 258476402 relation "ИÑ<81>аÑ<81>, Голубовка, ГолубовÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, СедельниковÑ<81>кий район, ОмÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" waterway river 0.3 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lro ru Europe Eastern Europe FALSE 2 2021-02-03 5887081 node "ЛРО, переулок Шаронова, iTower, Ð<90>втовокзал, ЧкаловÑ<81>кий район, Екатеринбург, городÑ<81>кой округ Екатеринбург, СвердловÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, 620142, РоÑ<81>Ñ<81>иÑ<8f>" amenity police 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+polytechnic university ru Europe Eastern Europe FALSE 2 2021-02-03 8106175 node "ПолитехничеÑ<81>кий УниверÑ<81>итет, проÑ<81>пект Кирова, КировÑ<81>кий район, ТомÑ<81>к, городÑ<81>кой округ ТомÑ<81>к, ТомÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 634000, РоÑ<81>Ñ<81>иÑ<8f>" highway bus_stop 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+uct ru Europe Eastern Europe FALSE 2 2021-02-03 108073391 way "Ð<90>Ñ<8d>ропорт Ухта, РучейнаÑ<8f> улица, Подгорный, Ухта, городÑ<81>кой округ Ухта, РеÑ<81>публика Коми, Северо-Западный федеральный округ, 169302, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.428748587005153 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+niehs rs Europe Southern Europe FALSE 2 2021-02-03 258717718 relation "Град Ð<9d>иш, Ð<9d>ишавÑ<81>ки управни округ, Централна Србија, Србија" boundary administrative 0.581344117584867 Србија FALSE
+serbia rs Europe Southern Europe FALSE 2 2021-02-03 258556028 relation Србија boundary administrative 0.777253646015475 Србија FALSE
+babeş-bolyai university ro Europe Eastern Europe FALSE 2 2021-02-03 258406266 relation "Universitatea BabeÈ™-Bolyai, 1, Strada Mihail Kogălniceanu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400084, România" amenity university 0.593983489561696 România FALSE
+czi ro Europe Eastern Europe FALSE 2 2021-02-03 54133045 node "CZI srl, Șoseaua București-Alexandria, Drăgănești-Vlașca, Teleorman, 147135, România" shop convenience 0.101 România FALSE
+international service ro Europe Eastern Europe FALSE 2 2021-02-03 146925092 way "International Service, DN2A, Bora, Slobozia, Ialomița, 920001, România" shop car 0.201 România FALSE
+arv pt Europe Southern Europe FALSE 2 2021-02-03 259038370 relation "Arruda dos Vinhos, Lisboa, Oeste, Centro, Portugal" boundary administrative 0.413435317280238 Portugal FALSE
+hrt pt Europe Southern Europe FALSE 2 2021-02-03 259203953 relation "Horta, Faial, Açores, Portugal" boundary administrative 0.457605882150238 Portugal FALSE
+mdr pt Europe Southern Europe FALSE 2 2021-02-03 258777777 relation "Miranda do Douro, Bragança, Terras de Trás-os-Montes, Norte, Portugal" boundary administrative 0.448086827357741 Portugal FALSE
+mrt pt Europe Southern Europe FALSE 2 2021-02-03 258732826 relation "Mortágua, Viseu, Viseu Dão-Lafões, Centro, Portugal" boundary administrative 0.422968236493861 Portugal FALSE
+pbl pt Europe Southern Europe FALSE 2 2021-02-03 258744849 relation "Pombal, Leiria, Pinhal Litoral, Centro, Portugal" boundary administrative 0.439395713780888 Portugal FALSE
+ptb pt Europe Southern Europe FALSE 2 2021-02-03 258563650 relation "Ponte da Barca, Viana do Castelo, Alto Minho, Norte, Portugal" boundary administrative 0.42341787558624 Portugal FALSE
+al-quds university ps Asia Western Asia FALSE 2 2021-02-03 171696127 way "Al-Quds University, University Street, أبو ديس, שטח C, יהודה ושומרון, Palestinian Territory" amenity university 0.670940340656356 Palestinian Territory FALSE
+lg electronics pl Europe Eastern Europe FALSE 2 2021-02-03 99577118 way "LG Electronics, Mława-Wólka, Mława, powiat mławski, województwo mazowieckie, 06-500, Polska" highway residential 0.3 Polska FALSE
+ursus pl Europe Eastern Europe FALSE 2 2021-02-03 258751350 relation "Ursus, Warszawa, województwo mazowieckie, Polska" boundary administrative 0.454934934074513 Polska FALSE
+atrap pk Asia Southern Asia FALSE 2 2021-02-03 24498241 node "AtrÄ<81>p, ضلع آواران / Awaran, بلوچستان, پاکستان" place village 0.275 پاکستان FALSE
+data & society pk Asia Southern Asia FALSE 2 2021-02-03 54880380 node "Data Coach, یونیورسٹی روڈ, Gulshan-e-Iqbal Block 11, Gulshan-e-Iqbal, کراچی, سنڌ, 75300, پاکستان" highway bus_stop 0.101 پاکستان FALSE
+higher education commission pk Asia Southern Asia FALSE 2 2021-02-03 57649548 node "Higher Education Commission, Maqboolabad Road 11, Dawood Society, بÛ<81>ادر آباد, کراچی, سنڌ, 75460, پاکستان" office government 0.301 پاکستان FALSE
+lahore university of management sciences pk Asia Southern Asia FALSE 2 2021-02-03 107688614 way "Lahore University of Management Sciences, Street 18, Rehman Villas, Chung Khurad, Lahore District, پنجاب, 54792, پاکستان" amenity university 0.501 پاکستان FALSE
+pakistan meteorological department pk Asia Southern Asia FALSE 2 2021-02-03 250344164 way "Pakistan Meteorological Department, Bannu Road, Al-Waris Town, ڈیرÛ<81> اسماعیل خان, خیبر پښتونخوا, 29050, پاکستان" office government 0.301 پاکستان FALSE
+physics society of iran pk Asia Southern Asia FALSE 2 2021-02-03 55665155 node "Talha's Physics Academy, Begum Khursheed Road, Malir Town, Malir, کراچی, سنڌ, 75080, پاکستان" office educational_institution 0.101 پاکستان FALSE
+psi pk Asia Southern Asia FALSE 2 2021-02-03 48903686 node "Peshi, بلوچستان, پاکستان" railway station 0.435785692031318 پاکستان FALSE
+university of pk Asia Southern Asia FALSE 2 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان FALSE
+university of trieste pk Asia Southern Asia FALSE 2 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان FALSE
+climate science center ph Asia South-Eastern Asia FALSE 2 2021-02-03 244989659 way "Climate Change Center, Academic Avenue, Villa Isidra, Bagong Sikat, Nueva Ecija, Central Luzon, 3120, Luzon" building university 0.201 Luzon FALSE
+ecol ph Asia South-Eastern Asia FALSE 2 2021-02-03 301230341 way "Ecol, Purok 16, Commonwealth, 2nd District, Quezon City, Metro Manila, 1121, Luzon" highway residential 0.2 Luzon FALSE
+environmental change institute ph Asia South-Eastern Asia FALSE 2 2021-02-03 192350518 way "Institute of Climate Change and Environmental Management, Academic Avenue, Villa Isidra, Bagong Sikat, Nueva Ecija, Central Luzon, 3120, Luzon" building university 0.301 Luzon FALSE
+icct ph Asia South-Eastern Asia FALSE 2 2021-02-03 66980232 node "ICCT College, Manila East Road, Grand Monaco Casa Royale, Calumpang, Rizal, Calabarzon, 01940, Luzon" amenity college 0.101 Luzon FALSE
+institute of tropical medicine ph Asia South-Eastern Asia FALSE 2 2021-02-03 106986237 way "Research Institute for Tropical Medicine, Research Drive, Filinvest City, Alabang, Muntinlupa, Fourth District, Metro Manila, 1781, Luzon" amenity hospital 0.560958143076972 Luzon FALSE
+irri ph Asia South-Eastern Asia FALSE 2 2021-02-03 258457516 relation "International Rice Research Institute, Sampaguita, Masaya, Los Baños, Bay, Laguna, Calabarzon, 4031, Luzon" amenity research_institute 0.375700293936422 Luzon FALSE
+john arnold foundation ph Asia South-Eastern Asia FALSE 2 2021-02-03 80843435 node "Arnold Jansenn Catholic Mission Foundation, Inc., Luzviminda Road, Luzviminda 2, Bagong Bayan, Dasmariñas, Cavite, Calabarzon, 4115, Luzon" amenity social_facility 0.201 Luzon FALSE
+john hopkins university ph Asia South-Eastern Asia FALSE 2 2021-02-03 97992857 way "Johns Hopkins Street, Sampaloc 4, Bagong Bayan, University Hills Estate, Cavite, Calabarzon, 4115, Luzon" highway residential 0.4 Luzon FALSE
+medicare ph Asia South-Eastern Asia FALSE 2 2021-02-03 214582438 way "Medicare, SSS Employees Housing Project, North Fairview, 5th District, Quezon City, Metro Manila, 1118, Luzon" highway residential 0.2 Luzon FALSE
+new york supreme court ph Asia South-Eastern Asia FALSE 2 2021-02-03 81926168 node "New York Supreme, Plaridel Street, Nepo Center, Angeles, Pampanga, Central Luzon, 1992, Luzon" amenity restaurant 0.301 Luzon FALSE
+pinatubo ph Asia South-Eastern Asia FALSE 2 2021-02-03 300899502 way "Pinatubo, Clark Center Townhomes, Margot, Mabalacat, Pampanga, Central Luzon, 2010, Luzon" highway unclassified 0.2 Luzon FALSE
+ird pe Americas South America FALSE 2 2021-02-03 22294051 node "Institut de Recherche pour le Developpement, 455, Calle 17, Corpac, San Isidro, Lince, Lima, 27, Perú" office ngo 0.412830331815194 Perú FALSE
+ssrn pe Americas South America FALSE 2 2021-02-03 258244064 relation "Lima, Perú" boundary administrative 0.673001488378204 Perú FALSE
+tambopata national reserve pe Americas South America FALSE 2 2021-02-03 259211841 relation "Reserva Nacional Tambopata, Madre de Dios, Perú" boundary protected_area 0.407572334229807 Perú FALSE
+business pharma pa Americas Central America FALSE 2 2021-02-03 80340067 node "pharma, Calle E Norte, Barrio Manuel Quintero Villareal, David, Distrito David, ChiriquÃ, 7790414, Panamá" shop convenience 0.111 Panamá FALSE
+pdo om Asia Western Asia FALSE 2 2021-02-03 92974544 way "PDO, مسقط, عمان" landuse industrial 0.3 عمان FALSE
+nauru nr Oceania Micronesia FALSE 2 2021-02-03 257951954 relation Naoero boundary administrative 0.617910993005739 Naoero FALSE
+district court np Asia Southern Asia FALSE 2 2021-02-03 139879884 way "District Court, Dhulikhel, काà¤à¥<8d>रेपलाञà¥<8d>चोक, वागà¥<8d>मती पà¥<8d>रदेश, नेपाल" landuse commercial 0.4 नेपाल FALSE
+integrated mountain development np Asia Southern Asia FALSE 2 2021-02-03 76912703 node "Snowland Integrated Development Center, Great Himalaya Trail, Tallo Basti, Simikot, Simkot, हà¥<81>मà¥<8d>ला, मधà¥<8d>य-पशà¥<8d>चिमाञà¥<8d>चल विकास कà¥<8d>षेतà¥<8d>र, करà¥<8d>णाली पà¥<8d>रदेश, नेपाल" office ngo 0.201 नेपाल FALSE
+np np Asia Southern Asia FALSE 2 2021-02-03 298303229 relation नेपाल boundary administrative 0.709769815032436 नेपाल FALSE
+abdul latif jameel poverty action lab NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+abel committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+academia sinica institute of astronomy and astrophysics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of military medical sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+active tectonics and seafloor mapping laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced camera for surveys NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+aerosol and particle technology laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+african society of human genetics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency for healthcare research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+aids programme of research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+alexandria real estate equities NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+allen institute for cell science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance for a stronger fda NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+alpha magnetic spectrometer NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american anthropological association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american chemistry council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of medical genetics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american go association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for reproductive medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of civil engineers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of nephrology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of tropical medicine and hygiene NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+aquabounty NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+archives of internal medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+arena pharmaceuticals NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+arivale NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for women in mathematics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of australian medical research institutes NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of canadian universities for research in astronomy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of schools and programs of public health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of university technology managers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+atlantic multidecadal oscillation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+atmospheric chemistry and physics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+aurum institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian academy of technology and engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian animal health laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian human rights commission NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian labor party NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian research council centre of excellence for coral reef studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+avm biotechnology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+babylonians NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+banner alzheimer's institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+bgi research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+biodigitalvalley NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomolecular resources research infrastructure NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology and biological sciences research council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology industry research assistance council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg news NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+blue ribbon study panel on biodefense NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+bogor agricultural university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+boldlygo institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+bracewell & giuliani NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian democratic movement party NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian institute of environment and renewable natural resources NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian society of genetic medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+breakthrough listen NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+brian sciences unit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+british pharmacological society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+british science association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+burnet institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+buzzfeed news NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cabell's international NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+campaign for science & engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+canaccord genuity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian astronomy data centre NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian foundation for climate and atmospheric sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas institute of neuroscience NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+catalan institute for research and advanced studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of leuven (ku leuven NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ccamlr NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for alternatives to animal testing NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for american paleolithic research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for business law and regulation at case western reserve university school of law NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate and energy solutions NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate and life NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for clinical trials NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for computational astrophysics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"center for disease dynamics, economics and policy" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for genetics and society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for human rights in iran NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international climate and environmental research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"center for science, technology and congress" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for climate economics and policy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for genomic regulation in barcelona NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for global health research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for synthetic biology and innovation at imperial college london NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre of excellence for coral reef studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cern council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+changchun changsheng biotechnology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+charlotte lozier institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+chilean academy of science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+china initiative NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+china meteorological administration NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of zoology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese society for stem cell research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+chiron corporation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+christian democratic union NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean air scientific advisory committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cleantech group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate action tracker NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate change research centre NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate investigations center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate leadership council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr institute for sustainable plant protection NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs institute of plant molecular biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for responsible sharing NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+coastal response research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+codata NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+collaborative approach to meta analysis and review of animal data NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+competitive enterprise institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+conference of university presidents NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+congressional budget office NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortium for ocean leadership NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+consultative group on international agricultural research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+consultative group on international agriculture research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+continuous electron beam accelerator facility NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+copenhagen accord NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+copernicus atmosphere monitoring service NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+coral reef watch NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+côte d'azur observatory in nice NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for science and technology policy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of advisors on science and technology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of graduate schools NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of young scientists NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+court of appeals for the federal circuit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+crop trust NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cryogenic underground observatory for rare events NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+csiro staff association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cuban academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+daegu gyeongbuk institute of science and technology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+dagens nyheter NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+danish cancer society research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+datamonitor NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep space industries NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep underground science and engineering laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+defence science and technology laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"department for business, energy and industrial strategy" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"department for environment, food and rural affairs" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of health research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+doaj NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+drc ministry of health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke university marine laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke university's margolis center for health policy in durham NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+dusel research association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch national institute for subatomic physics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth innovation institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+editas medicine of cambridge NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+egfr NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+el niño southern oscillation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+eligo bioscience NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+eliminate dengue NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+elon musk NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+embo press NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+emergency committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy innovation hubs NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental investigation agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental observation network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental protection network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+epsrc NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ethiopian academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+eu policy at wellcome NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+eu research division NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+europe ecology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european centre for training and research in earthquake engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european consortium for ocean research drilling NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european council of ministers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european federation of pharmaceutical industries NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european mobile laboratory project NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european molecular biology laboratory-european bioinformatics institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european molecular biology organization NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european parliament and council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european research area board NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european research infrastructure consortium NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european universities association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+evandro chagas institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+facebook and twitter NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+falcon heavy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal science partners NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of australian scientific and technological societies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of young researchers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+feinberg school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+fogarty international center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+forensic science society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+framework programme NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+free university of berlin NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national institute of health and medical research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national research agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gairdner foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gamaleya national center of epidemiology and microbiology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gates foundation's global health program NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gavi alliance NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+general assembly of the united nations NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+general data protection regulation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic engineering appraisal committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetics society of china NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+georgia department of public health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+german centre for neurodegenerative diseases NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+german national metrology institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+german research center for environmental health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gfmc NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global climate and energy initiative NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global crop diversity trust NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global ecosystem dynamics investigation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global rust reference center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global weather corporation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global young academy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gns science research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google books NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google deepmind NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google life sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google lunar xprize NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google translate NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+government office for science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gran sasso national laboratories NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+great barrier reef foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+greek ephorate of underwater antiquities NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+group of eight NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gtc biotherapeutics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangzhou institutes of biomedicine and health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+guild of european research-intensive universities NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf of maine research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf of mexico research initiative NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gustave roussy institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+hadal science and technology research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+harte research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university press NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+heartland institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+heinrich heine university of düsseldorf NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+heising-simons foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz centre for environmental research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+henri poincaré institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+herzberg institute of astrophysics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education and research bill NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education policy institute in oxford NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on appropriations NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on oversight and government reform NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"house committee on science, space and technology" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of lords science and technology committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+howard hughes medical institute's janelia farm research campus NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+hse's institute of education NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+human fertilisation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+iarpa NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibs center for axion NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+impactstory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+imperial cancer research fund NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+impulsing paradigm change NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+inaf astronomical observatory of capdiomonte NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+inamori foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+independence party NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian council of agricultural research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institute of technology madras NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+inmed pharmaceuticals NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institut de physique du globe NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for ageing and health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for cell engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for coastal research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for developmental research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for european environmental policy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for foreign policy analysis NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for genome sciences and policy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for molecular medicine finland NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for mummies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for quality and efficiency in health care NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for research in biomedicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for science and international security NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"institute for science, society" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for scientific and technological research of san NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for sustainable development and international relations NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for sustainable plant protection NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of atmospheric sciences and climate NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of drug regulatory science at shenyang pharmaceutical university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of earth physics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of electronic structure and laser NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of scientific and technical information of china NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+intelligence advanced research projects activity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international aids society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of scientific NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cell line authentication committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international census of marine microbes NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international center for lightning research and testing NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for integrated mountain development NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission for the conservation of atlantic tunas NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international committee for future accelerators NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international continental scientific drilling program NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international council for science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international emissions trading association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international fertilizer industry association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international go federation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international human epigenome consortium NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international institute of molecular and cell biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international life sciences institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international linear collider NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international maize and wheat improvement center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international renewable energy agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international school for advanced studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international thwaites glacier collaboration NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international trade in endangered species of wild fauna NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+iodp NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ion torrent NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+israel antiquities authority NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+james s. mcdonnell foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan society for the promotion of science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins center for tuberculosis research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins kimmel cancer center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins school of advanced international studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint analysis group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+jordan atomic energy commission NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+joseph fourier university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of biological chemistry NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of mammalogy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of neuroscience NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaiser permanente washington health research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kamioka observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli institute for astronomy and astrophysics at peking university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kite pharma NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+koch institute for integrative cancer research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea polar research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kyoto university's research institute for mathematical sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory of dynamic meteorology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+lancet oncology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+large high altitude air shower observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"leavy, frank & delaney" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+leverhulme trust NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+liberal democrat member of parliament NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+linear accelerator laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+london natural history museum NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+lund observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+macmillan publishers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+macmillan science and education NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+maharashtra hybrid seeds company NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mahidol oxford tropical medicine research unit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mapp biopharmaceutical NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mars exploration program analysis group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mars science laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+martin luther university of halle-wittenberg NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for biogeochemistry NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for chemical physics of solids NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for molecular cell biology and genetics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for physics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of colloids and interfaces NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcdonnell boehnen hulbert & berghoff NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mdma NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+medicines for malaria venture NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mediterranean agronomic institute of bari NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mediterranean institute for biodiversity and ecology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mercator institute for china studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+meridiani planum NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mertz glacier NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+metrologists NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+minerals management service NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of earth sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of science, technology" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mit energy initiative NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+monsanto biotech NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mount sinai health system NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+multidisciplinary drifting observatory for the study of arctic climate NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+myheritage NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nagoya protocol NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanjing agricultural university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+narayan strategy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academy of medicine and national academy of engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agency for medicines and health products safety NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association for biomedical research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national astronomical observatory of japan NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for atmospheric research's high altitude observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for immunization and respiratory diseases NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for science education NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for immunisation research and surveillance NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for indigenous genomics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for scientific research in nice NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for space studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national climatic data center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national commission for scientific and technological research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national conservatory of arts and crafts NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council for research and development NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council of science and technology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for health and welfare NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for pharmaceutical research and development NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for research on safety NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of astrophysics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of diabetes NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of environmental health sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of medical research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on alcohol abuse and alcoholism NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on deafness NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institutes of allergy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national office for technology acquisition NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research universal NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"national research, development and innovation office" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science and technology institutes NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national tertiary education union NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national union of students NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of salta NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of singapore medical school NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural resource damage assessment NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncig NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+neon therapeutics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands organisation for scientific research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+new energy finance NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york air national guard NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york genome center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york stem cell foundation research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+newclimate institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+niaaa NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nicholson price NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih office of extramural research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's division of program coordination NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's national institute of general medical sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nikon small world NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nimal welfare federation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ninth international congress of vertebrate morphology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel prize committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+noel kempff mercado natural history museum NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nordic cochrane centre NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+north carolina a&t state university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+northern sky research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+northrop grumman aerospace systems NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+novogene NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nrdio NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear science advisory committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear suppliers group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean sciences meeting NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of integrative activities NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of naval research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ohrp NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+oklahoma corporation commission NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+omics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ontario institute for cancer research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+optics and electronics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+orbiting carbon observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+oswaldo cruz foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford nanopore NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford radiocarbon accelerator unit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific decadal oscillation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific northwest seismic network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+parker institute for cancer immunotherapy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+parker solar probe NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliamentary office of science and technology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pbl netherlands environmental assessment agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+peace research institute oslo NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pembina institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pennington biomedical research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pepfar NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+perseids NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+peta's laboratory investigations department NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew center on global climate change NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+plos biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+plos genetics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy cures research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+polish academy of sciences' mammal research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+premier biotech NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+prevention and public health fund NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+qimr berghofer medical research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+refractivity observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+regional aquatics monitoring program NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+reproductive genetics institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+research affairs at children's hospital boston NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+research assessment exercise NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+research council of norway NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+research institute for mathematical sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+revolutionary armed forces of colombia NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken center for biosystems dynamics research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken nishina center for accelerator NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+rossiyskaya gazeta NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+roswell park cancer institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society of biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society of canada NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal tyrrell museum of palaeontology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian corporation of nanotechnologies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian housing development foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian quantum center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sabin center for climate change law NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sagient research systems NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sanford underground laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sangamo therapeutics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sant'anna school of advanced studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+santa cruz biotech NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+savitribai phule pune university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scienceopen NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific management review board NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific women's academic network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientometrics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scripps research translational institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+seed media group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate committee on commerce NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+senckenberg research institute and natural history museum NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+seventh framework programme NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai astronomical observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+shenzhen center for disease control and prevention NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sichuan university's west china hospital NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sidney kimmel comprehensive cancer center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+silicon quantum computing NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sinovac NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sirtris NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sirtris pharmaceuticals NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+soccom NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+social science research network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for integrative and comparative biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for molecular biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for scientific values NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of german nature photographers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+solyndra of fremont NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sony world photography awards NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+south african national biodiversity institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern california earthquake center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+southwest national primate research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+space and technology committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+standing committee of the national people's congress NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+stawell underground physics laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+svb leerink NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+synthetic genomics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tamil nadu pollution control board NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tcga NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology and innovation council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+terrestrial ecosystem research network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+theodosius dobzhansky center for genome bioinformatics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+time magazine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+trace gas orbiter NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+translational health science and technology institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical atmosphere ocean NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical forest group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tsunami research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+turkish academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+turkish council of higher education NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tvm capital NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk medicines and healthcare regulatory agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk public health rapid support team NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk research integrity office NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+un convention on biodiversity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+un convention on biological diversity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+un intergovernmental panel NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+understanding animal research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+union of concerned scientists' center for science and democracy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united chinese americans NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations intergovernmental panel NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations international maritime organization NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' intergovernmental panel NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' international civil aviation organization NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university college london's institute of child health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university college london's institute of neurology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university foreign interference taskforce NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of chicago's oriental institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of colorado school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of connecticut school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of florida college of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of ioannina NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of minnesota's center for infectious disease research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pennsylvania school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of strathclyde's centre for forensic science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of texas, austin" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of the basque country in bilbao NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of the côte d'azur in nice NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of utah research foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of utah school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us advanced laser interferometer gravitational-wave observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us army corps of engineers' cold regions research and engineering laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us army medical research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us biomedical advanced research and development authority NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us centres for disease control and prevention NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us climate action network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us court of appeals for the federal circuit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of agriculture's agricultural research service NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of energy's oak ridge national laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of energy's office of science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us laser interferometer gravitational-wave observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academy of engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of child health and human development NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national science advisory board for biosecurity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national snow and ice data center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vanderbilt university school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vavilov institute of plant industry NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vera c. rubin observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+virginia edgcomb NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+virgo collaboration NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vision sciences society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vitalant research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vsnu NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+waitlist zero NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wake forest university school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome trust and cancer research uk NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome trust and gates foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome trust centre for neuroimaging at university college london NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wicell NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wicell research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wildlife conservation society vietnam NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+world academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+world climate research programme NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+world conference on research integrity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+world mosquito program NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuxi pharmatech NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wyss institute for biologically inspired engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+xylella fastidiosa NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+yunnan key laboratory of primate biomedical research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+zimbabwe young academy of science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+fed no Europe Northern Europe FALSE 2 2021-02-03 53796092 node "Fed, Sirdal, Agder, Norge" place farm 0.3 Norge FALSE
+iccat no Europe Northern Europe FALSE 2 2021-02-03 85440166 way "Ingøya, Ingøy, Måsøy, Troms og Finnmark, Norge" place island 0.26358119422997 Norge FALSE
+institute of marine research no Europe Northern Europe FALSE 2 2021-02-03 134912435 way "Havforskningsinstituttet, Nordnesgaten, Nordnes, Skuteviken, Bergenhus, Bergen, Vestland, 5005, Norge" building office 0.324352223496241 Norge FALSE
+erasmus mc nl Europe Western Europe FALSE 2 2021-02-03 45362830 node "Erasmus MC, 230, 's-Gravendijkwal, Dijkzigt, Centrum, Rotterdam, Zuid-Holland, Nederland, 3015CE, Nederland" place house 0.553558714867367 Nederland FALSE
+erasmus university nl Europe Western Europe FALSE 2 2021-02-03 153576820 way "Erasmus University College, 1A, Nieuwemarkt, Stadsdriehoek, Centrum, Rotterdam, Zuid-Holland, Nederland, 3011HP, Nederland" building university 0.201 Nederland FALSE
+national institute for subatomic physics nl Europe Western Europe FALSE 2 2021-02-03 105695325 way "Nationaal instituut voor subatomaire fysica, 105, Science Park, Oost, Amsterdam, Noord-Holland, Nederland, 1098XG, Nederland" office research 0.242327847659036 Nederland FALSE
+radboud university in nijmegen nl Europe Western Europe FALSE 2 2021-02-03 85314411 way "Radboud Universiteit, Erasmuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525 EX, Nederland" amenity university 0.652553099500867 Nederland FALSE
+royal netherlands meteorological institute nl Europe Western Europe FALSE 2 2021-02-03 103104578 way "297, KNMI, De Bilt, Utrecht, Nederland, 3731GA, Nederland" landuse commercial 0.2 Nederland FALSE
+royal netherlands meteorological institute in de bilt nl Europe Western Europe FALSE 2 2021-02-03 103104578 way "297, KNMI, De Bilt, Utrecht, Nederland, 3731GA, Nederland" landuse commercial 0.4 Nederland FALSE
+state administration of traditional chinese medicine nl Europe Western Europe FALSE 2 2021-02-03 46941197 node "Traditional Chinese Medicine, Bos en Lommerweg, Landlust, West, Amsterdam, Noord-Holland, Nederland, 1055DL, Nederland" amenity pharmacy 0.301 Nederland FALSE
+university medical center groningen nl Europe Western Europe FALSE 2 2021-02-03 183063420 way "Universitair Medisch Centrum Groningen, 1, Hanzeplein, UMCG, Centrum, Groningen, Nederland, 9713GZ, Nederland" amenity hospital 0.4277684953714 Nederland FALSE
+university medical center utrecht nl Europe Western Europe FALSE 2 2021-02-03 237959191 way "Universitair Medisch Centrum Utrecht, Lundlaan, Utrecht, Nederland, 3584EA, Nederland" amenity hospital 0.413179143195807 Nederland FALSE
+united nations food and agriculture organization ni Americas Central America FALSE 2 2021-02-03 147031638 way "FAO Representation, Via al Mirador, Mirador Norte, Mirador Norte Santo Domingo, Distrito I, Managua (Municipio), Departamento de Managua, 14236, Nicaragua" office yes 0.001 Nicaragua FALSE
+audi ng Africa Western Africa FALSE 2 2021-02-03 4112614 node "Audi, Arak, Sanga, Kaduna, Nigeria" place village 0.375 Nigeria FALSE
+ipsp ne Africa Western Africa FALSE 2 2021-02-03 84198776 node "IPSP KONNI, N 1, Birni N'Konni, Tahoua, Niger" amenity school 0.101 Niger FALSE
+europa NA Africa Southern Africa FALSE 2 2021-02-03 299876346 node أوروبا place continent 0.820706719188318 NA FALSE
+mcmurdo station NA Africa Southern Africa FALSE 2 2021-02-03 4327209 node McMurdo Station place town 0.673603329846918 NA FALSE
+neutrino observatory NA Africa Southern Africa FALSE 2 2021-02-03 59696254 node IceCube Neutrino Observatory office research 0.603758799530623 NA FALSE
+aap na NA NA FALSE 2 2021-02-03 166056493 way "Aap, Kunene Region, Namibia" waterway river 0.375 Namibia FALSE
+national institute of health my Asia South-Eastern Asia FALSE 2 2021-02-03 195112165 way "Institut Pengurusan Kesihatan, Jalan Abdullah, Bukit Bangsar, Brickfields, Kuala Lumpur, 59000, Malaysia" amenity research_institute 0.001 Malaysia FALSE
+national science centre my Asia South-Eastern Asia FALSE 2 2021-02-03 126784027 way "Pusat Sains Negara, Lebuhraya Sprint, Bukit Kiara, Kuala Lumpur, 6000, Malaysia" tourism museum 0.301403950541443 Malaysia FALSE
+nipah my Asia South-Eastern Asia FALSE 2 2021-02-03 181411960 way "Nipah, Sabah, Malaysia" landuse forest 0.3 Malaysia FALSE
+conacyt mx Americas Central America FALSE 2 2021-02-03 58576053 node "CONACYT, Avenida Insurgentes Sur, Crédito constructor, Benito Juárez, Ciudad de México, 03940, México" office government 0.101 México FALSE
+institute of america mx Americas Central America FALSE 2 2021-02-03 257995273 way "Great Union Institute, 74, Calle Kramer, Atlántida, Coyoacán, Ciudad de México, 04370, México" amenity school 0.101 México FALSE
+me mx Americas Central America FALSE 2 2021-02-03 257065613 relation México boundary administrative 0.839923932441765 México FALSE
+salk mx Americas Central America FALSE 2 2021-02-03 82814111 node "SALK, San Luis PotosÃ, Municipio de San Luis PotosÃ, San Luis PotosÃ, 78385, México" place neighbourhood 0.35 México FALSE
+john church mw Africa Eastern Africa FALSE 2 2021-02-03 70627801 node "John, Mulanje, Southern Region, Malawi" place village 0.375 Malawi FALSE
+maldives mv Asia Southern Asia FALSE 2 2021-02-03 258047730 relation Þ‹Þ¨ÞˆÞ¬Þ€Þ¨ÞƒÞ§Þ‡Þ°Þ–Þ¬ boundary administrative 0.650520652391712 Þ‹Þ¨ÞˆÞ¬Þ€Þ¨ÞƒÞ§Þ‡Þ°Þ–Þ¬ FALSE
+mauritania mr Africa Western Africa FALSE 2 2021-02-03 257903579 relation موريتانيا boundary administrative 0.667049491176254 موريتانيا FALSE
+center for strategic and international studies mm Asia South-Eastern Asia FALSE 2 2021-02-03 59087016 node "Center for Strategic and International Studies (CSIS Myanmar), ပြည်လမ်း, လှá€á€¯á€„်, Northern District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 1001, မြန်မာ" amenity college 0.601 မြန်မာ FALSE
+marshall islands mh Oceania Micronesia FALSE 2 2021-02-03 2735253 node "Marshall Islands, Ṃajeḷ" place archipelago 0.826224991072023 Ṃajeḷ FALSE
+amyris ma Africa Northern Africa FALSE 2 2021-02-03 44222289 node "Amyris, Rue Anissone, Riad ⵔⵉⵢⴰⴷ الرياض, Agdal Riyad أكدال الرياض, Rabat ⵔⴱⴰⵟ الرباط, Préfecture de Rabat عمالة الرباط, Rabat-Salé-Kénitra ⵔⴱⴰⵟ-âµ™âµ<8d>â´°-ⵇâµ<8f>ⵉⵟⵔⴰ الرباط-سلا-القنيطرة, 1100, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" amenity pharmacy 0.101 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+ecole polytechnique ma Africa Northern Africa FALSE 2 2021-02-03 172816013 way "Ecole Polytechnique, Boulevard de Bouskoura, Anfa Préfecture, Casablanca ⵜⵉⴳⵎⵉ ⵜⵓⵎâµ<8d>ⵉâµ<8d>ⵜ الدار البيضاء, arrondissement de Hay Hassani مقاطعة الØÙŠ الØسني, Pachalik de Casablanca, Préfecture de Casablanca عمالة الدار البيضاء, Casablanca-Settat ⵜⵉⴳⵎⵉ ⵜⵓⵎâµ<8d>ⵉâµ<8d>ⵜ-ⵙⵟⵟⴰⵜ الدار البيضاء-سطات, 20200, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" building university 0.201 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+school of oriental ma Africa Northern Africa FALSE 2 2021-02-03 78918893 node "مجموع مدارس ابن الخطيب, RN2, Hajrat el Halouf ⵃⵊⵕⵜ âµ<8d>ⵃâµ<8d>âµ<8d>ⵓⴼ Øجرة الØلوÙ<81>, Aïchoun ⵄⵉⵛⵓâµ<8f> عيشون, Aghbal أغبال, caïdat d'Aghbal قيادة أغبال, Cercle d'Ahfir دائرة Ø£ØÙ<81>ير, Province de Berkane إقليم بركان, Oriental ⵜⴰâµ<8f>ⴳⵎⵓⴹⵜ الشرقية, 63202, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" amenity school 0.101 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+ministry of economy lv Europe Northern Europe FALSE 2 2021-02-03 17156350 node "Latvijas Republikas Ekonomikas ministrija, 55, Brīvības iela, Centrs, Rīga, Vidzeme, LV-1010, Latvija" office government 0.24352463088163 Latvija FALSE
+vilnius university lt Europe Northern Europe FALSE 2 2021-02-03 259014111 relation "Vilniaus universitetas, Simono Daukanto aikÅ¡tÄ—, Senamiestis, SenamiesÄ<8d>io seniÅ«nija, Vilnius, Vilniaus miesto savivaldybÄ—, Vilniaus apskritis, Lietuva" amenity university 0.657377358917248 Lietuva FALSE
+lesotho ls Africa Southern Africa FALSE 2 2021-02-03 258275126 relation Lesotho boundary administrative 0.743099528975159 Lesotho FALSE
+national institute of infectious diseases lk Asia Southern Asia FALSE 2 2021-02-03 205249633 way "National Institute of Infectious Diseases, Andihena Road, IDH (Gothatuwa), Atalgoda, Kotikawaththa, බස්නà·<8f>හිර පළà·<8f>à¶, 10600, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity hospital 0.501 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+justice department la Asia South-Eastern Asia FALSE 2 2021-02-03 26715485 node "Justice Department, 16, ເພàº<8d>ໃຫມ່, ເມືàºàº‡àº¥àº°àº¡àº²àº¡, ເຊàº<81>àºàº‡, 151, ປະເທດລາວ" amenity public_building 0.201 ປະເທດລາວ FALSE
+iit kz Asia Central Asia FALSE 2 2021-02-03 112248819 way "Ð<90>Ñ<8f>Ñ‚Ñ<81>кое, ДениÑ<81>овÑ<81>кий район, КоÑ<81>танайÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, ҚазақÑ<81>тан" place village 0.292975169111391 ҚазақÑ<81>тан FALSE
+kuwait kw Asia Western Asia FALSE 2 2021-02-03 257947174 relation الكويت boundary administrative 0.695601802153665 الكويت FALSE
+us national institute kw Asia Western Asia FALSE 2 2021-02-03 193165956 way "The National Institute, 3, شارع 15, قطعة 10, الÙ<81>ØÙŠØيل, الأØمدي, الاØمدي, 53302, الكويت" office yes 0.201 الكويت FALSE
+busan kr Asia Eastern Asia FALSE 2 2021-02-03 258387761 relation "부산, 대한민êµ" boundary administrative 0.621986409641008 ëŒ€í•œë¯¼êµ FALSE
+dgist kr Asia Eastern Asia FALSE 2 2021-02-03 54759661 node "êµì œê´€, 현í’<8d>ë¡œ47길, ìœ ê°€ì<9d><8d>, 달성군, 대구, 43015, 대한민êµ" tourism hotel 0.001 ëŒ€í•œë¯¼êµ FALSE
+gcf kr Asia Eastern Asia FALSE 2 2021-02-03 52465250 node "Green Climate Fund, 175, 아트센터대로, 송ë<8f>„2ë<8f>™, 송ë<8f>„ë<8f>™, 연수구, ì<9d>¸ì²œ, 22004, 대한민êµ" office government 0.257277503353622 ëŒ€í•œë¯¼êµ FALSE
+green climate fund kr Asia Eastern Asia FALSE 2 2021-02-03 52465250 node "Green Climate Fund, 175, 아트센터대로, 송ë<8f>„2ë<8f>™, 송ë<8f>„ë<8f>™, 연수구, ì<9d>¸ì²œ, 22004, 대한민êµ" office government 0.557277503353622 ëŒ€í•œë¯¼êµ FALSE
+hallym university kr Asia Eastern Asia FALSE 2 2021-02-03 163203242 way "한림대학êµ<90>, 성심로, 춘천시, ê°•ì›<90>ë<8f>„, 24294, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+korea institute of geoscience kr Asia Eastern Asia FALSE 2 2021-02-03 224621385 way "Korea Institute of Geoscience and Mineral Resources, 과학로, 온천2ë<8f>™, ì‹ ì„±ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 34141, 대한민êµ" amenity research_institute 0.401 ëŒ€í•œë¯¼êµ FALSE
+snu kr Asia Eastern Asia FALSE 2 2021-02-03 259528448 relation "서울대학êµ<90> ê´€ì•…ìº í<8d>¼ìŠ¤, 1, 관악로, ê±´ì˜<81>아파트, ì²ë£¡ë<8f>™, 관악구, 서울, 08826, 대한민êµ" amenity university 0.549669564596858 ëŒ€í•œë¯¼êµ FALSE
+us-korea institute kr Asia Eastern Asia FALSE 2 2021-02-03 221159658 way "í•œêµí•´ì–‘수산연수ì›<90>, 367, í•´ì–‘ë¡œ, ë<8f>™ì‚¼2ë<8f>™, ë<8f>™ì‚¼ë<8f>™, ì˜<81>ë<8f>„구, 부산, 49111, 대한민êµ" office government 0.328369791841981 ëŒ€í•œë¯¼êµ FALSE
+yonsei university kr Asia Eastern Asia FALSE 2 2021-02-03 302696400 node "ìº í<8d>¼ìŠ¤íƒ€ìš´, 지하66, 송ë<8f>„êµì œëŒ€ë¡œ, 송ë<8f>„1ë<8f>™, 송ë<8f>„ë<8f>™, 연수구, ì<9d>¸ì²œ, 21990, 대한민êµ" railway station 0.317964956585921 ëŒ€í•œë¯¼êµ FALSE
+democratic people's republic of korea kp Asia Eastern Asia FALSE 2 2021-02-03 257555920 relation ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ boundary administrative 0.712625561293871 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ FALSE
+marine le pen kh Asia South-Eastern Asia FALSE 2 2021-02-03 16734904 node "Marine, ផ្លូវ ១០៤, សង្កាáž<8f>់វáž<8f>្áž<8f>ភ្នំ, áž<81>ណ្ឌដូនពáŸ<81>ញ, រាជធានីភ្នំពáŸ<81>ញ, 120211, ព្រះរាជាណាចក្រ​កម្ពុជា" amenity bar 0.101 ព្រះរាជាណាចក្រ​កម្ពុជា FALSE
+jomo kenyatta university of agriculture and technology ke Africa Eastern Africa FALSE 2 2021-02-03 168715829 way "Jomo Kenyatta University of Agriculture and Technology, Lavington, Nairobi, Kenya" landuse residential 0.9 Kenya FALSE
+pomc ke Africa Eastern Africa FALSE 2 2021-02-03 144576177 way "POMC Compassion International, Kajiado, Kenya" landuse commercial 0.3 Kenya FALSE
+food safety jp Asia Eastern Asia FALSE 2 2021-02-03 13545663 node "夢庵, 3, 新横浜元石å·<9d>ç·š, è<8d><8f>田西二ä¸<81>ç›®, é<9d>’葉区, 横浜市, 神奈å·<9d>県, 231-0017, 日本" amenity restaurant 0.001 日本 FALSE
+hitachi jp Asia Eastern Asia FALSE 2 2021-02-03 258516604 relation "日立市, 茨城県, 日本" boundary administrative 0.474027116064219 日本 FALSE
+iie jp Asia Eastern Asia FALSE 2 2021-02-03 258639558 relation "伊江æ<9d>‘, 国é 郡, 沖縄県, 日本" boundary administrative 0.393638696954819 日本 FALSE
+isi jp Asia Eastern Asia FALSE 2 2021-02-03 259196818 relation "伊勢国, 三é‡<8d>県, 日本" boundary historic 0.525743277351004 日本 FALSE
+kitasato university jp Asia Eastern Asia FALSE 2 2021-02-03 77251155 node "åŒ—é‡Œå¤§å¦ ç<8d>£åŒ»å¦éƒ¨, 大å¦é€šã‚Š, 稲生町, å<8d><81>和田市, é<9d>’森県, 034-0031, 日本" amenity college 0.001 日本 FALSE
+komatsu jp Asia Eastern Asia FALSE 2 2021-02-03 258757265 relation "å°<8f>æ<9d>¾å¸‚, 石å·<9d>県, 日本" boundary administrative 0.462070869758741 日本 FALSE
+kyoto university hospital jp Asia Eastern Asia FALSE 2 2021-02-03 1318672 node "京都大å¦, æ<9d>±å¤§è·¯é€š;京都市é<81>“181å<8f>·äº¬éƒ½ç’°çŠ¶ç·š, è<81>–è·é™¢å±±çŽ‹ç”º, 左京区, 京都市, 京都府, 606-8391, 日本" amenity university 0.57959701929309 日本 FALSE
+kyushu university jp Asia Eastern Asia FALSE 2 2021-02-03 147876936 way "ä¹<9d>州看è·ç¦<8f>祉大å¦ï¼ˆçœ‹è·ç¦<8f>祉å¦éƒ¨ï¼‰, 玉å<90><8d>ãƒ<90>イパス, 玉å<90><8d>市, 熊本県, 865-0005, 日本" amenity university 0.417582068811379 日本 FALSE
+liberal democratic party jp Asia Eastern Asia FALSE 2 2021-02-03 122578456 way "自由民主会館, 23, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8910, 日本" office political_party 0.001 日本 FALSE
+nagoya university jp Asia Eastern Asia FALSE 2 2021-02-03 124098830 way "å<90><8d>å<8f>¤å±‹å¤§å¦, 四谷通 (山手グリーンãƒãƒ¼ãƒ‰ï¼‰, 四谷通, å<8d>ƒç¨®åŒº, å<90><8d>å<8f>¤å±‹å¸‚, 愛知県, 464-8601, 日本" amenity university 0.519298300330669 日本 FALSE
+national institute for fusion science jp Asia Eastern Asia FALSE 2 2021-02-03 40010535 node "National Institute for Fusion Science, 肥田下石線, 土å²<90>市, å²<90>阜県, 507-0021, 日本" amenity research_centre 0.501 日本 FALSE
+oist jp Asia Eastern Asia FALSE 2 2021-02-03 169799491 way "沖縄科å¦æŠ€è¡“大å¦é™¢å¤§å¦, 国é<81>“58å<8f>·, 谷茶, æ<81>©ç´<8d>æ<9d>‘, 国é 郡, 沖縄県, 904-0495, 日本" amenity college 0.422968236493861 日本 FALSE
+okinawa institute of science and technology jp Asia Eastern Asia FALSE 2 2021-02-03 169799491 way "沖縄科å¦æŠ€è¡“大å¦é™¢å¤§å¦, 国é<81>“58å<8f>·, 谷茶, æ<81>©ç´<8d>æ<9d>‘, 国é 郡, 沖縄県, 904-0495, 日本" amenity college 0.422968236493861 日本 FALSE
+policy exchange jp Asia Eastern Asia FALSE 2 2021-02-03 75361678 node "POLICY, 柴å<8f>ˆè¡—é<81>“, 江戸å·<9d>区, æ<9d>±äº¬éƒ½, 133-0051, 日本" office company 0.101 日本 FALSE
+times jp Asia Eastern Asia FALSE 2 2021-02-03 135747411 way "タイムズ, 御æˆ<90>町, å°<8f>町1, 鎌倉市, 神奈å·<9d>県, 日本" landuse construction 0.343190432299382 日本 FALSE
+us house of representatives jp Asia Eastern Asia FALSE 2 2021-02-03 60617052 node "衆è°é™¢, 1, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0014, 日本" office government 0.570873380707553 日本 FALSE
+cagliari it Europe Southern Europe FALSE 2 2021-02-03 258069296 relation "Cagliari - Casteddu, Cagliari, Sardegna, Italia" boundary administrative 0.702776535106675 Italia FALSE
+cosce it Europe Southern Europe FALSE 2 2021-02-03 136820 node "Monte Cosce, Configni, Rieti, Lazio, Italia" natural peak 0.4 Italia FALSE
+epica it Europe Southern Europe FALSE 2 2021-02-03 188500501 way "Epica, SP146/bis, Pianomonaci, Sinagra, Messina, Sicilia, 98069, Italia" craft brewery 0.101 Italia FALSE
+foscari university of venice it Europe Southern Europe FALSE 2 2021-02-03 27324924 node "Università Ca' Foscari, Calle Giustinian, Dorsoduro, Venezia-Murano-Burano, Mestre, Venezia, Veneto, 30170, Italia" amenity university 0.548258147549701 Italia FALSE
+jrc it Europe Southern Europe FALSE 2 2021-02-03 233423450 way "Joint Research Centre, Barza, Ispra, Varese, Lombardia, Italia" landuse industrial 0.363793454953531 Italia FALSE
+nasu it Europe Southern Europe FALSE 2 2021-02-03 257688452 relation "Naso, Messina, Sicilia, 98074, Italia" boundary administrative 0.477768525385992 Italia FALSE
+national research council of italy it Europe Southern Europe FALSE 2 2021-02-03 258812264 relation "Consiglio Nazionale delle Ricerche, Via degli Irpini, San Lorenzo, Municipio Roma II, Roma, Roma Capitale, Lazio, 00185, Italia" amenity research_centre 0.001 Italia FALSE
+nus it Europe Southern Europe FALSE 2 2021-02-03 258085241 relation "Nus, Valle d'Aosta/Vallée d'Aoste, Italia" boundary administrative 0.581645085983748 Italia FALSE
+ri it Europe Southern Europe FALSE 2 2021-02-03 258315439 relation "Rieti, Lazio, Italia" boundary administrative 0.722134276481888 Italia FALSE
+sachs it Europe Southern Europe FALSE 2 2021-02-03 63324331 node "Sachs, Rio, Paularo, UTI della Carnia, Friuli Venezia Giulia, 33027, Italia" place isolated_dwelling 0.3 Italia FALSE
+sanaria it Europe Southern Europe FALSE 2 2021-02-03 72287577 node "Sanaria, Via Armando Diaz, Centro Storico, Borgo San Giuseppe, Cuneo, Piemonte, 12100, Italia" shop chemist 0.101 Italia FALSE
+sti it Europe Southern Europe FALSE 2 2021-02-03 258286912 relation "Cittiglio, Unione dei comuni del Medio Verbano, Varese, Lombardia, 21033, Italia" boundary administrative 0.491063953249507 Italia FALSE
+university of padova it Europe Southern Europe FALSE 2 2021-02-03 5420036 node "Aula studio ""Jappelli"", Via Giuseppe Jappelli, Forcellini, Padova, Veneto, 35121, Italia" amenity university 0.101 Italia FALSE
+university of perugia it Europe Southern Europe FALSE 2 2021-02-03 26169643 node "Università per Stranieri di Perugia, Piazza Braccio Fortebraccio, Elce, Ponte Rio, Perugia, Umbria, 06122, Italia" amenity university 0.508664926536407 Italia FALSE
+university of udine it Europe Southern Europe FALSE 2 2021-02-03 46572117 node "University Residences Udine, 14, Via della Vigna, Borgo Grazzano, Udine, UTI del Friuli Centrale, Friuli Venezia Giulia, 33100, Italia" building dormitory 0.201 Italia FALSE
+niid ir Asia Southern Asia FALSE 2 2021-02-03 61915448 node "ناهید, سه راه امین, بازار, لک لر, شهر تبریز, بخش مرکزی شهرستان تبریز, شهرستان تبریز, استان آذربایجان شرقی, 5133837777, ایران" highway bus_stop 0.001 ایران FALSE
+tarbiat modares university ir Asia Southern Asia FALSE 2 2021-02-03 188950452 way "tarbiat modares university, آل اØمد - شریعتی, آل اØمد, منطقه Û¶ شهر تهران, شهرداری تهران منطقه شش ساختمان انبار مرکزی, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1439634564, ایران" highway service 0.375 ایران FALSE
+aclu in Asia Southern Asia FALSE 2 2021-02-03 72757132 node "Achalu, Kanakapura taluk, Ramanagara district, Karnataka, 562126, India" place village 0.275 India FALSE
+all india institute of medical sciences in Asia Southern Asia FALSE 2 2021-02-03 75775290 node "All India Institute of Medical Sciences, Aurobindo Marg, Yusuf Sarai Market, Defence Colony Teshil, South East Delhi, Delhi, 110029, India" railway station 0.944585942469205 India FALSE
+andhra university in Asia Southern Asia FALSE 2 2021-02-03 220469423 way "Andhra University, Sivajipalem Road, Sector 4, Pedda Waltair, Visakhapatnam, Visakhapatnam (Urban), Visakhapatnam, Andhra Pradesh, 530001, India" amenity university 0.201 India FALSE
+bharatiya janata party in Asia Southern Asia FALSE 2 2021-02-03 172374753 way "Bharatiya Janata Party Office, 21st Cross Road, Ejipura, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, 560047, India" office political_party 0.301 India FALSE
+bjp in Asia Southern Asia FALSE 2 2021-02-03 5712332 node "Vijayapura, Station Road, Yogapur, Vijayapura, Vijayapura taluk, Bijapur district, Karnataka, 586101, India" railway station 0.284440950846107 India FALSE
+bpa in Asia Southern Asia FALSE 2 2021-02-03 47709681 node "Begampur, Durgapur Expressway, Chanditala - II, Hugli, West Bengal, 712310, India" railway station 0.323710213530857 India FALSE
+crp in Asia Southern Asia FALSE 2 2021-02-03 6778817 node "Chandrapura Junction, Chandrapura, Bokaro, Jharkhand, 828404, India" railway station 0.328369791841981 India FALSE
+delhi university in Asia Southern Asia FALSE 2 2021-02-03 84119222 node "Delhi University, Bawana-Narela Road, Narela Tehsil, North Delhi, Delhi, 110039, India" amenity restaurant 0.201 India FALSE
+environmental science and technology in Asia Southern Asia FALSE 2 2021-02-03 177481386 way "Department of Environmental Studies, Cochin University of Science and Technology, Pathadipalam, Kalamassery, Kanayannur, Ernakulam district, Kerala, 682022, India" building university 0.401 India FALSE
+hpp in Asia Southern Asia FALSE 2 2021-02-03 6455070 node "Harpalpur, NH76, Harpalpur, Nowgong Tahsil, Chhatarpur, Madhya Pradesh, India" railway station 0.135420222661424 India FALSE
+indian institute of technology kanpur in Asia Southern Asia FALSE 2 2021-02-03 258826308 relation "Indian Institute of Technology Kanpur, Hall 9 Hall 10 Road, Kanpur, Kanpur Nagar, Uttar Pradesh, 208016, India" amenity university 0.911291365481044 India FALSE
+iucaa in Asia Southern Asia FALSE 2 2021-02-03 156683919 way "IUCAA Quarters, Khadki, Pune City, Pune District, Maharashtra, India" landuse residential 0.3 India FALSE
+jawaharlal nehru centre for advanced scientific research in Asia Southern Asia FALSE 2 2021-02-03 95864986 way "Jawaharlal Nehru Centre for Advanced Scientific Research, Kempegowda Road, Coffee Board Layout, Byatarayanapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560064, India" amenity university 0.977334066701962 India FALSE
+mahatma gandhi institute of medical sciences in Asia Southern Asia FALSE 2 2021-02-03 153697233 way "Mahatma Gandhi Institute of Medical Sciences, SH258, Wardha, Sevagram, Wardha, Maharashtra, 442102, India" amenity hospital 0.601 India FALSE
+medical council of india in Asia Southern Asia FALSE 2 2021-02-03 176721424 way "Indian Council of Medical Research, Sadahalli, Devanahalli taluk, Bangalore Rural, Karnataka, India" landuse commercial 0.6 India FALSE
+moon express in Asia Southern Asia FALSE 2 2021-02-03 83029856 node "Gaub Tree, Eastern Express Highway, Neelam Nagar, T Ward, Zone 6, Thane, Maharashtra, 400081, India" natural tree 0.101 India FALSE
+panel in Asia Southern Asia FALSE 2 2021-02-03 83972940 node "Panel, Tutu, Nankhari, Shimla, Himachal Pradesh, 172001, India" place hamlet 0.35 India FALSE
+phr in Asia Southern Asia FALSE 2 2021-02-03 20501950 node "Phillaur Junction, NH44, Phillaur, Phillaur Tahsil, Jalandhar, Punjab, 144410, India" railway station 0.0677101113307119 India FALSE
+physical society in Asia Southern Asia FALSE 2 2021-02-03 296019075 node "Shree Prabhurajendra College of Physical Education, Cotton Sales Society Road, Gadag, Gadag taluk, Gadag district, Karnataka, 582101, India" amenity college 0.201 India FALSE
+pslv in Asia Southern Asia FALSE 2 2021-02-03 230786339 way "PSLV Rocket Model, Veli- Perumathura road, Veli, Thiruvananthapuram, Kerala, 695001, India" tourism attraction 0.101 India FALSE
+raman research institute in Asia Southern Asia FALSE 2 2021-02-03 100698195 way "Raman Research Institute, 5th Cross Road, Sadhashivanagar, Aramane Nagara Ward, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560080"", India" amenity college 0.301 India FALSE
+stem cell research in Asia Southern Asia FALSE 2 2021-02-03 83776381 node "Plexus Neuro & Stem Cell Research Centre, B Channasandra Main Road, Banaswadi, Banasavadi, East Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, 560102, India" amenity hospital 0.301 India FALSE
+teri in Asia Southern Asia FALSE 2 2021-02-03 259447258 relation "Tehri, Tehri Garhwal, India" boundary administrative 0.45 India FALSE
+yenepoya university in Asia Southern Asia FALSE 2 2021-02-03 296017516 node "Yenepoya Pre University College, Mangalore-Kasaragodu Road, Kankanady, Jeppinamogaru, Mangaluru taluk, Dakshina Kannada, Karnataka, 575009, India" amenity college 0.201 India FALSE
+bar-ilan university in ramat gan il Asia Western Asia FALSE 2 2021-02-03 103805843 way "×<90>×•× ×™×‘×¨×¡×™×˜×ª בר ×<90>ילן, השקד, רמת ×<90>ילן, גבעת שמו×<90>ל, × ×¤×ª פתח תקווה, מחוז המרכז, no, ישר×<90>ל" amenity university 0.517808168627706 ישר×<90>ל FALSE
+ben-gurion university of the negev il Asia Western Asia FALSE 2 2021-02-03 121961822 way "×<90>×•× ×™×‘×¨×¡×™×˜×ª בן גוריון ×‘× ×’×‘, פרופסור ×—×™×™×<9d> ×—× × ×™, Be'er Sheva Innovation District, ×©×›×•× ×” ד, ב×<90>ר שבע, × ×¤×ª ב×<90>ר שבע, מחוז הדרו×<9d>, no, ישר×<90>ל" amenity university 0.487026464500426 ישר×<90>ל FALSE
+israel academy of sciences and humanities il Asia Western Asia FALSE 2 2021-02-03 115598477 way "×”×<90>קדמיה הל×<90>ומית הישר×<90>לית למדעי×<9d>, ×–'×‘×•×˜×™× ×¡×§×™, טלביה, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" amenity public_building 0.450401733787336 ישר×<90>ל FALSE
+israel aerospace industries il Asia Western Asia FALSE 2 2021-02-03 17972127 node "צומת תעשייה ×<90>ווירית, 40, מועצה ×<90>זורית חבל מודיעין, × ×¤×ª רמלה, מחוז המרכז, no, ישר×<90>ל" highway bus_stop 0.001 ישר×<90>ל FALSE
+israel space agency il Asia Western Asia FALSE 2 2021-02-03 298829047 node "×¡×•×›× ×•×ª החלל הישר×<90>לית, דוד חכמי, תל ×<90>ביב - יפו, ×ž×•× ×˜×™×¤×™×•×¨×™, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל" office government 0.001 ישר×<90>ל FALSE
+knesset il Asia Western Asia FALSE 2 2021-02-03 208123192 way "משכן ×”×›× ×¡×ª, קפלן, קרית הממשלה, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" office government 0.341762590849456 ישר×<90>ל FALSE
+rambam health care campus il Asia Western Asia FALSE 2 2021-02-03 109452047 way "רמב""×<9d> - הקריה הרפו×<90>ית לברי×<90>ות ×”×<90>ד×<9d>, עפרון, בת גלי×<9d>, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity hospital 0.36529067188378 ישר×<90>ל FALSE
+technion-israel institute of technology il Asia Western Asia FALSE 2 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+tel-aviv university il Asia Western Asia FALSE 2 2021-02-03 37018800 node "תל ×<90>ביב ×<90>×•× ×™×‘×¨×¡×™×˜×”, ×<90>יילון דרו×<9d>, תל ×<90>ביב - יפו, ×<90>×•× ×™×‘×¨×¡×™×˜×ª ת""×<90>, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל" railway station 0.339805842395375 ישר×<90>ל FALSE
+university of haifa il Asia Western Asia FALSE 2 2021-02-03 103080369 way "×<90>×•× ×™×‘×¨×¡×™×˜×ª חיפה, ×<90>ב×<90> חושי, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.520356220829959 ישר×<90>ל FALSE
+broad ie Europe Northern Europe FALSE 2 2021-02-03 258639397 relation "Broad, Trim Rural, The Municipal District of Trim, County Meath, Leinster, Éire / Ireland" boundary administrative 0.35 Éire / Ireland FALSE
+bull ie Europe Northern Europe FALSE 2 2021-02-03 50108022 node "The Bull, Kenmare Municipal District, County Kerry, Munster, Éire / Ireland" natural peak 0.4 Éire / Ireland FALSE
+esri ie Europe Northern Europe FALSE 2 2021-02-03 144706611 way "The Economic and Social Research Institute, Hanover Street East, Dublin, Dublin 2, Leinster, D02 WY65, Éire / Ireland" building office 0.269299555080491 Éire / Ireland FALSE
+royal irish academy ie Europe Northern Europe FALSE 2 2021-02-03 156774738 way "Royal Irish Academy, 19, Dawson Street, Dublin, Dublin 2, Leinster, 2, Éire / Ireland" tourism attraction 0.758662567556056 Éire / Ireland FALSE
+dprk id Asia South-Eastern Asia FALSE 2 2021-02-03 198672978 way "DPRK, Jalan Panglateh, Banda Sakti, Lhokseumawe, Aceh, 24351, Indonesia" building commercial 0.101 Indonesia FALSE
+nia id Asia South-Eastern Asia FALSE 2 2021-02-03 259533884 relation "Nias, Sumatera Utara, Indonesia" place island 0.553227551541546 Indonesia FALSE
+pcb id Asia South-Eastern Asia FALSE 2 2021-02-03 181632598 way "Bandar Udara Pondok Cabe, Jalan Kayu Manis, Pondok Cabe Udik, Pamulang, Tangerang Selatan, Banten, 15418, Indonesia" aeroway aerodrome 0.412601922414653 Indonesia FALSE
+tempel id Asia South-Eastern Asia FALSE 2 2021-02-03 258758871 relation "Tempel, Sleman, Daerah Istimewa Yogyakarta, 55552, Indonesia" boundary administrative 0.5 Indonesia FALSE
+undp id Asia South-Eastern Asia FALSE 2 2021-02-03 68184861 node "UNDP, Jalan Kampung Bali 16, RW 10, Kampung Bali, Tanah Abang, Jakarta Pusat, Daerah Khusus Ibukota Jakarta, 10250, Indonesia" office ngo 0.101 Indonesia FALSE
+european institute of innovation and technology hu Europe Eastern Europe FALSE 2 2021-02-03 79975212 node "EIT, Neumann János utca, Infopark, XI. kerület, Budapest, Közép-Magyarország, 1117, Magyarország" office government 0.001 Magyarország FALSE
+stm ht Americas Caribbean FALSE 2 2021-02-03 258431782 relation "Commune de Saint Michel de l'Attalaye, Arrondissement de Marmelade, Département de l'Artibonite, Ayiti" boundary administrative 0.35 Ayiti FALSE
+nustar hr Europe Southern Europe FALSE 2 2021-02-03 3942294 node "Nuštar, Općina Nuštar, Vukovarsko-srijemska županija, 32221, Hrvatska" place village 0.379599826756761 Hrvatska FALSE
+stap hr Europe Southern Europe FALSE 2 2021-02-03 182269951 way "Stap, Općina Starigrad, Zadarska županija, Hrvatska" landuse meadow 0.3 Hrvatska FALSE
+university of zagreb hr Europe Southern Europe FALSE 2 2021-02-03 107714436 way "Klinika za psihijatriju VrapÄ<8d>e, 32, BolniÄ<8d>ka cesta, Stenjevec, Gradska Ä<8d>etvrt Podsused - VrapÄ<8d>e, Zagreb, Grad Zagreb, 10090, Hrvatska" amenity hospital 0.101 Hrvatska FALSE
+gw gw Africa Western Africa FALSE 2 2021-02-03 257557052 relation Guiné-Bissau boundary administrative 0.647675005742315 Guiné-Bissau FALSE
+interior laboratory gr Europe Southern Europe FALSE 2 2021-02-03 103979613 way "laboratory, Γιάννη ΚοÏ<81>νάÏ<81>ου, ΗÏ<81>άκλειο, Δημοτική Κοινότητα ἩÏ<81>ακλείου, Δήμος ΗÏ<81>ακλείου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΗÏ<81>ακλείου, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 714 10, Ελλάδα" building yes 0.111 Ελλάδα FALSE
+orthodox academy of crete gr Europe Southern Europe FALSE 2 2021-02-03 109202482 way "Orthodox Academy of Crete, ΚολυμβάÏ<81>ι - Δελιανά, Λιμάνι του ΚολυμβαÏ<81>ίου, Δήμος Πλατανιά, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Χανίων, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 73006, Ελλάδα" building yes 0.401 Ελλάδα FALSE
+phobos gr Europe Southern Europe FALSE 2 2021-02-03 220395190 way "Phobos, κ. Λεωνιδίου, Δημοτική Ενότητα Λεωνιδίου, Δήμος Î<9d>ότιας ΚυνουÏ<81>ίας, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΑÏ<81>καδίας, ΠεÏ<81>ιφÎÏ<81>εια Πελοποννήσου, ΑποκεντÏ<81>ωμÎνη Διοίκηση Πελοποννήσου, Δυτικής Ελλάδας και Ιονίου, 223 00, Ελλάδα" natural cliff 0.3 Ελλάδα FALSE
+central food research institute gh Africa Western Africa FALSE 2 2021-02-03 74854109 node "Food Research Institute, Josif Broz Tito Avenue, Ringway Estates, Kokomlemle, Accra Metropolitan, Greater Accra Region, 9505, Ghana" office research 0.301 Ghana FALSE
+macmillan gd Americas Caribbean FALSE 2 2021-02-03 56703064 node "MacMillan, Mallfoot, GRENADA, Grenada" natural peak 0.4 Grenada FALSE
+st george gd Americas Caribbean FALSE 2 2021-02-03 633094 node "St. George's, 1473, Grenada" place town 0.691680176132246 Grenada FALSE
+babraham institute gb Europe Northern Europe FALSE 2 2021-02-03 128767 node "Babraham Institute, Babraham Institute Cycleway, Babraham, South Cambridgeshire, Cambridgeshire, East of England, England, CB22 3AQ, United Kingdom" landuse commercial 0.201 United Kingdom FALSE
+bank of england gb Europe Northern Europe FALSE 2 2021-02-03 257920631 relation "Bank of England, 8AH, Threadneedle Street, Bishopsgate, City of London, Greater London, England, EC2R 8AH, United Kingdom" tourism attraction 0.849471203478208 United Kingdom FALSE
+biosciences gb Europe Northern Europe FALSE 2 2021-02-03 258876052 relation "Biosciences, West Gate, Bournbrook, Metchley, Birmingham, West Midlands Combined Authority, West Midlands, England, B15 2TT, United Kingdom" building university 0.101 United Kingdom FALSE
+bristol university gb Europe Northern Europe FALSE 2 2021-02-03 170738703 way "Bristol City Museum & Art Gallery, University Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS8 1RL, United Kingdom" tourism museum 0.547065093488253 United Kingdom FALSE
+british academy gb Europe Northern Europe FALSE 2 2021-02-03 58085213 node "British Academy, The Mall, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1, United Kingdom" office ngo 0.201 United Kingdom FALSE
+british antarctic survey gb Europe Northern Europe FALSE 2 2021-02-03 258339816 relation "British Antarctic Survey, High Cross, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0ET, United Kingdom" office research 0.301 United Kingdom FALSE
+british geological survey gb Europe Northern Europe FALSE 2 2021-02-03 99309132 way "British Geological Survey, Keyworth, Stanton on the Wolds, Rushcliffe, Nottinghamshire, East Midlands, England, NG12 5GG, United Kingdom" landuse commercial 0.70784642314719 United Kingdom FALSE
+brunel university london gb Europe Northern Europe FALSE 2 2021-02-03 85590905 way "Brunel University London, Kingston Lane, Hillingdon, London Borough of Hillingdon, London, Greater London, England, UB8 3PN, United Kingdom" amenity university 0.743225044527799 United Kingdom FALSE
+celgene gb Europe Northern Europe FALSE 2 2021-02-03 302516654 way "Celgene, 1, Longwalk Road, Stockley Park, West Drayton, London Borough of Hillingdon, London, Greater London, England, UB11 1AS, United Kingdom" building yes 0.101 United Kingdom FALSE
+centre for ecology & hydrology gb Europe Northern Europe FALSE 2 2021-02-03 101917409 way "Centre for Ecology and Hydrology, Benson Lane, Preston Crowmarsh, Benson, Crowmarsh Gifford, South Oxfordshire, Oxfordshire, South East, England, OX10 8BB, United Kingdom" amenity research_institute 0.654365194683011 United Kingdom FALSE
+chatham house gb Europe Northern Europe FALSE 2 2021-02-03 185683088 way "Chatham House (The Royal Institute of International Affairs), 10, St James's Square, St. James's, Mayfair, City of Westminster, London, Greater London, England, SW1Y 4LE, United Kingdom" office ngo 0.585200970199076 United Kingdom FALSE
+coalition gb Europe Northern Europe FALSE 2 2021-02-03 15861155 node "Coalition, King's Road, Queen's Park, Brighton, Brighton and Hove, South East, England, BN1 1NB, United Kingdom" amenity nightclub 0.101 United Kingdom FALSE
+conservatives gb Europe Northern Europe FALSE 2 2021-02-03 85341767 node "Conservatives, The Strand, Lower Walmer, Walmer, Deal, Dover, Kent, South East, England, CT14 7DX, United Kingdom" office political_party 0.101 United Kingdom FALSE
+covington & burling gb Europe Northern Europe FALSE 2 2021-02-03 164356944 way "Covington & Burling, 265, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 1BH, United Kingdom" office lawyer 0.201 United Kingdom FALSE
+credit suisse gb Europe Northern Europe FALSE 2 2021-02-03 137065671 way "Credit Suisse, 1, Cabot Square, Canary Wharf, Isle of Dogs, London Borough of Tower Hamlets, London, Greater London, England, E14 4QJ, United Kingdom" office financial 0.460058384040688 United Kingdom FALSE
+cruk gb Europe Northern Europe FALSE 2 2021-02-03 76715823 node "Cancer Research UK, 2, Redman Place, Stratford Marsh, London Borough of Newham, London, Greater London, England, E20 1JQ, United Kingdom" office charity 0.001 United Kingdom FALSE
+department for international trade gb Europe Northern Europe FALSE 2 2021-02-03 98032514 way "Department for International Trade, 3, Whitehall Place, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2AW, United Kingdom" office government 0.401 United Kingdom FALSE
+hefce gb Europe Northern Europe FALSE 2 2021-02-03 259588926 relation "hefce, Carroll Court, Stoke Park, Stoke Gifford, Filton, South Gloucestershire, South West England, England, BS34, United Kingdom" building yes 0.111 United Kingdom FALSE
+heriot-watt university gb Europe Northern Europe FALSE 2 2021-02-03 84948594 way "Heriot-Watt University, A71, Currie, City of Edinburgh, Scotland, EH14 4AS, United Kingdom" amenity university 0.769075118742827 United Kingdom FALSE
+jodrell bank gb Europe Northern Europe FALSE 2 2021-02-03 72862378 node "Jodrell Bank, Lower Withington, Cheshire East, North West England, England, SK11 9DW, United Kingdom" place hamlet 0.45 United Kingdom FALSE
+kavli institute gb Europe Northern Europe FALSE 2 2021-02-03 108662646 way "Kavli Institute for Cosmology, IoA Path, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0HA, United Kingdom" building university 0.201 United Kingdom FALSE
+king's college hospital gb Europe Northern Europe FALSE 2 2021-02-03 156162088 way "King's College Hospital, Denmark Hill, Camberwell, London Borough of Southwark, London, Greater London, England, SE5 9RS, United Kingdom" amenity hospital 0.765781769297865 United Kingdom FALSE
+kings college london gb Europe Northern Europe FALSE 2 2021-02-03 258760701 relation "King's College London, Strand Campus, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 2LS, United Kingdom" amenity university 0.767778517860205 United Kingdom FALSE
+leakeys gb Europe Northern Europe FALSE 2 2021-02-03 105503596 way "Leakey's, Church Street, Haugh, Inverness, Highland, Scotland, IV1 1EY, United Kingdom" shop books 0.001 United Kingdom FALSE
+liberal democrats gb Europe Northern Europe FALSE 2 2021-02-03 23277141 node "Liberal Democrats, 8–10, Great George Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3AE, United Kingdom" office political_party 0.597946206068361 United Kingdom FALSE
+lincolnshire gb Europe Northern Europe FALSE 2 2021-02-03 258300503 relation "Lincolnshire, England, United Kingdom" boundary ceremonial 0.712373747600004 United Kingdom FALSE
+lsst gb Europe Northern Europe FALSE 2 2021-02-03 110398638 way "LSST, Arncott, Cherwell, Oxfordshire, South East, England, United Kingdom" landuse military 0.3 United Kingdom FALSE
+manchester gb Europe Northern Europe FALSE 2 2021-02-03 258159411 relation "Manchester, Greater Manchester, North West England, England, United Kingdom" boundary administrative 0.781718719589409 United Kingdom FALSE
+marine biological association gb Europe Northern Europe FALSE 2 2021-02-03 118003644 way "Marine Biological Association, Madeira Road, Barbican, Plymouth, South West England, England, PL1 2JU, United Kingdom" building yes 0.301 United Kingdom FALSE
+marine stewardship council gb Europe Northern Europe FALSE 2 2021-02-03 111557662 way "Marine Stewardship Council, Snow Hill Court, Smithfield, City of London, Greater London, England, EC1A 2DQ, United Kingdom" office ngo 0.677478932777613 United Kingdom FALSE
+medicines and healthcare products regulatory agency gb Europe Northern Europe FALSE 2 2021-02-03 17808193 node "Medicines and Healthcare Products Regulatory Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.929555066820797 United Kingdom FALSE
+national farmers union gb Europe Northern Europe FALSE 2 2021-02-03 179034227 way "National Farmers' Union, Haw Street, Wotton-under-Edge, Kingswood, Stroud, Gloucestershire, South West England, England, GL12 7AQ, United Kingdom" building yes 0.301 United Kingdom FALSE
+national graphene institute gb Europe Northern Europe FALSE 2 2021-02-03 301795627 way "National Graphene Institute, Booth Street East, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M13 9EP, United Kingdom" amenity research_institute 0.652151062176819 United Kingdom FALSE
+national institute for biological standards and control gb Europe Northern Europe FALSE 2 2021-02-03 117169035 way "The National Institute for Biological Standards and Control, South Mimms, Ridge, Hertsmere, Hertfordshire, East of England, England, EN6 3QG, United Kingdom" landuse industrial 0.9 United Kingdom FALSE
+national review gb Europe Northern Europe FALSE 2 2021-02-03 107634947 way "Review, 131, Bellenden Road, Bellenden, London Borough of Southwark, London, Greater London, England, SE15 4QY, United Kingdom" shop books 0.101 United Kingdom FALSE
+nature medicine gb Europe Northern Europe FALSE 2 2021-02-03 123758464 way "Nature Chinese Medicine Centre, 7, Wellington Terrace, Notting Hill, Royal Borough of Kensington and Chelsea, London, Greater London, England, W2 4LW, United Kingdom" building yes 0.201 United Kingdom FALSE
+ncs gb Europe Northern Europe FALSE 2 2021-02-03 52089143 node "NCS, Carlton Court, Team Valley Trading Estate, Lobley Hill, Gateshead, Tyne and Wear, North East England, England, NE11 0AZ, United Kingdom" office yes 0.101 United Kingdom FALSE
+npl gb Europe Northern Europe FALSE 2 2021-02-03 253462143 way "NPL, Pavilion Road, National Physical Laboratory, Hampton Hill, London Borough of Richmond upon Thames, London, Greater London, England, TW11 0NL, United Kingdom" leisure pitch 0.101 United Kingdom FALSE
+oxford brookes university gb Europe Northern Europe FALSE 2 2021-02-03 87046127 way "Oxford Brookes University Gipsy Lane Site, Headington Road, Highfield, Headington, Oxford, Oxfordshire, South East, England, OX3 0BL, United Kingdom" amenity university 0.754593314283165 United Kingdom FALSE
+oxitec gb Europe Northern Europe FALSE 2 2021-02-03 59520743 node "Oxitec, 65 - 71, Jubilee Avenue, Milton Park, Milton, Vale of White Horse, Oxfordshire, South East, England, OX14 4RW, United Kingdom" office company 0.101 United Kingdom FALSE
+panasonic gb Europe Northern Europe FALSE 2 2021-02-03 95424837 way "Panasonic, Wokingham, South East, England, RG40 2AT, United Kingdom" landuse commercial 0.3 United Kingdom FALSE
+plymouth gb Europe Northern Europe FALSE 2 2021-02-03 257865169 relation "Plymouth, South West England, England, United Kingdom" boundary administrative 0.697098637251215 United Kingdom FALSE
+polar research institute gb Europe Northern Europe FALSE 2 2021-02-03 86946864 way "Scott Polar Research Institute (SPRI), Lensfield Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 1ER, United Kingdom" building university 0.709070137722353 United Kingdom FALSE
+regenerative medicine institute gb Europe Northern Europe FALSE 2 2021-02-03 302291462 way "Institute of Developmental and Regenerative Medicine (IDRM), Roosevelt Drive, Highfield, Lye Valley, Oxford, Oxfordshire, South East, England, OX3 7NB, United Kingdom" building construction 0.301 United Kingdom FALSE
+research environment gb Europe Northern Europe FALSE 2 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.472343749103071 United Kingdom FALSE
+research uk gb Europe Northern Europe FALSE 2 2021-02-03 175592054 way "Institute of Cancer Research, 237, Fulham Road, The Boltons, Brompton, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW3 6HS, United Kingdom" building hospital 0.510743518323823 United Kingdom FALSE
+rolls-royce gb Europe Northern Europe FALSE 2 2021-02-03 105617306 way "Rolls-Royce, Raynesway, Alvaston, Derby, East Midlands, England, DE21 7BF, United Kingdom" man_made works 0.424193162948078 United Kingdom FALSE
+sheffield hallam university gb Europe Northern Europe FALSE 2 2021-02-03 209297729 way "Sheffield Hallam University, Pond Street, City Centre, Sheffield, Yorkshire and the Humber, England, S1 1AA, United Kingdom" amenity university 0.301 United Kingdom FALSE
+uk department for international development gb Europe Northern Europe FALSE 2 2021-02-03 98247145 way "Department for International Development, 22-24, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2WH, United Kingdom" office government 0.401 United Kingdom FALSE
+uk intellectual property office gb Europe Northern Europe FALSE 2 2021-02-03 258434943 relation "Intellectual Property Office, Cardiff Road, Maesglas, Gaer, Newport, Cymru / Wales, NP10 8QQ, United Kingdom" office government 0.301 United Kingdom FALSE
+uk ministry of defence gb Europe Northern Europe FALSE 2 2021-02-03 98588582 way "Ministry of Defence, Horse Guards Avenue, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2HB, United Kingdom" military office 0.831875732226719 United Kingdom FALSE
+uk research councils gb Europe Northern Europe FALSE 2 2021-02-03 258509732 relation "UK Research Councils, North Star Avenue, Gorse Hill, Central Swindon North, Swindon, South West England, England, SN2 1ET, United Kingdom" building office 0.301 United Kingdom FALSE
+universities scotland gb Europe Northern Europe FALSE 2 2021-02-03 187787432 way "Universities of Glasgow and Strathclyde Air Squadron, 12, Park Circus Lane, Park District, Glasgow, Glasgow City, Scotland, G3 6AX, United Kingdom" building yes 0.201 United Kingdom FALSE
+university college hospital gb Europe Northern Europe FALSE 2 2021-02-03 189976437 way "University College Hospital, 235, Euston Road, Somers Town, London Borough of Camden, London, Greater London, England, NW1 2BU, United Kingdom" amenity hospital 0.691955796512831 United Kingdom FALSE
+university of brighton gb Europe Northern Europe FALSE 2 2021-02-03 189946524 way "St Peter's House Library, 16-18, Richmond Place, Round Hill, Brighton, Brighton and Hove, South East, England, BN2 9NA, United Kingdom" building university 0.101 United Kingdom FALSE
+university of durham gb Europe Northern Europe FALSE 2 2021-02-03 53254670 node "University, New Durham Road, Ashbrooke, Sunderland, North East England, England, SR2 7PD, United Kingdom" railway station 0.433228686818865 United Kingdom FALSE
+university of essex gb Europe Northern Europe FALSE 2 2021-02-03 62209739 node "University of Essex, Wivenhoe, Colchester, Essex, East of England, England, CO4 3WA, United Kingdom" place suburb 0.575 United Kingdom FALSE
+university of hertfordshire gb Europe Northern Europe FALSE 2 2021-02-03 199549944 way "University of Hertfordshire, de Havilland Campus, St. Albans Road West, Nast Hyde, Hatfield, Welwyn Hatfield, Hertfordshire, East of England, England, AL10 9SQ, United Kingdom" amenity university 0.301 United Kingdom FALSE
+university of wolverhampton gb Europe Northern Europe FALSE 2 2021-02-03 110328726 way "University of Wolverhampton, Stafford Street, Heath Town, Wolverhampton, West Midlands Combined Authority, West Midlands, England, WV1 1LY, United Kingdom" building university 0.301 United Kingdom FALSE
+wellcome open research gb Europe Northern Europe FALSE 2 2021-02-03 131091915 way "The Wellcome Trust Clinical Research Facility, Grafton Street, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M13 9WU, United Kingdom" building yes 0.201 United Kingdom FALSE
+women's hospital gb Europe Northern Europe FALSE 2 2021-02-03 4341641 node "THE WOMEN'S HOSPITAL, Crown Street, Edge Hill, Liverpool, North West England, England, L7, United Kingdom" highway bus_stop 0.301 United Kingdom FALSE
+ansm fr Europe Western Europe FALSE 2 2021-02-03 242417770 way "Agence nationale de sécurité du médicament et des produits de santé, Boulevard Anatole France, Saint-Denis, Seine-Saint-Denis, Île-de-France, France métropolitaine, 93200, France" office government 0.001 France FALSE
+asco fr Europe Western Europe FALSE 2 2021-02-03 258756793 relation "Asco, Corte, Haute-Corse, Corse, France métropolitaine, 20276, France" boundary administrative 0.601020559978481 France FALSE
+barda fr Europe Western Europe FALSE 2 2021-02-03 257924811 relation "Labarde, Lesparre-Médoc, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33460, France" boundary administrative 0.535852707779254 France FALSE
+charles river laboratories fr Europe Western Europe FALSE 2 2021-02-03 296730571 way "Charles River Laboratories, Rue de Pacy, Miserey, Évreux, Eure, Normandie, France métropolitaine, 27930, France" man_made works 0.301 France FALSE
+clia fr Europe Western Europe FALSE 2 2021-02-03 148195673 way "Rue des Clia-Cliats, La Vieille-Loye, Dole, Jura, Bourgogne-Franche-Comté, France métropolitaine, 39380, France" highway unclassified 0.2 France FALSE
+council of europe fr Europe Western Europe FALSE 2 2021-02-03 68954423 node "Conseil de l'Europe, Avenue de l'Europe, Quartier des XV, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67075, France" office government 0.707253284652268 France FALSE
+cox fr Europe Western Europe FALSE 2 2021-02-03 258439836 relation "Cox, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31480, France" boundary administrative 0.646520829297697 France FALSE
+eic fr Europe Western Europe FALSE 2 2021-02-03 116223112 way "École d'Ingénieurs de Cherbourg (ESIX Normandie), Chemin des Roquettes, Octeville, Cherbourg-Octeville, Cherbourg-en-Cotentin, Cherbourg, Manche, Normandie, France métropolitaine, 50100, France" building university 0.225794094499978 France FALSE
+farc fr Europe Western Europe FALSE 2 2021-02-03 18479658 node "Le Farc, Dommartin, Villefranche-sur-Saône, Rhône, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69380, France" place locality 0.225 France FALSE
+front national fr Europe Western Europe FALSE 2 2021-02-03 48309027 node "Front National, 2, Rue Alexis Mossa, Le Piol, Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, 06000, France" office political_party 0.201 France FALSE
+gsi fr Europe Western Europe FALSE 2 2021-02-03 209973060 way "Aéroport de Grand-Santi, Avenue Dada René, Grand-Santi, Le Bourg, Grand-Santi, Saint-Laurent-du-Maroni, Guyane, 97340, France" aeroway aerodrome 0.245850657848318 France FALSE
+helicos fr Europe Western Europe FALSE 2 2021-02-03 187487532 way "Club de Modélisme Les Hélicos de Benost, Beynost, Bourg-en-Bresse, Ain, Auvergne-Rhône-Alpes, France métropolitaine, 01700, France" highway path 0.075 France FALSE
+horizon europe fr Europe Western Europe FALSE 2 2021-02-03 236372777 way "Horizon Nature, Jeanne d'Arc, Europe, Reims, Marne, Grand Est, France métropolitaine, 51100, France" place city_block 0.325 France FALSE
+iap fr Europe Western Europe FALSE 2 2021-02-03 109006815 way "Institut d'Astrophysique de Paris, 98bis, Boulevard Arago, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" amenity research_institute 0.346621693019181 France FALSE
+ifremer fr Europe Western Europe FALSE 2 2021-02-03 258272648 relation "Ifremer, Avenue Jean Monnet, Sète, Montpellier, Hérault, Occitanie, France métropolitaine, 34200, France" building yes 0.490553774215852 France FALSE
+information justice fr Europe Western Europe FALSE 2 2021-02-03 65896782 node "Maison du tourisme, 17, Rue de la Justice, Onzain, Veuzain-sur-Loire, Blois, Loir-et-Cher, Centre-Val de Loire, France métropolitaine, 41150, France" tourism information 0.101 France FALSE
+ion fr Europe Western Europe FALSE 2 2021-02-03 257669218 relation "Yonne, Bourgogne-Franche-Comté, France métropolitaine, France" boundary administrative 0.616370240837996 France FALSE
+jax fr Europe Western Europe FALSE 2 2021-02-03 258821254 relation "Jax, Brioude, Haute-Loire, Auvergne-Rhône-Alpes, France métropolitaine, 43230, France" boundary administrative 0.600013023210469 France FALSE
+le figaro fr Europe Western Europe FALSE 2 2021-02-03 107312918 way "Le Figaro, Rue Laffitte, Quartier de la Chaussée-d'Antin, Paris 9e Arrondissement, Paris, Île-de-France, France métropolitaine, 75009, France" office newspaper 0.817211661327878 France FALSE
+le grand k fr Europe Western Europe FALSE 2 2021-02-03 214537761 way "Le grand K, Rue des Carrières, Kingersheim, Mulhouse, Haut-Rhin, Grand Est, France métropolitaine, 68260, France" leisure playground 0.301 France FALSE
+lgbt fr Europe Western Europe FALSE 2 2021-02-03 56766164 node "LGBT, Rue Bourgneuf, Petit Bayonne, Bayonne, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64100, France" tourism artwork 0.101 France FALSE
+nice fr Europe Western Europe FALSE 2 2021-02-03 298761441 relation "Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, France" boundary administrative 0.762676330560633 France FALSE
+ooi fr Europe Western Europe FALSE 2 2021-02-03 258357071 relation "Oye-Plage, Calais, Pas-de-Calais, Hauts-de-France, France métropolitaine, 62215, France" boundary administrative 0.570855829119973 France FALSE
+paris-saclay fr Europe Western Europe FALSE 2 2021-02-03 115502194 way "HEC Paris, Rue Curie, Val d'Albian, Saclay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91400, France" amenity college 0.681992451472996 France FALSE
+university of grenoble alpes fr Europe Western Europe FALSE 2 2021-02-03 22506396 node "Gières Gare Univ, Gières - Gare - Universités, Chamandier, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38610, France" amenity bicycle_rental 0.201 France FALSE
+university of poitiers fr Europe Western Europe FALSE 2 2021-02-03 14312417 node "École Des Beaux-Arts, Rue Jean Alexandre, Hôtel de Ville, Poitiers, Vienne, Nouvelle-Aquitaine, France métropolitaine, 86000, France" amenity university 0.101 France FALSE
+university paris-sud fr Europe Western Europe FALSE 2 2021-02-03 125512473 way "Université Paris 1 Panthéon-Sorbonne Centre Pierre Mendès-France, 90, Rue de Tolbiac, Cité Florale, Quartier de la Maison-Blanche, Paris 13e Arrondissement, Paris, Île-de-France, France métropolitaine, 75013, France" amenity university 0.320860870373788 France FALSE
+usap fr Europe Western Europe FALSE 2 2021-02-03 58901930 node "Boutique USAP, Quai Sébastien Vauban, Saint-Jean, Perpignan, Pyrénées-Orientales, Occitanie, France métropolitaine, 66000, France" shop gift 0.101 France FALSE
+world organisation for animal health fr Europe Western Europe FALSE 2 2021-02-03 59448672 node "Organisation Mondiale de la Santé Animale, 12, Rue de Prony, Quartier de la Plaine-de-Monceau, Paris 17e Arrondissement, Paris, Île-de-France, France métropolitaine, 75017, France" office government 0.201 France FALSE
+yök fr Europe Western Europe FALSE 2 2021-02-03 68978666 node "Yok, Boulevard Jean Jaurès, Les Princes-Marmottan, Boulogne-Billancourt, Hauts-de-Seine, ÃŽle-de-France, France métropolitaine, 92100, France" shop variety_store 0.001 France FALSE
+fiji fj Oceania Melanesia FALSE 2 2021-02-03 258486203 relation Viti boundary administrative 0.681878300158849 Viti FALSE
+ngi fj Oceania Melanesia FALSE 2 2021-02-03 150974640 way "Ngau Airport, Lovo, Eastern, Viti" aeroway aerodrome 0.233228686818865 Viti FALSE
+academy of finland fi Europe Northern Europe FALSE 2 2021-02-03 103783048 way "Sibelius-Akatemia, 9, Pohjoinen Rautatiekatu, Etu-Töölö, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00100, Suomi / Finland" amenity university 0.556866432376015 Suomi / Finland FALSE
+nokia fi Europe Northern Europe FALSE 2 2021-02-03 258022880 relation "Nokia, Tampereen seutukunta, Pirkanmaa, Länsi- ja Sisä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" boundary administrative 0.568523457581497 Suomi / Finland FALSE
+ministry of water resources et Africa Eastern Africa FALSE 2 2021-02-03 137652527 way "Ministry of Water Resources, Mike Leyland Street, ኡራኤáˆ<8d> Urael, Addis Ababa / አዲስ አበባ, Bole, አዲስ አበባ / Addis Ababa, 17293, ኢትዮጵያ" office government 0.401 ኢትዮጵያ FALSE
+canfranc underground laboratory es Europe Southern Europe FALSE 2 2021-02-03 233408959 way "Laboratorio Subterráneo de Canfranc, Camino de Secras, Canfranc-Estación, Canfranc, La Jacetania, Huesca, Aragón, 22880, España" amenity research_institute 0.346981559290857 España FALSE
+casp es Europe Southern Europe FALSE 2 2021-02-03 258252256 relation "Caspe, Bajo Aragón-Caspe / Baix Aragó-Casp, Zaragoza, Aragón, 50700, España" boundary administrative 0.610219396647417 España FALSE
+cellex es Europe Southern Europe FALSE 2 2021-02-03 217797958 way "Centre Cellex (Institut d'Oncologia), 115-117, Carrer de Natzaret, Montbau, Horta-Guinardó, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España" office research 0.101 España FALSE
+court es Europe Southern Europe FALSE 2 2021-02-03 258422517 relation "Catalunya, España" boundary administrative 0.720173737746207 España FALSE
+el niños es Europe Southern Europe FALSE 2 2021-02-03 56090016 node "Ninos, Carrer de Garcilaso, els Indians, el Congrés i els Indians, Sant Andreu, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España" amenity kindergarten 0.101 España FALSE
+fusion for energy es Europe Southern Europe FALSE 2 2021-02-03 81668426 node "F4E, 2, Carrer de Josep Pla, Diagonal Mar i el Front MarÃtim del Poblenou, Sant MartÃ, Barcelona, Barcelonès, Barcelona, Catalunya, 08019, España" office government 0.001 España FALSE
+intellectual property es Europe Southern Europe FALSE 2 2021-02-03 259401275 relation "EUIPO, 4, Avenida de Europa, Alacant / Alicante, l'AlacantÃ, Alacant / Alicante, Comunitat Valenciana, 03008, España" office government 0.383512305679517 España FALSE
+pompeu fabra university in barcelona es Europe Southern Europe FALSE 2 2021-02-03 258659729 relation "Campus UManresa, Avinguda de les Bases de Manresa, Manresa (Trama Urbana Consolidada), Mion - Puigberenguer - Miralpeix, Manresa, Bages, Barcelona, Catalunya, 08240, España" amenity university 0.201 España FALSE
+university of alicante es Europe Southern Europe FALSE 2 2021-02-03 108586240 way "Golf Practice Ground Miguel Hernández University of Elche, Acceso Aparcamiento, les Cases de Ferrà ndez, Elx / Elche, el Baix Vinalopó, Alacant / Alicante, Comunitat Valenciana, 03207, España" leisure pitch 0.301 España FALSE
+university of valladolid es Europe Southern Europe FALSE 2 2021-02-03 97754226 way "Facultad de Medicina, Avenida de Ramón y Cajal, Hospital, Valladolid, Castilla y León, 47005, España" amenity university 0.278140546517606 España FALSE
+aalborg university dk Europe Northern Europe FALSE 2 2021-02-03 103460471 way "Aalborg Universitet, Fredrik Bajers Vej, Sønder Tranders, Aalborg, Aalborg Kommune, Region Nordjylland, 9220, Danmark" amenity university 0.539098689594578 Danmark FALSE
+roskilde university dk Europe Northern Europe FALSE 2 2021-02-03 99948291 way "Roskilde Universitet, Trekroner Parkvej, Trekroner, Roskilde, Roskilde Kommune, Region Sjælland, Danmark" amenity university 0.504892902573089 Danmark FALSE
+unep dk Europe Northern Europe FALSE 2 2021-02-03 60420076 node "UNEP, Marmorvej, Marmormolen, Østerbro, København, Københavns Kommune, Region Hovedstaden, 2150, Danmark" office international_organization 0.101 Danmark FALSE
+university of southern denmark dk Europe Northern Europe FALSE 2 2021-02-03 95058307 way "Syddansk Universitet, Fioniavej, Cortex Park, Odense, Odense Kommune, Region Syddanmark, 5230, Danmark" amenity university 0.349660525371521 Danmark FALSE
+airbus defence de Europe Western Europe FALSE 2 2021-02-03 109486291 way "Werkfeuerwehr Airbus, Claude-Dornier-Straße, Airbus Defence & Space, Immenstaad am Bodensee, Verwaltungsgemeinschaft Friedrichshafen, Bodenseekreis, Baden-Württemberg, 88090, Deutschland" amenity fire_station 0.201 Deutschland FALSE
+angewandte chemie de Europe Western Europe FALSE 2 2021-02-03 131574943 way "Angewandte Chemie und Elektrotechnik (Gebäude 14), Schillerstraße, Thamm, Senftenberg, Oberspreewald-Lausitz, Brandenburg, 01968, Deutschland" building school 0.201 Deutschland FALSE
+bausch de Europe Western Europe FALSE 2 2021-02-03 15525429 node "Bausch, Schützenstraße, Sankt Lorenz Süd, Lübeck, Schleswig-Holstein, 23558, Deutschland" shop car_repair 0.101 Deutschland FALSE
+bernstein center for computational neuroscience de Europe Western Europe FALSE 2 2021-02-03 36991996 node "Bernstein Center for Computational Neuroscience, 6, Von-Siebold-Straße, Humboldtallee, Nordstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37075, Deutschland" place house 0.501 Deutschland FALSE
+bielefeld university de Europe Western Europe FALSE 2 2021-02-03 213139009 way "Universität Bielefeld, 25, Universitätsstraße, Schildesche, Bielefeld, Nordrhein-Westfalen, 33615, Deutschland" amenity university 0.579570236211385 Deutschland FALSE
+dusel de Europe Western Europe FALSE 2 2021-02-03 21160565 node "Dusel, Eppenbrunn, Pirmasens-Land, Südwestpfalz, Rheinland-Pfalz, Deutschland" natural peak 0.4 Deutschland FALSE
+ess de Europe Western Europe FALSE 2 2021-02-03 93094803 way "Flughafen Essen-Mülheim, Zeppelinstraße, Raadt, Menden-Holthausen, Rechtsruhr-Süd, Mülheim an der Ruhr, Nordrhein-Westfalen, 45470, Deutschland" aeroway aerodrome 0.451332014915526 Deutschland FALSE
+european research universities de Europe Western Europe FALSE 2 2021-02-03 232582752 way "Zentrum für Entwicklungsforschung / Zentrum für europäische Integrationsforschung, Genscherallee, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.222549534893346 Deutschland FALSE
+friedrich loeffler institute de Europe Western Europe FALSE 2 2021-02-03 652533 node "Institut für Nutztiergenetik, Friedrich Loeffler Institut, 10, Höltystraße, Mariensee, Neustadt am Rübenberge, Region Hannover, Niedersachsen, 31535, Deutschland" tourism attraction 0.201 Deutschland FALSE
+german aerospace centre de Europe Western Europe FALSE 2 2021-02-03 258165325 relation "Deutsches Zentrum für Luft- und Raumfahrt, Grengel, Porz, Köln, Nordrhein-Westfalen, 51147, Deutschland" landuse industrial 0.419657429852984 Deutschland FALSE
+german electron synchrotron de Europe Western Europe FALSE 2 2021-02-03 96698255 way "Deutsches Elektronen-Synchrotron DESY, 6, Platanenallee, Hankelsablage, Zeuthen, Dahme-Spreewald, Brandenburg, 15738, Deutschland" amenity research_institute 0.101 Deutschland FALSE
+german primate center de Europe Western Europe FALSE 2 2021-02-03 101999477 way "Deutsches Primatenzentrum GmbH, 7, Hans-Adolf-Krebs-Weg, Weende, Weende / Deppoldshausen, Göttingen, Landkreis Göttingen, Niedersachsen, 37077, Deutschland" building yes 0.101 Deutschland FALSE
+global climate change de Europe Western Europe FALSE 2 2021-02-03 34620690 node "Mercator Research Institute on Global Commons and Climate Change, Torgauer Straße, Rote Insel, Schöneberg, Tempelhof-Schöneberg, Berlin, 10829, Deutschland" amenity research_institute 0.301 Deutschland FALSE
+gran sasso de Europe Western Europe FALSE 2 2021-02-03 4210065 node "Gran Sasso, Ebenauer Straße, Bezirksteil Dom Pedro, Neuhausen-Nymphenburg, München, Bayern, 80637, Deutschland" amenity restaurant 0.201 Deutschland FALSE
+hannover medical school de Europe Western Europe FALSE 2 2021-02-03 65488332 node "Nikolai-Fuchs-Str. 34, 30625 Hannover, Nikolai-Fuchs-Straße, Medical Park, Groß-Buchholz, Buchholz-Kleefeld, Hannover, Region Hannover, Niedersachsen, 30625, Deutschland" amenity post_box 0.201 Deutschland FALSE
+helmholtz centre for infection research de Europe Western Europe FALSE 2 2021-02-03 161865420 way "Helmholtz-Zentrum für Infektionsforschung Bibliothek, 7, Inhoffenstraße, Stöckheim, Stöckheim- Leiferde, Braunschweig, Niedersachsen, 38124, Deutschland" amenity library 0.201 Deutschland FALSE
+huawei de Europe Western Europe FALSE 2 2021-02-03 301442980 node "Huawei Customer Service Center, 92a, Königsallee, Stadtmitte, Stadtbezirk 1, Düsseldorf, Nordrhein-Westfalen, 40212, Deutschland" office company 0.637513180260927 Deutschland FALSE
+idf de Europe Western Europe FALSE 2 2021-02-03 155620333 way "Institut der Feuerwehr, 237, Wolbecker Straße, Mauritz-Ost, Münster-Ost, Münster, Nordrhein-Westfalen, 48155, Deutschland" amenity college 0.228876356713622 Deutschland FALSE
+institute of optics de Europe Western Europe FALSE 2 2021-02-03 150324329 way "Max-Planck-Institut für Quantenoptik, 1, Hans-Kopfermann-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.333532730730458 Deutschland FALSE
+isf de Europe Western Europe FALSE 2 2021-02-03 189869599 way "International School Frankfurt Rhein-Main, 33, Straße zur Internationalen Schule, Sindlingen, West, Frankfurt am Main, Hessen, 65931, Deutschland" amenity school 0.272343749103071 Deutschland FALSE
+laboratory of molecular biology de Europe Western Europe FALSE 2 2021-02-03 97458858 way "Europäisches Laboratorium für Molekularbiologie, 1, Meyerhofstraße, Rohrbach, Heidelberg, Baden-Württemberg, 69117, Deutschland" amenity research_institute 0.453558714867367 Deutschland FALSE
+max delbrück center for molecular medicine de Europe Western Europe FALSE 2 2021-02-03 204659384 way "Max-Delbrück-Centrum für Molekulare Medizin, 28, Hannoversche Straße, Mitte, Berlin, 10115, Deutschland" office research 0.201 Deutschland FALSE
+max planck institute for chemical ecology de Europe Western Europe FALSE 2 2021-02-03 258183717 relation "Max-Planck-Institut für Chemische Ökologie, 8, Hans-Knöll-Straße, Süd, Jena-Süd, Jena, Thüringen, 07745, Deutschland" office research 0.517609725634953 Deutschland FALSE
+max planck institute for demographic research de Europe Western Europe FALSE 2 2021-02-03 82958469 node "Max Planck-Institut für demografische Forschung, 1, Konrad-Zuse-Straße, Hafen City Rostock, Kröpeliner-Tor-Vorstadt, Ortsbeirat 11 : Kröpeliner-Tor-Vorstadt, Rostock, Mecklenburg-Vorpommern, 18057, Deutschland" office research 0.630717976780999 Deutschland FALSE
+max planck institute for molecular genetics de Europe Western Europe FALSE 2 2021-02-03 96978816 way "Max-Planck-Institut für Molekulare Genetik, 63-73, Ihnestraße, Dahlem, Steglitz-Zehlendorf, Berlin, 14195, Deutschland" amenity research_institute 0.451308416199056 Deutschland FALSE
+merck kgaa de Europe Western Europe FALSE 2 2021-02-03 258400816 relation "Merck KGaA, Darmstadt-Nord, Darmstadt, Hessen, 64293, Deutschland" landuse industrial 0.4 Deutschland FALSE
+ministry of research de Europe Western Europe FALSE 2 2021-02-03 259033442 relation "Bundesministerium für Bildung und Forschung, 1, Kapelle-Ufer, Mitte, Berlin, 10117, Deutschland" office government 0.468523457581497 Deutschland FALSE
+modis de Europe Western Europe FALSE 2 2021-02-03 301357766 node "Modis, Parsevalstraße, Bindersleben, Erfurt, Thüringen, 99092, Deutschland" office company 0.101 Deutschland FALSE
+naturwissenschaften de Europe Western Europe FALSE 2 2021-02-03 297176250 way "Naturwissenschaften, Am Schwanhof, Südviertel, Marburg, Landkreis Marburg-Biedenkopf, Hessen, 35037, Deutschland" building school 0.101 Deutschland FALSE
+oie de Europe Western Europe FALSE 2 2021-02-03 84439830 way "Oie, Zingst, Vorpommern-Rügen, Mecklenburg-Vorpommern, Deutschland" place islet 0.410838391011185 Deutschland FALSE
+polarstern de Europe Western Europe FALSE 2 2021-02-03 3976082 node "Polarstern, 8, Herzog-Georg-Straße, Bad Liebenstein, Wartburgkreis, Thüringen, 36448, Deutschland" amenity cafe 0.101 Deutschland FALSE
+researchgate de Europe Western Europe FALSE 2 2021-02-03 72908266 node "Research Gate, 20, Chausseestraße, Mitte, Berlin, 10115, Deutschland" office company 0.001 Deutschland FALSE
+rwth aachen university de Europe Western Europe FALSE 2 2021-02-03 302467785 relation "RWTH Aachen, Sandkaulstraße, Kaiserplatz, Frankenberger Viertel, Aachen-Mitte, Aachen, Städteregion Aachen, Nordrhein-Westfalen, 52062, Deutschland" amenity university 0.776424465208321 Deutschland FALSE
+sanger institute de Europe Western Europe FALSE 2 2021-02-03 106208569 way "Professor-Sänger-Straße, DLR Lampoldshausen, Hardthausen am Kocher, Verwaltungsgemeinschaft Neuenstadt am Kocher, Landkreis Heilbronn, Baden-Württemberg, 74239, Deutschland" highway unclassified 0.1 Deutschland FALSE
+unfccc de Europe Western Europe FALSE 2 2021-02-03 259281371 relation "Klimarahmenkonvention der Vereinten Nationen, Platz der Vereinten Nationen, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" office international_organization 0.312019878936673 Deutschland FALSE
+university of aachen de Europe Western Europe FALSE 2 2021-02-03 302467785 relation "RWTH Aachen, Sandkaulstraße, Kaiserplatz, Frankenberger Viertel, Aachen-Mitte, Aachen, Städteregion Aachen, Nordrhein-Westfalen, 52062, Deutschland" amenity university 0.67642446520832 Deutschland FALSE
+university of giessen de Europe Western Europe FALSE 2 2021-02-03 6864299 node "Oberer Hardthof, Gießen, Landkreis Gießen, Hessen, 35398, Deutschland" amenity university 0.101 Deutschland FALSE
+university of hamburg de Europe Western Europe FALSE 2 2021-02-03 101158067 way "Universität Hamburg, 177, Mittelweg, Rotherbaum, Eimsbüttel, Hamburg, 20148, Deutschland" building yes 0.101 Deutschland FALSE
+university of kiel de Europe Western Europe FALSE 2 2021-02-03 95613087 way "Fachhochschule Kiel, Grenzstraße, Neumühlen-Dietrichsdorf, Kiel, Schleswig-Holstein, 24149, Deutschland" amenity university 0.414691670621569 Deutschland FALSE
+university of konstanz de Europe Western Europe FALSE 2 2021-02-03 96173591 way "Universität Konstanz, 10, Universitätsstraße, Konstanz-Egg, Konstanz, Verwaltungsgemeinschaft Konstanz, Landkreis Konstanz, Baden-Württemberg, 78464, Deutschland" amenity university 0.577529588367216 Deutschland FALSE
+university of leipzig de Europe Western Europe FALSE 2 2021-02-03 134933365 way "Hochschule für Technik, Wirtschaft und Kultur Leipzig, Richard-Lehmann-Straße, Connewitz, Süd, Leipzig, Sachsen, Deutschland" amenity university 0.426239076957718 Deutschland FALSE
+university of lübeck de Europe Western Europe FALSE 2 2021-02-03 10423017 node "Musikhochschule Lübeck, Große Petersgrube, Innenstadt, Lübeck, Schleswig-Holstein, 23552, Deutschland" amenity university 0.450710506461892 Deutschland FALSE
+university of mainz de Europe Western Europe FALSE 2 2021-02-03 79998910 node "Praxis Dipl.-Psych. Univ. Thilo Rommel, 13, Emmeransstraße, Altstadt, Mainz, Rheinland-Pfalz, 55116, Deutschland" amenity doctors 0.101 Deutschland FALSE
+university of ulm de Europe Western Europe FALSE 2 2021-02-03 136528376 way "Hochschule Neu-Ulm, John-F.-Kennedy-Straße, Wiley-Mitte, Neu-Ulm, Landkreis Neu-Ulm, Bayern, 89231, Deutschland" amenity university 0.36691348680426 Deutschland FALSE
+university of wuppertal de Europe Western Europe FALSE 2 2021-02-03 96382279 way "Bergische Universität Wuppertal - Campus Grifflenberg, Gaußstraße, Grifflenberg, Gemarkung Elberfeld, Wuppertal, Nordrhein-Westfalen, 42119, Deutschland" amenity university 0.538650451987068 Deutschland FALSE
+czech technical university cz Europe Eastern Europe FALSE 2 2021-02-03 96182197 way "ÄŒeské vysoké uÄ<8d>enà technické v Praze, Na Zderaze, Nové MÄ›sto, Hlavnà mÄ›sto Praha, Praha, 11121, ÄŒesko" amenity university 0.001 ÄŒesko FALSE
+gsa cz Europe Eastern Europe FALSE 2 2021-02-03 179764032 way "Agentura pro evropský GNSS, Strossmayerovo námÄ›stÃ, HoleÅ¡ovice, Hlavnà mÄ›sto Praha, Praha, 170 00, ÄŒesko" office government 0.372568181723457 ÄŒesko FALSE
+lipi cz Europe Eastern Europe FALSE 2 2021-02-03 258043507 relation "LipÃ, okres ÄŒeské BudÄ›jovice, JihoÄ<8d>eský kraj, Jihozápad, ÄŒesko" boundary administrative 0.445458181651172 ÄŒesko FALSE
+lyra cz Europe Eastern Europe FALSE 2 2021-02-03 49441191 node "Lyra, LudvÃkov, okres Bruntál, Moravskoslezský kraj, Moravskoslezsko, 79324, ÄŒesko" natural peak 0.4 ÄŒesko FALSE
+pr cz Europe Eastern Europe FALSE 2 2021-02-03 257910432 relation "Hlavnà město Praha, Praha, Česko" boundary administrative 0.843491463278747 Česko FALSE
+public interest cz Europe Eastern Europe FALSE 2 2021-02-03 13912826 node "Public interest, U Milosrdných, Staré Město, Hlavnà město Praha, Praha, 110000, Česko" amenity bar 0.201 Česko FALSE
+vivus cz Europe Eastern Europe FALSE 2 2021-02-03 142158070 way "Vivus, Kurta Konráda, Libeň, Hlavnà město Praha, Praha, 19093, Česko" building residential 0.101 Česko FALSE
+icmr cy Asia Western Asia FALSE 2 2021-02-03 59592822 node "ICMR, 100, Leoforos Amathountos, Κοινότητα Αγίου ΤÏ<8d>χωνα, Λεμεσός, ΚÏ<8d>Ï€Ï<81>ος, 4532, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs" amenity clinic 0.101 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+cape verde cv Africa Western Africa FALSE 2 2021-02-03 258324792 relation Cabo Verde boundary administrative 0.757468696317777 Cabo Verde FALSE
+coca cola cr Americas Central America FALSE 2 2021-02-03 258704001 relation "Coca Cola, Merced, Cantón San José, Provincia San José, 10102, Costa Rica" boundary administrative 0.45 Costa Rica FALSE
+centre of genomics co Americas South America FALSE 2 2021-02-03 12402461 node "GENOMICS, Carrera 42, Tequendama, Comuna 19, PerÃmetro Urbano Santiago de Cali, Cali, Sur, Valle del Cauca, PacÃfica, 76000, Colombia" amenity hospital 0.101 Colombia FALSE
+concordia co Americas South America FALSE 2 2021-02-03 258583302 relation "Concordia, Suroeste, Antioquia, Región Andina, Colombia" boundary administrative 0.55 Colombia FALSE
+gpi co Americas South America FALSE 2 2021-02-03 250290459 way "Guapi Airport, Carrera 9B, OlÃmpico, Olimpico, Guapi, PacÃfico, Cauca, PacÃfica, Colombia" aeroway aerodrome 0.305003945962319 Colombia FALSE
+interfax co Americas South America FALSE 2 2021-02-03 26601120 node "Interfax, Carrera 3, San Pedro, Casco urbano ChÃa, ChÃa, Sabana Centro, Cundinamarca, Región Andina, 25001, Colombia" shop computer 0.101 Colombia FALSE
+national university of colombia co Americas South America FALSE 2 2021-02-03 259285997 relation "Universidad Nacional de Colombia, 26-85, Carrera 45, Rafael Nuñez, UPZ La Esmeralda, Localidad Teusaquillo, Bogotá, Bogotá Distrito Capital, Región Andina, 111321, Colombia" amenity university 0.381311730611622 Colombia FALSE
+chinese academy of engineering cn Asia Eastern Asia FALSE 2 2021-02-03 218888890 way "ä¸å›½ç§‘å¦é™¢è¿‡ç¨‹å·¥ç¨‹ç ”究所(东区), ä¸å…³æ<9d>‘北二æ<9d>¡, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" amenity research_institute 0.119931111449547 ä¸å›½ FALSE
+chinese academy of sciences institute of vertebrate paleontology cn Asia Eastern Asia FALSE 2 2021-02-03 154175740 way "Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½" amenity public_building 0.801 ä¸å›½ FALSE
+chinese academy of sciences' institute of vertebrate paleontology cn Asia Eastern Asia FALSE 2 2021-02-03 154175740 way "Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½" amenity public_building 0.801 ä¸å›½ FALSE
+chongqing university cn Asia Eastern Asia FALSE 2 2021-02-03 69380859 node "é‡<8d>庆大å¦, æ²™å<9d>ªå<9d><9d>北街, æ²™å<9d>ªå<9d><9d>è¡—é<81>“, æ²™å<9d>ªå<9d><9d>区, é‡<8d>庆ä¸å¿ƒåŸŽåŒº, é‡<8d>庆市, 400030, ä¸å›½" railway station 0.001 ä¸å›½ FALSE
+fujian cn Asia Eastern Asia FALSE 2 2021-02-03 258464335 relation "ç¦<8f>建çœ<81>, ä¸å›½" boundary administrative 0.661825005937183 ä¸å›½ FALSE
+guangzhou medical university cn Asia Eastern Asia FALSE 2 2021-02-03 299916891 node "广医大(ç•ªç¦ºæ ¡åŒº)ç«™, S296, æ–°é€ é•‡, 番禺区, 广州市, 广东çœ<81>, 511434, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+harbin institute of technology cn Asia Eastern Asia FALSE 2 2021-02-03 258684322 relation "哈尔滨工业大å¦, 教化街, 花å›è¡—é<81>“办事处, å<8d>—岗区, 哈尔滨市, 黑龙江çœ<81>, 150000, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+institute of vertebrate paleontology and paleoanthropology cn Asia Eastern Asia FALSE 2 2021-02-03 154175740 way "Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½" amenity public_building 0.601 ä¸å›½ FALSE
+ipm cn Asia Eastern Asia FALSE 2 2021-02-03 135424854 way "澳門ç<90>†å·¥å¸é™¢ Instituto Politecnico de Macau, 高美士街 Rua de LuÃs Gonzaga Gomes, æ–°å<8f>£å²¸å¡«æµ·å<8d>€ Zona de Aterros do Porto Exterior, æ–°å<8f>£å²¸æ–°å¡«æµ·å<8d>€(皇æœ<9d>å<8d>€) Zona Nova de Aterros do Porto Exterior, å¤§å ‚å<8d>€ Sé, 澳門 Macau, 853, ä¸å›½" amenity college 0.359793334348642 ä¸å›½ FALSE
+jiuquan satellite launch center cn Asia Eastern Asia FALSE 2 2021-02-03 146193628 way "酒泉å<8d>«æ˜Ÿå<8f>‘å°„ä¸å¿ƒ, S315, 东风镇, é¢<9d>济纳旗, 阿拉善盟, 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½" aeroway spaceport 0.46012624965149 ä¸å›½ FALSE
+lmc cn Asia Eastern Asia FALSE 2 2021-02-03 120334390 way "è<90>½é¦¬æ´² Lok Ma Chau, è<90>½é¦¬æ´²æ”¯ç·šç®¡åˆ¶ç«™ Lok Ma Chau Spur Line, ç¦<8f>田区, 深圳市, 元朗å<8d>€ Yuen Long District, æ–°ç•Œ New Territories, 广东çœ<81>, 香港 Hong Kong, 518048, ä¸å›½" building train_station 0.402513658204824 ä¸å›½ FALSE
+nankai university cn Asia Eastern Asia FALSE 2 2021-02-03 101663669 way "å<8d>—开大å¦, å¤<8d>康路辅路, å<8d>—开区 (Nankai), 天津市, 300381, ä¸å›½" amenity university 0.579467215043441 ä¸å›½ FALSE
+nyu shanghai cn Asia Eastern Asia FALSE 2 2021-02-03 164692824 way "NYU Shanghai, 1555, 世纪大é<81>“, å¼ å®¶æ¥¼, 花木镇, 浦东新区, 200120, ä¸å›½" amenity university 0.201 ä¸å›½ FALSE
+science and economic development cn Asia Eastern Asia FALSE 2 2021-02-03 149149294 way "国盛科技å›, 北京ç»<8f>济技术开å<8f>‘区, è<8d>£å<8d>Žè¡—é<81>“, 大兴区, 北京市, ä¸å›½" landuse industrial 0.2 ä¸å›½ FALSE
+shanghai ocean university cn Asia Eastern Asia FALSE 2 2021-02-03 205461712 way "上海海洋大å¦ï¼ˆä¸´æ¸¯æ ¡åŒºï¼‰, 东海大桥, 浦东新区, 201306, ä¸å›½" amenity university 0.370639694209592 ä¸å›½ FALSE
+shanghaitech university cn Asia Eastern Asia FALSE 2 2021-02-03 258792021 relation "上海科技大å¦, 393å<8f>·, å<8d>Žå¤<8f>ä¸è·¯, 康桥镇, 浦东新区, 101201, ä¸å›½" amenity university 0.377613648458292 ä¸å›½ FALSE
+shenzhen stock exchange cn Asia Eastern Asia FALSE 2 2021-02-03 244033990 way "2012å<8f>·, 深圳è¯<81>券交易所, ç¦<8f>田区, 深圳市, 广东çœ<81>, 518038, ä¸å›½" landuse commercial 0.444601849346538 ä¸å›½ FALSE
+sichuan university cn Asia Eastern Asia FALSE 2 2021-02-03 162743780 way "å››å·<9d>大å¦ï¼ˆæœ›æ±Ÿæ ¡åŒºï¼‰, å¼ æ¾œè·¯, æ¦ä¾¯åŒº, æˆ<90>都市, å››å·<9d>çœ<81>, 610021, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+times higher education cn Asia Eastern Asia FALSE 2 2021-02-03 83556554 node "时代è<81>”å<8d>Žè¶…市, å¦æž—è¡—, 白æ<9d>¨è¡—é<81>“, 钱塘新区, æ<9d>州市, 浙江çœ<81>, 310018, ä¸å›½" shop yes 0.001 ä¸å›½ FALSE
+university of siena cn Asia Eastern Asia FALSE 2 2021-02-03 58928209 node "å¤§å¸ University, 沙田å<8d>€å–®è»Šä¸»å¹¹ç¶« Major Cycle Track of Sha Tin District, 馬料水 Ma Liu Shui, ä¹<9d>è‚š Kau To, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" railway station 0.582526166251558 ä¸å›½ FALSE
+xi'an jiaotong university cn Asia Eastern Asia FALSE 2 2021-02-03 156097263 way "西安交通大å¦å…´åº†æ ¡åŒº, å<8f>‹è°Šä¸œè·¯, 碑林区 (Beilin), 西安市, 陕西çœ<81>, 710048, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+yunnan university cn Asia Eastern Asia FALSE 2 2021-02-03 50461251 node "云å<8d>—大å¦, é<9d>’云街, å<8d>Žå±±è¡—é<81>“, 五å<8d>ŽåŒº, 昆明市, 云å<8d>—çœ<81>, 650031, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+cerro tololo cl Americas South America FALSE 2 2021-02-03 23589264 node "Cerro Tololo, Vicuña, Provincia de Elqui, Región de Coquimbo, Chile" place locality 0.325 Chile FALSE
+conicyt cl Americas South America FALSE 2 2021-02-03 18074608 node "CONICYT, Bernarda MorÃn, Providencia, Provincia de Santiago, Región Metropolitana de Santiago, 7501091, Chile" amenity bicycle_parking 0.101 Chile FALSE
+giant magellan telescope cl Americas South America FALSE 2 2021-02-03 5515191 node "Giant Magellan Telescope, Las Campanas, La Higuera, Provincia de Elqui, Región de Coquimbo, Chile" man_made telescope 0.301 Chile FALSE
+la silla observatory cl Americas South America FALSE 2 2021-02-03 122581340 way "La Silla Observatory, La Silla internal road, La Higuera, Provincia de Elqui, Región de Coquimbo, Chile" amenity research_institute 0.301 Chile FALSE
+las campanas observatory cl Americas South America FALSE 2 2021-02-03 102955757 way "Las Campanas Observatory, Vallenar, Provincia de Huasco, Región de Atacama, Chile" landuse observatory 0.5 Chile FALSE
+punta arenas cl Americas South America FALSE 2 2021-02-03 258446317 relation "Punta Arenas, Provincia de Magallanes, Región de Magallanes y de la Antártica Chilena, Chile" boundary administrative 0.702705295739513 Chile FALSE
+aspi ch Europe Western Europe FALSE 2 2021-02-03 22396364 node "Aspi, Lützelflüh, Verwaltungskreis Emmental, Verwaltungsregion Emmental-Oberaargau, Bern/Berne, 3434, Schweiz/Suisse/Svizzera/Svizra" place hamlet 0.35 Schweiz/Suisse/Svizzera/Svizra FALSE
+international olympic committee ch Europe Western Europe FALSE 2 2021-02-03 213449037 way "Comité International Olympique, Route de Vidy, Lausanne, District de Lausanne, Vaud, 1020, Schweiz/Suisse/Svizzera/Svizra" office ngo 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+ofac ch Europe Western Europe FALSE 2 2021-02-03 43854237 node "OFAC, 7, Rue Pedro-Meylan, Champel, Genève, 1208, Schweiz/Suisse/Svizzera/Svizra" place house 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+snsf ch Europe Western Europe FALSE 2 2021-02-03 23413803 node "Schweizerischer Nationalfonds (SNF), Wildhainweg, Stadtbach, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra" office government 0.001 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of berne ch Europe Western Europe FALSE 2 2021-02-03 258566275 relation "Universität Bern, Falkenplatz, Länggasse, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.626372678886767 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of fribourg ch Europe Western Europe FALSE 2 2021-02-03 79253283 node "Department of Geosciences at the University of Fribourg, Chemin du Musée, Pérolles, Fribourg - Freiburg, District de la Sarine, Fribourg/Freiburg, 1705, Schweiz/Suisse/Svizzera/Svizra" office educational_institution 0.301 Schweiz/Suisse/Svizzera/Svizra FALSE
+wipo ch Europe Western Europe FALSE 2 2021-02-03 134711656 way "Organisation Mondiale de la Propriété Intellectuelle, 34, Chemin des Colombettes, Moillebeau, Petit-Saconnex et Servette, Genève, 1209, Schweiz/Suisse/Svizzera/Svizra" building yes 0.361912708763218 Schweiz/Suisse/Svizzera/Svizra FALSE
+world trade organization ch Europe Western Europe FALSE 2 2021-02-03 211703140 way "Organisation Mondiale du Commerce, Rue de Lausanne, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" office government 0.613282888246145 Schweiz/Suisse/Svizzera/Svizra FALSE
+republic of the congo cg Africa Middle Africa FALSE 2 2021-02-03 257866268 relation Congo boundary administrative 0.767415764799089 Congo FALSE
+inrb cd Africa Middle Africa FALSE 2 2021-02-03 196637632 way "INRB, Avenue des Huileries, Golf, Gombe, Kinshasa, 012, République démocratique du Congo" building yes 0.101 République démocratique du Congo FALSE
+alpha centauri ca Americas Northern America FALSE 2 2021-02-03 45319061 node "Mount Alpha Centauri, Area G (Forster Creek/Mount Assiniboine), Regional District of East Kootenay, British Columbia, Canada" natural peak 0.5 Canada FALSE
+canadian association of university teachers ca Americas Northern America FALSE 2 2021-02-03 64284898 node "Canadian Association of University Teachers, 2705, Queensview Drive, Britannia Heights, Bay, Ottawa, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K2B 6B7, Canada" office association 0.501 Canada FALSE
+canadian museum of nature ca Americas Northern America FALSE 2 2021-02-03 144159501 way "Canadian Museum of Nature, Argyle Avenue, Golden Triangle, Centretown, Somerset, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K2P 1Z4, Canada" tourism museum 0.794667642378454 Canada FALSE
+institute of ecology ca Americas Northern America FALSE 2 2021-02-03 50878159 node "Canadian Institute of Forestry, The Canadian Ecology Centre Road, Mattawa, Nipissing District, Northeastern Ontario, Ontario, P0H 1V0, Canada" amenity college 0.301 Canada FALSE
+institute of ocean sciences ca Americas Northern America FALSE 2 2021-02-03 259251964 relation "Institute of Ocean Sciences, 9860, West Saanich Road, Sidney, Capital Regional District, British Columbia, V8L 4B2, Canada" building yes 0.401 Canada FALSE
+lakehead university ca Americas Northern America FALSE 2 2021-02-03 138297326 way "Lakehead University, North Spirit Road, Thunder Bay, Thunder Bay District, Northwestern Ontario, Ontario, P7B 5E1, Canada" amenity university 0.201 Canada FALSE
+mcgill ca Americas Northern America FALSE 2 2021-02-03 295834059 node "McGill, Boulevard De Maisonneuve Ouest, Quartier des Spectacles, René-Lévesque, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3A 3J2, Canada" railway station 0.472714057293031 Canada FALSE
+memorial university of newfoundland ca Americas Northern America FALSE 2 2021-02-03 47197396 node "Queen's College Sign, Long Pond Trail, Memorial University of Newfoundland main campus, St. John's, Newfoundland, Newfoundland and Labrador, A1B 3P7, Canada" tourism information 0.401 Canada FALSE
+newfoundland ca Americas Northern America FALSE 2 2021-02-03 259208749 relation "Newfoundland, Newfoundland and Labrador, Canada" boundary administrative 0.6 Canada FALSE
+northwest passage ca Americas Northern America FALSE 2 2021-02-03 1180737 node "Northwest Passage, á•¿á‘á–…á‘–á“—á’ƒ Qikiqtaaluk Region, ᓄᓇᕗᑦ Nunavut, Canada" place locality 0.721993908833439 Canada FALSE
+ocean networks canada ca Americas Northern America FALSE 2 2021-02-03 214362677 way "NEPTUNE Ocean Observatory Shore Station - Ocean Networks Canada, 2180, Mallory Drive, Cameron Heights, Port Alberni, Alberni-Clayoquot Regional District, British Columbia, V9Y 2A8, Canada" office research 0.301 Canada FALSE
+oceans canada ca Americas Northern America FALSE 2 2021-02-03 3422315 node "Oceans, 4557, Hurontario Street, Mississauga, Peel Region, Golden Horseshoe, Ontario, L5R 3E7, Canada" shop supermarket 0.201 Canada FALSE
+parks canada ca Americas Northern America FALSE 2 2021-02-03 157069631 way "Jasper Park Information Centre, 500, Connaught Drive, Municipality of Jasper, Alberta, T0E 1E0, Canada" tourism information 0.508746182183473 Canada FALSE
+perimeter institute ca Americas Northern America FALSE 2 2021-02-03 150705575 way "Perimeter Institute for Theoretical Physics, 31, Caroline Street North, Uptown, Waterloo, Region of Waterloo, Southwestern Ontario, Ontario, N2L 2Y5, Canada" building university 0.545725205949526 Canada FALSE
+public health agency of canada ca Americas Northern America FALSE 2 2021-02-03 194692555 way "Public Health Agency of Canada, 130, Colonnade Road South, Fisher Glen, Knoxdale-Merivale, Nepean, Ottawa, Eastern Ontario, Ontario, K2E 7Y1, Canada" office government 0.501 Canada FALSE
+puma ca Americas Northern America FALSE 2 2021-02-03 41765486 node "Puma, Area C (Pemberton Valley/Mount Currie/D'Arcy), Squamish-Lillooet Regional District, British Columbia, Canada" natural peak 0.4 Canada FALSE
+royal tyrrell museum ca Americas Northern America FALSE 2 2021-02-03 117591275 way "Royal Tyrrell Museum, 1500, North Dinosaur Trail, Nacmine, Drumheller, Alberta, T0J 0Y1, Canada" tourism museum 0.692168689295747 Canada FALSE
+saskatchewan ca Americas Northern America FALSE 2 2021-02-03 258121188 relation "Saskatchewan, Canada" boundary administrative 0.748590173341754 Canada FALSE
+university of new brunswick ca Americas Northern America FALSE 2 2021-02-03 93050151 way "University of New Brunswick, Rue Winslow, Town Platt, Downtown, Fredericton, York County, New Brunswick / Nouveau-Brunswick, E3B 4C9, Canada" amenity university 0.864942671117145 Canada FALSE
+university of ottawa heart institute ca Americas Northern America FALSE 2 2021-02-03 107373367 way "University of Ottawa Heart Institute, 40, Ruskin Street, Civic Hospital, Hintonburg, Kitchissippi, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1Y 4W7, Canada" building hospital 0.752344279227432 Canada FALSE
+university of sherbrooke ca Americas Northern America FALSE 2 2021-02-03 120967475 way "Bishop's University, Rue Winder, Lennoxville, Sherbrooke, Estrie, Québec, J1M 1H9, Canada" amenity university 0.201 Canada FALSE
+susy by Europe Eastern Europe FALSE 2 2021-02-03 259261467 relation "Суши, ПершайÑ<81>кий Ñ<81>ельÑ<81>кий Совет, ВоложинÑ<81>кий район, МинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, БеларуÑ<81>ÑŒ" boundary administrative 0.25 БеларуÑ<81>ÑŒ FALSE
+cdu br Americas South America FALSE 2 2021-02-03 92204695 way "Carandiru, 2487, Avenida Cruzeiro do Sul, Santana, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 02031-000, Brasil" railway station 0.343659122005759 Brasil FALSE
+cosan br Americas South America FALSE 2 2021-02-03 185049204 way "COSAN, Vila Triagem, Bauru, Região Imediata de Bauru, Região Geográfica Intermediária de Bauru, São Paulo, Região Sudeste, Brasil" landuse industrial 0.3 Brasil FALSE
+eht br Americas South America FALSE 2 2021-02-03 169009776 way "EHT, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70297400, Brasil" highway unclassified 0.2 Brasil FALSE
+embrapa br Americas South America FALSE 2 2021-02-03 259507924 relation "Embrapa, Teresina, Região Geográfica Imediata de Teresina, Região Integrada de Desenvolvimento da Grande Teresina, Região Geográfica Intermediária de Teresina, PiauÃ, Região Nordeste, Brasil" boundary administrative 0.35 Brasil FALSE
+fapesp br Americas South America FALSE 2 2021-02-03 190947973 way "Fundação de Amparo à Pesquisa do Estado de São Paulo, 1500, Rua Pio XI, Vila Ida, Alto de Pinheiros, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05060-001, Brasil" office government 0.001 Brasil FALSE
+federal university of espírito santo br Americas South America FALSE 2 2021-02-03 190158758 way "Universidade Federal do EspÃrito Santo, 514, Avenida Fernando Ferrari, Mata da Praia, Goiabeiras, Vitória, Região Geográfica Imediata de Vitória, Região Metropolitana da Grande Vitória, Região Geográfica Intermediária de Vitória, EspÃrito Santo, Região Sudeste, 29075-910, Brasil" amenity university 0.696675389924706 Brasil FALSE
+general electric br Americas South America FALSE 2 2021-02-03 259288604 relation "General Electric, Campinas, Região Imediata de Campinas, Região Metropolitana de Campinas, Região Geográfica Intermediária de Campinas, São Paulo, Região Sudeste, Brasil" landuse industrial 0.4 Brasil FALSE
+ilsi br Americas South America FALSE 2 2021-02-03 114074052 way "Rua Ilsi Ragadalli, Alvorada, Videira, Região Geográfica Imediata de Videira, Região Geográfica Intermediária de Caçador, Santa Catarina, Região Sul, 89560-000, Brasil" highway residential 0.2 Brasil FALSE
+ministry of science and innovation br Americas South America FALSE 2 2021-02-03 65507092 node "Ministry of Science, Technology & Innovation, or Ministry of National Integration, S1, Setor de Autarquias Sul, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70058-900, Brasil" office government 0.401 Brasil FALSE
+natal br Americas South America FALSE 2 2021-02-03 296675227 relation "Natal, Região Geográfica Imediata de Natal, Região Geográfica Intermediária de Natal, Rio Grande do Norte, Região Nordeste, Brasil" boundary administrative 0.650113556587143 Brasil FALSE
+national museum of natural sciences br Americas South America FALSE 2 2021-02-03 139974775 way "Museu de Ciências Naturais, 1427, Rua Doutor Salvador França, Jardim Botânico, Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 90690-000, Brasil" tourism museum 0.256321943137092 Brasil FALSE
+novo nordisk br Americas South America FALSE 2 2021-02-03 184059049 way "Novo Nordisk, Araucária, Região Geográfica Imediata de Curitiba, Região Metropolitana de Curitiba, Região Geográfica Intermediária de Curitiba, Paraná, Região Sul, Brasil" landuse industrial 0.4 Brasil FALSE
+pepsico br Americas South America FALSE 2 2021-02-03 160482058 way "Pepsico, Parque Cecap, Guarulhos, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, Brasil" landuse industrial 0.3 Brasil FALSE
+saao br Americas South America FALSE 2 2021-02-03 258424944 relation "São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, Brasil" boundary administrative 0.686174911942028 Brasil FALSE
+ssa br Americas South America FALSE 2 2021-02-03 257989248 relation "Salvador, Região Geográfica Imediata de Salvador, Região Metropolitana de Salvador, Região Geográfica Intermediária de Salvador, Bahia, Região Nordeste, Brasil" boundary administrative 0.581639551877681 Brasil FALSE
+transocean br Americas South America FALSE 2 2021-02-03 158079760 way "Transocean, Macaé, Região Geográfica Imediata de Macaé-Rio das Ostras, Região Geográfica Intermediária de Macaé-Rio das Ostras-Cabo Frio, Rio de Janeiro, Região Sudeste, 27925-290, Brasil" landuse industrial 0.3 Brasil FALSE
+ufmg br Americas South America FALSE 2 2021-02-03 258485573 relation "Campus UFMG, Pampulha, Belo Horizonte, Microrregião Belo Horizonte, Região Metropolitana de Belo Horizonte, Minas Gerais, Região Sudeste, 31270-901, Brasil" boundary administrative 0.35 Brasil FALSE
+fish department bo Americas South America FALSE 2 2021-02-03 259568738 relation "Isla del Pescado, Canton Caquena, Municipio Tahua, Provincia Daniel Campos, PotosÃ, Bolivia" place island 0.220860870373788 Bolivia FALSE
+ocean sciences bm Americas Northern America FALSE 2 2021-02-03 134000033 way "Bermuda Institute of Ocean Sciences, Biological Station, Saint George's, GE03, Bermuda" amenity university 0.487418940697571 Bermuda FALSE
+burundi bi Africa Eastern Africa FALSE 2 2021-02-03 257886094 relation Burundi boundary administrative 0.759633388730087 Burundi FALSE
+deloitte bi Africa Eastern Africa FALSE 2 2021-02-03 168988264 way "DELOITTE, Kabondo, Mukaza, Bujumbura Mairie, Burundi" landuse commercial 0.3 Burundi FALSE
+bulgarian academy of sciences bg Europe Eastern Europe FALSE 2 2021-02-03 259375000 relation "БългарÑ<81>ка академиÑ<8f> на науките (БÐ<90>Ð<9d>), 1, 15-ти Ð<9d>оември, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1040, БългaриÑ<8f>" amenity research_institute 0.482632410251413 БългaриÑ<8f> FALSE
+council of ministers bg Europe Eastern Europe FALSE 2 2021-02-03 126237485 way "МиниÑ<81>терÑ<81>ки Ñ<81>ъвет, 1, бул. КнÑ<8f>з Ð<90>лекÑ<81>андър Дондуков, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1000, БългaриÑ<8f>" office government 0.001 БългaриÑ<8f> FALSE
+council of the european union be Europe Western Europe FALSE 2 2021-02-03 75256623 node "Council of the European Union, 175, Rue de la Loi - Wetstraat, Quartier européen - Europese Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1048, België / Belgique / Belgien" office government 1.04458004666179 België / Belgique / Belgien FALSE
+erasmus medical center be Europe Western Europe FALSE 2 2021-02-03 314840 node "Erasme - Erasmus, Route de Lennik - Lennikse Baan, Anderlecht, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1070, België / Belgique / Belgien" railway station 0.444585942469205 België / Belgique / Belgien FALSE
+nsac be Europe Western Europe FALSE 2 2021-02-03 101563927 way "NSAC, Nieuwpoortsesteenweg, Raversijde, Oostende, West-Vlaanderen, Vlaanderen, 8400, België / Belgique / Belgien" building yes 0.101 België / Belgique / Belgien FALSE
+royal belgian institute of natural sciences be Europe Western Europe FALSE 2 2021-02-03 109874865 way "Institut royal des Sciences naturelles de Belgique - Koninklijk Belgisch Instituut voor Natuurwetenschappen, 29, Rue Vautier - Vautierstraat, Espace Léopold - Leopoldruimte, Bruxelles / Brussel, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1000, België / Belgique / Belgien" amenity research_institute 0.53461374284578 België / Belgique / Belgien FALSE
+spd bd Asia Southern Asia FALSE 2 2021-02-03 183078064 way "সৈয়দপà§<81>র বিমানবনà§<8d>দর, Saidpur - Parbotipur Road, সৈয়দপà§<81>র উপজেলা, নীলফামারী জেলা, 5310, বাংলাদেশ" aeroway aerodrome 0.297085518539193 বাংলাদেশ FALSE
+barbados bb Americas Caribbean FALSE 2 2021-02-03 258050720 relation Barbados boundary administrative 0.759547412593721 Barbados FALSE
+society bb Americas Caribbean FALSE 2 2021-02-03 82341924 node "Society, Massiah Street, Saint John, BB18003, Barbados" place hamlet 0.35 Barbados FALSE
+abc au Oceania Australia and New Zealand FALSE 2 2021-02-03 154556170 way "Australian Broadcasting Corporation, 114, Grey Street, South Bank, South Brisbane, Brisbane City, Queensland, 4101, Australia" building yes 0.589492484386201 Australia FALSE
+advisory council au Oceania Australia and New Zealand FALSE 2 2021-02-03 82359808 node "Weekes Accounting & Advisory, 211, George Street, Bathurst, Bathurst Regional Council, New South Wales, 2795, Australia" office accountant 0.201 Australia FALSE
+australian antarctic division au Oceania Australia and New Zealand FALSE 2 2021-02-03 101676576 way "Australian Antarctic Division, Kingston, Hobart, Kingborough, Tasmania, Australia" landuse commercial 0.5 Australia FALSE
+australian bureau of meteorology au Oceania Australia and New Zealand FALSE 2 2021-02-03 96874627 way "The Australian Bureau of Meteorology Building, 700, Collins Street, Batman's Hill, Docklands, South Wharf, City of Melbourne, Victoria, 3008, Australia" building yes 0.401 Australia FALSE
+australian institute of marine science au Oceania Australia and New Zealand FALSE 2 2021-02-03 174039789 way "Australian Institute of Marine Science, Cape Cleveland Road, Cape Cleveland, Townsville City, Queensland, Australia" office research 0.501 Australia FALSE
+charles sturt university in wagga wagga au Oceania Australia and New Zealand FALSE 2 2021-02-03 258986170 relation "Charles Sturt University, Wagga Wagga City Council, New South Wales, 2678, Australia" boundary administrative 0.75 Australia FALSE
+cjd au Oceania Australia and New Zealand FALSE 2 2021-02-03 78556896 node "CJD, 210, Northbourne Road, Campbellfield, City of Hume, Victoria, 3062, Australia" building yes 0.101 Australia FALSE
+department of science and innovation au Oceania Australia and New Zealand FALSE 2 2021-02-03 66634213 node "Department of Industry, Innovation and Science, 10, Binara Street, City, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia" office government 0.501 Australia FALSE
+global alliance au Oceania Australia and New Zealand FALSE 2 2021-02-03 146534335 way "OneSchool Global (Perth Campus), Alliance Loop, Willetton, City Of Canning, Western Australia, 6155, Australia" amenity school 0.201 Australia FALSE
+global change institute au Oceania Australia and New Zealand FALSE 2 2021-02-03 149247325 way "Global Change Institute, Campbell Place, St Lucia, Brisbane City, Queensland, Australia" building university 0.301 Australia FALSE
+isa au Oceania Australia and New Zealand FALSE 2 2021-02-03 872993 node "Mount Isa Airport, Barkly Highway, Kalkadoon, Mount Isa, Mount Isa City, Queensland, 4825, Australia" aeroway aerodrome 0.496970989529109 Australia FALSE
+james cook university in cairns au Oceania Australia and New Zealand FALSE 2 2021-02-03 137903302 way "James Cook University, 14-88, McGregor Road, Smithfield, Cairns Regional, Queensland, 4878, Australia" amenity university 0.82561814389347 Australia FALSE
+nra au Oceania Australia and New Zealand FALSE 2 2021-02-03 1301653 node "Narrandera-Leeton Airport, Irrigation Way, Cudgel, Narrandera, Narrandera Shire Council, New South Wales, 2703, Australia" aeroway aerodrome 0.391635072114972 Australia FALSE
+queensland brain institute au Oceania Australia and New Zealand FALSE 2 2021-02-03 103375921 way "Queensland Brain Institute, Research Road, St Lucia, Brisbane City, Queensland, 4072, Australia" building university 0.301 Australia FALSE
+red cross au Oceania Australia and New Zealand FALSE 2 2021-02-03 200522594 way "Australian Red Cross Blood Bank, 100-154, Batman Street, West Melbourne, Melbourne, City of Melbourne, Victoria, 3003, Australia" office ngo 0.577343921991154 Australia FALSE
+sea grant au Oceania Australia and New Zealand FALSE 2 2021-02-03 38783636 node "Sea Coast Hill, The District Council of Grant, South Australia, Australia" natural peak 0.5 Australia FALSE
+university of canberra au Oceania Australia and New Zealand FALSE 2 2021-02-03 95127906 way "University of Canberra, University Drive, Bruce, District of Belconnen, Australian Capital Territory, 2617, Australia" amenity university 0.731727684347105 Australia FALSE
+university of central america au Oceania Australia and New Zealand FALSE 2 2021-02-03 702491 node "Southern Cross University Coffs Harbour Campus, Doug Knight Drive, Coffs Harbour, Coffs Harbour City Council, New South Wales, 2450, Australia" amenity university 0.201 Australia FALSE
+university of southern queensland au Oceania Australia and New Zealand FALSE 2 2021-02-03 102275969 way "University of Southern Queensland, West Street, Kearneys Spring, Toowoomba, Toowoomba Regional, Queensland, 4350, Australia" amenity university 0.401 Australia FALSE
+university of technology sydney au Oceania Australia and New Zealand FALSE 2 2021-02-03 259286837 relation "University of Technology Sydney, Goold Street, Chippendale, Sydney, Council of the City of Sydney, New South Wales, 2008, Australia" amenity university 0.822968236493861 Australia FALSE
+austrian academy of sciences at Europe Western Europe FALSE 2 2021-02-03 119966043 way "Österreichische Akademie der Wissenschaften, Institut für Weltraumforschung, 6, Schmiedlstraße, Messendorfberg, Sankt Peter, Graz, Steiermark, 8042, Österreich" amenity public_building 0.001 Österreich FALSE
+eib at Europe Western Europe FALSE 2 2021-02-03 97328818 way "Umspannwerk Eibesbrunn, Eibesbrunn, Gemeinde Großebersdorf, Bezirk Mistelbach, Niederösterreich, 2203, Österreich" landuse industrial 0.3 Österreich FALSE
+institute of molecular pathology at Europe Western Europe FALSE 2 2021-02-03 172663383 way "Research Institute of Molecular Pathology (IMP), 1, Campus-Vienna-Biocenter, Neu Marx, KG Landstraße, Landstraße, Wien, 1030, Österreich" amenity research_institute 0.689701883147039 Österreich FALSE
+institute of science and technology austria at Europe Western Europe FALSE 2 2021-02-03 3201906 node "Institute of Science and Technology (IST Austria), Am Campus, Maria Gugging, Gemeinde Klosterneuburg, Bezirk Tulln, Niederösterreich, 3400, Österreich" amenity university 0.601 Österreich FALSE
+medical university of vienna at Europe Western Europe FALSE 2 2021-02-03 258409826 relation "Ehemalige I. Med. Univ. Klink, 18-20, Michelbeuern, KG Alsergrund, Alsergrund, Wien, 1090, Österreich" landuse brownfield 0.2 Österreich FALSE
+university of graz at Europe Western Europe FALSE 2 2021-02-03 111433427 way "Institut für Amerikanistik, Karl-Franzens-Universität Graz, 25, Attemsgasse, Univiertel, Geidorf, Graz, Steiermark, 8010, Österreich" building university 0.101 Österreich FALSE
+giudice ar Americas South America FALSE 2 2021-02-03 108561010 way "Giudice, Paraná, Municipio de Paraná, Distrito Sauce, Departamento Paraná, Entre RÃos, E3104HMA, Argentina" highway residential 0.2 Argentina FALSE
+cnn ao Africa Middle Africa FALSE 2 2021-02-03 257882605 relation "Cunene, Angola" boundary administrative 0.473432996069115 Angola FALSE
+svp ao Africa Middle Africa FALSE 2 2021-02-03 214275822 way "Aeroporto de CuÃto, EN250;EN140, CuÃto, Bié, Angola" aeroway aerodrome 0.329555066820797 Angola FALSE
+albania al Europe Southern Europe FALSE 2 2021-02-03 258008970 relation Shqipëria boundary administrative 0.727911798893737 Shqipëria FALSE
+ias ae Asia Western Asia FALSE 2 2021-02-03 258381607 relation "جزيرة ياس, أبوظبي, أبو ظبي, الإمارات العربية المتØدة" place island 0.392592281336849 الإمارات العربية المتØدة FALSE
+rochester institute of technology ae Asia Western Asia FALSE 2 2021-02-03 46292016 node "Rochester Institute of Technology, شارع الشيخ Ù…Øمد بن زايد, المدينة الدولية, دبي, 341296, الإمارات العربية المتØدة" building public 0.633228686818865 الإمارات العربية المتØدة FALSE
+national university of science and technology zw Africa Eastern Africa FALSE 1 2021-02-03 182853582 way "National University of Science & Technology, Cecil Avenue, Bulawayo, Bulawayo Province, Zimbabwe" amenity university 0.748092083018094 Zimbabwe FALSE
+vfa zw Africa Eastern Africa FALSE 1 2021-02-03 156186847 way "Victoria Falls International Airport, A8, Hwange, Matabeleland North, Zimbabwe" aeroway aerodrome 0.322405775434826 Zimbabwe FALSE
+front national party zm Africa Eastern Africa FALSE 1 2021-02-03 60650639 node "Patrotic Front Party Office, D79, Mwense, Mwense District, Luapula Province, P.O BOX 760001 MWENSE, Zambia" office political_party 0.201 Zambia FALSE
+university of zambia zm Africa Eastern Africa FALSE 1 2021-02-03 259195591 relation "University of Zambia (UNZA), 32379, Great East Road, Handsworth Park, Lusaka, Lusaka District, Lusaka Province, 10101, Zambia" amenity university 0.649871957480668 Zambia FALSE
+africa health research institute za Africa Southern Africa FALSE 1 2021-02-03 54489356 node "Africa Health Research Institute, 719, Umbilo Road, Carrington Heights, eThekwini Ward 33, Durban, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4001, South Africa" amenity school 0.401 South Africa FALSE
+association za Africa Southern Africa FALSE 1 2021-02-03 98557179 way "Association, Homevale, Sol Plaatje Ward 3, Kimberley, Frances Baard District Municipality, Northern Cape, South Africa" highway residential 0.2 South Africa FALSE
+cape peninsula university of technology za Africa Southern Africa FALSE 1 2021-02-03 203129734 way "Navarre, Cummings Street, Berg en Dal, Drakenstein Ward 2, Berg en Dal, Drakenstein Local Municipality, Cape Winelands District Municipality, Western Cape, 7655, South Africa" tourism hostel 0.101 South Africa FALSE
+council for scientific and industrial research za Africa Southern Africa FALSE 1 2021-02-03 180353667 way "CSIR Building 33;Council for Scientific and Industrial Research, Yellowwood Street, Scientia, Tshwane Ward 46, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0040, South Africa" amenity university 0.601 South Africa FALSE
+council of higher education za Africa Southern Africa FALSE 1 2021-02-03 7467290 node "Council on higher education, 1, Quentin Brand Street, Persequor Technopark, Tshwane Ward 46, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0020, South Africa" office yes 0.401 South Africa FALSE
+council of scientific and industrial za Africa Southern Africa FALSE 1 2021-02-03 180353667 way "CSIR Building 33;Council for Scientific and Industrial Research, Yellowwood Street, Scientia, Tshwane Ward 46, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0040, South Africa" amenity university 0.501 South Africa FALSE
+cpt za Africa Southern Africa FALSE 1 2021-02-03 106046279 way "Cape Town International Airport, New Eisleben Road, Crossroads, Cape Town Ward 36, City of Cape Town, Western Cape, 7490, South Africa" aeroway aerodrome 0.434462489654698 South Africa FALSE
+de vries za Africa Southern Africa FALSE 1 2021-02-03 101129802 way "De Vries, Newton-Wes, Newtown-Wes, Drakenstein Local Municipality, Cape Winelands District Municipality, Western Cape, 7654, South Africa" highway residential 0.3 South Africa FALSE
+defence department za Africa Southern Africa FALSE 1 2021-02-03 182271634 way "Department of Defence, Rigel Avenue South, Erasmuskloof, Tshwane Ward 83, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0048, South Africa" office government 0.600038865094841 South Africa FALSE
+dell za Africa Southern Africa FALSE 1 2021-02-03 721242 node "The Dell, Tokai, City of Cape Town, Western Cape, 7945, South Africa" place suburb 0.375 South Africa FALSE
+department of defence za Africa Southern Africa FALSE 1 2021-02-03 182271634 way "Department of Defence, Rigel Avenue South, Erasmuskloof, Tshwane Ward 83, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0048, South Africa" office government 0.700038865094841 South Africa FALSE
+durban university of technology za Africa Southern Africa FALSE 1 2021-02-03 136500786 way "Durban University of Technology Indumiso Campus, Mthombothi Road, Slangspruit, Msunduzi Ward 19, Pietermaritzburg, Msunduzi Local Municipality, uMgungundlovu District Municipality, KwaZulu-Natal, 3200, South Africa" amenity university 0.401 South Africa FALSE
+eskom za Africa Southern Africa FALSE 1 2021-02-03 119951369 way "Eskom, Sol Plaatje Ward 28, Kimberley, Frances Baard District Municipality, Northern Cape, South Africa" landuse industrial 0.3 South Africa FALSE
+fish hoek za Africa Southern Africa FALSE 1 2021-02-03 258440959 relation "Fish Hoek, City of Cape Town, Western Cape, South Africa" place town 0.5 South Africa FALSE
+gfz za Africa Southern Africa FALSE 1 2021-02-03 123536145 way "GFZ, R356, Karoo Hoogland Ward 3, Karoo Hoogland Local Municipality, Namakwa District Municipality, Northern Cape, South Africa" building yes 0.101 South Africa FALSE
+higher education south africa za Africa Southern Africa FALSE 1 2021-02-03 241460340 way "Embury Institute for Higher Education, Silverton Road, Musgrave, eThekwini Ward 31, Durban, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4001, South Africa" amenity university 0.401 South Africa FALSE
+jacobs za Africa Southern Africa FALSE 1 2021-02-03 704227 node "Jacobs, eThekwini Ward 75, Durban, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4052, South Africa" place suburb 0.375 South Africa FALSE
+klaas post za Africa Southern Africa FALSE 1 2021-02-03 132193285 way "Klaas, Zolani, Langeberg Ward 10, Langeberg Local Municipality, Cape Winelands District Municipality, Western Cape, South Africa" highway residential 0.2 South Africa FALSE
+kwazulu-natal sharks board za Africa Southern Africa FALSE 1 2021-02-03 54691458 node "Kwazulu-Natal Sharks Board, Herrwood Drive, Westridge, eThekwini Ward 35, Umhlanga Rocks, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4319, South Africa" tourism attraction 0.401 South Africa FALSE
+mangosuthu university of technology za Africa Southern Africa FALSE 1 2021-02-03 205967123 way "Mangosuthu University of Technology, 1706 Street, Isipingo, eThekwini Ward 89, Umlazi, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4066, South Africa" amenity university 0.697580560553068 South Africa FALSE
+metropolitan municipality za Africa Southern Africa FALSE 1 2021-02-03 107180662 way "The Metropolitan, Johannesburg Ward 64, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" landuse residential 0.4 South Africa FALSE
+nelson mandela university za Africa Southern Africa FALSE 1 2021-02-03 83078177 node "Nelson Mandela University, Bushbuck Road, Nelson Mandela Bay Ward 1, Port Elizabeth, Nelson Mandela Bay Metropolitan Municipality, Eastern Cape, 6001, South Africa" office company 0.301 South Africa FALSE
+nisar za Africa Southern Africa FALSE 1 2021-02-03 1162528 node "Nisar, Stegmann Street, East Lynne, Tshwane Ward 87, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0159, South Africa" shop supermarket 0.101 South Africa FALSE
+olympus za Africa Southern Africa FALSE 1 2021-02-03 726108 node "Olympus, Aganang Local Municipality, Capricorn District Municipality, Limpopo, South Africa" place town 0.4 South Africa FALSE
+pluto & ceres za Africa Southern Africa FALSE 1 2021-02-03 111213055 way "Pluto Street, Witzenberg Ward 3, Ceres, Witzenberg Local Municipality, Cape Winelands District Municipality, Western Cape, 6835, South Africa" highway residential 0.3 South Africa FALSE
+public library of sciences za Africa Southern Africa FALSE 1 2021-02-03 258298973 relation "Sciences, Constitution Street, Cape Town Ward 77, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" building university 0.201 South Africa FALSE
+rhodes university za Africa Southern Africa FALSE 1 2021-02-03 116210497 way "Rhodes University, Allen Street, Makana Ward 8, Makhanda (Grahamstown), Makana Local Municipality, Sarah Baartman District Municipality, Eastern Cape, 6139, South Africa" amenity university 0.621665177399236 South Africa FALSE
+rooibos ltd za Africa Southern Africa FALSE 1 2021-02-03 50076730 node "Rooibos Ltd, Rooitee Avenue, Cederberg Ward 3, Clanwilliam, Cederberg Local Municipality, West Coast District Municipality, Western Cape, 8135, South Africa" shop tea 0.201 South Africa FALSE
+rsa za Africa Southern Africa FALSE 1 2021-02-03 258310948 relation South Africa boundary administrative 0.782907627703066 South Africa FALSE
+school of the coast za Africa Southern Africa FALSE 1 2021-02-03 119488567 way "School, Main, Laaiplek, Bergrivier Ward 6, Dwarskersbos, Bergrivier Local Municipality, West Coast District Municipality, Western Cape, 7365, South Africa" amenity school 0.201 South Africa FALSE
+south african national space agency za Africa Southern Africa FALSE 1 2021-02-03 48876053 node "South African National Space Agency, Mark Shuttleworth, Innovation Hub, Tshwane Ward 82, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0087, South Africa" office government 0.887075864564083 South Africa FALSE
+university of venda za Africa Southern Africa FALSE 1 2021-02-03 193237675 way "University of Venda, Agric, Thulamela Ward 36, Thohoyandou, Thulamela Local Municipality, Vhembe District Municipality, Limpopo, 0950, South Africa" amenity university 0.60799018260571 South Africa FALSE
+us ivy league za Africa Southern Africa FALSE 1 2021-02-03 220001773 way "Ivy League, 6, Cluver Road, Simonswyk, Stellenbosch Ward 7, Bo-Dalsig, Stellenbosch, Cape Winelands District Municipality, Western Cape, 7599, South Africa" building dormitory 0.201 South Africa FALSE
+wits university za Africa Southern Africa FALSE 1 2021-02-03 218343116 way "WITS University South Court, 40, Jorissen Street, Braamfontein, Johannesburg Ward 60, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" building residential 0.201 South Africa FALSE
+ais ye Asia Western Asia FALSE 1 2021-02-03 12332501 node "العيص, مديرية المسيلة, Ù…ØاÙ<81>ظة المهرة, اليمن" place town 0.3 اليمن FALSE
+al-qaeda ye Asia Western Asia FALSE 1 2021-02-03 75395984 node "القضاء, المسالم, مديرية المدان, Ù…ØاÙ<81>ظة عمران, اليمن" place suburb 0.275 اليمن FALSE
+asim ye Asia Western Asia FALSE 1 2021-02-03 12526109 node "عاصم, مديرية خب والشعÙ<81>, Ù…ØاÙ<81>ظة الجوÙ<81>, اليمن" natural peak 0.3 اليمن FALSE
+assaf ye Asia Western Asia FALSE 1 2021-02-03 75461355 node "عسـاÙ<81>, ميلات, مديرية جبل Øبشي, Ù…ØاÙ<81>ظة تعز, اليمن" place hamlet 0.25 اليمن FALSE
+dhl ye Asia Western Asia FALSE 1 2021-02-03 12533753 node "دØÙ„, مديرية خب والشعÙ<81>, Ù…ØاÙ<81>ظة الجوÙ<81>, اليمن" place village 0.275 اليمن FALSE
+dmh ye Asia Western Asia FALSE 1 2021-02-03 74835575 node "ضمØ, مديرية مناخة, Ù…ØاÙ<81>ظة صنعاء, اليمن" place hamlet 0.25 اليمن FALSE
+faah ye Asia Western Asia FALSE 1 2021-02-03 74355990 node "Ù<81>اعة السÙ<81>لى, النائÙ<81>, مديرية قضاء خمر, Ù…ØاÙ<81>ظة عمران, اليمن" place hamlet 0.25 اليمن FALSE
+nabr ye Asia Western Asia FALSE 1 2021-02-03 12269571 node "Øبر, مديرية ساقين, Ù…ØاÙ<81>ظة صعدة, اليمن" place village 0.275 اليمن FALSE
+office of health ye Asia Western Asia FALSE 1 2021-02-03 57114512 node "مكتب الصØØ©, شارع رداع, ذمار, مجمع المØاÙ<81>ظة, ذمار, مديرية مدينة ذمار, Ù…ØاÙ<81>ظة ذمار, اليمن" amenity doctors 0.001 اليمن FALSE
+kosovo xk NA NA FALSE 1 2021-02-03 258483176 relation Kosova / Kosovo boundary administrative 0.780306211882666 Kosova / Kosovo FALSE
+prn xk NA NA FALSE 1 2021-02-03 160024167 way "Aeroporti Ndërkombëtar i Prishtinës ""Adem Jashari"", Aeroporti, Vrellë e Goleshit, Komuna e Lipjanit / Opština Lipljan, 12050, Kosova / Kosovo" aeroway aerodrome 0.410428262396698 Kosova / Kosovo FALSE
+university of priština xk NA NA FALSE 1 2021-02-03 179041192 way "University for Business and Technology, Rexhep Krasniqi, Arbëri, Kalabria, Prishtinë, Komuna e Prishtinës / OpÅ¡tina PriÅ¡tina, 10000, Kosova / Kosovo" amenity university 0.201 Kosova / Kosovo FALSE
+japan international cooperation agency ws Oceania Polynesia FALSE 1 2021-02-03 301319209 way "Japan International Cooperation Agency, Main Beach Road, Apia, SÄ<81>moa" office foreign_national_agency 0.401 SÄ<81>moa FALSE
+barrick vu Oceania Melanesia FALSE 1 2021-02-03 68461868 node "Barrick, Sanma, Vanuatu" place village 0.375 Vanuatu FALSE
+pepsi vu Oceania Melanesia FALSE 1 2021-02-03 67666711 node "Pepsi, Luganville, Sanma, Vanuatu" place neighbourhood 0.35 Vanuatu FALSE
+cuc tran vn Asia South-Eastern Asia FALSE 1 2021-02-03 199887384 way "Chi cục Hải quan Móng Cái, Trần Phú, Thà nh phố Móng Cái, Việt Nam" landuse commercial 0.2 Việt Nam FALSE
+institute of plant protection vn Asia South-Eastern Asia FALSE 1 2021-02-03 230206488 way "Viện Bảo vệ Thá»±c váºt, Ngõ 68 Nông Lâm, PhÆ°á»<9d>ng Ä<90>ức Thắng, Quáºn Bắc Từ Liêm, Hà Ná»™i, 04, Việt Nam" amenity research_centre 0.001 Việt Nam FALSE
+neo vn Asia South-Eastern Asia FALSE 1 2021-02-03 3168841 node "Neo, Yên Dũng, Tỉnh Bắc Giang, Việt Nam" place town 0.4 Việt Nam FALSE
+oceanographic institute vn Asia South-Eastern Asia FALSE 1 2021-02-03 4007088 node "Oceanographic Institute of Nha Trang, Trần Phú, VÄ©nh TrÆ°á»<9d>ng, Nha Trang, Tỉnh Khánh Hòa, 652510, Việt Nam" tourism museum 0.201 Việt Nam FALSE
+oxford university clinical research unit vn Asia South-Eastern Asia FALSE 1 2021-02-03 234394315 way "Oxford University Clinical Research Unit, Ä<90>Æ°á»<9d>ng Huỳnh Mẫn Ä<90>ạt, PhÆ°á»<9d>ng 1, Quáºn 5, Thà nh phố Hồ Chà Minh, 72000, Việt Nam" building yes 0.501 Việt Nam FALSE
+politburo vn Asia South-Eastern Asia FALSE 1 2021-02-03 138890529 way "Nhà Há»<8d>p bá»™ ChÃnh trị, Phố Ông Ã<8d>ch Khiêm, Ä<90>iện Biên, PhÆ°á»<9d>ng Ä<90>iện Biên, Quáºn Ba Ä<90>ình, Hà Ná»™i, 100901, Việt Nam" building yes 0.001 Việt Nam FALSE
+tb vn Asia South-Eastern Asia FALSE 1 2021-02-03 258596011 relation "Tỉnh Thái Bình, Việt Nam" boundary administrative 0.503635282684637 Việt Nam FALSE
+u.n. vn Asia South-Eastern Asia FALSE 1 2021-02-03 81631376 node "U Na, Huyện MÆ°á»<9d>ng Tè, Tỉnh Lai Châu, Việt Nam" place hamlet 0.45 Việt Nam FALSE
+vale vn Asia South-Eastern Asia FALSE 1 2021-02-03 258322044 relation Việt Nam boundary administrative 0.751194527333514 Việt Nam FALSE
+myc ve Americas South America FALSE 1 2021-02-03 244232769 way "Aeropuerto Nacional Los Tacariguas, Carretera: Maracay - Valencia, Alezurca, Maracay, Parroquia Aguas Calientes, Municipio Diego Ibarra, Aragua, 2103, Venezuela" aeroway aerodrome 0.328369791841981 Venezuela FALSE
+simón bolívar university ve Americas South America FALSE 1 2021-02-03 125491265 way "Universidad Simón BolÃvar, Carretera: Hoyo de la Puerta - El Placer, Hoyo de La Puerta, Caracas, Parroquia Baruta, Municipio Baruta, Miranda, 1086, Venezuela" amenity university 0.201 Venezuela FALSE
+yanomami ve Americas South America FALSE 1 2021-02-03 256039598 way "Shabono Yanomami, Parroquia Alto Orinoco, Municipio Autònomo Alto Orinoco, Amazonas, Venezuela" place village 0.375 Venezuela FALSE
+food and agricultural organization uz Asia Central Asia FALSE 1 2021-02-03 51698085 node "ПродовольÑ<81>твеннаÑ<8f> и СельÑ<81>кохозÑ<8f>йÑ<81>твеннаÑ<8f> ОрганизациÑ<8f> ООÐ<9d> (ФÐ<90>О), 2, УниверÑ<81>итетÑ<81>каÑ<8f> улица, Yunusobod tumani, Salar, Qibray tumani, Toshkent Viloyati, 100140, OÊ»zbekiston" office government 0.001 OÊ»zbekiston FALSE
+food and agricultural organization of the united nations uz Asia Central Asia FALSE 1 2021-02-03 51698085 node "ПродовольÑ<81>твеннаÑ<8f> и СельÑ<81>кохозÑ<8f>йÑ<81>твеннаÑ<8f> ОрганизациÑ<8f> ООÐ<9d> (ФÐ<90>О), 2, УниверÑ<81>итетÑ<81>каÑ<8f> улица, Yunusobod tumani, Salar, Qibray tumani, Toshkent Viloyati, 100140, OÊ»zbekiston" office government 0.001 OÊ»zbekiston FALSE
+nuclear institute uz Asia Central Asia FALSE 1 2021-02-03 138409897 way "ИнÑ<81>титут Ñ<8f>дерной физики Ð<90>кадемии наук РеÑ<81>публики УзбекиÑ<81>тан, Xuroson ko'chasi, Mirzo Ulug‘bek tumani, Toshkent, Qibray tumani, Toshkent Viloyati, 100214, OÊ»zbekiston" office research 0.128160971568546 OÊ»zbekiston FALSE
+mpp uy Americas South America FALSE 1 2021-02-03 39550688 node "Movimiento de Participación Popular, 1368, Mercedes, Cordón, Montevideo, 11200, Uruguay" office political_party 0.280014158487789 Uruguay FALSE
+ocean doctor uy Americas South America FALSE 1 2021-02-03 146694002 way "Ocean Drive, Punta Del Este, Maldonado, 20100, Uruguay" landuse residential 0.3 Uruguay FALSE
+pti uy Americas South America FALSE 1 2021-02-03 166146214 way "Parque Tecnológico Industrial del Cerro, Tres Ombúes, Montevideo, Uruguay" landuse industrial 0.2 Uruguay FALSE
+'america first us Americas Northern America FALSE 1 2021-02-03 172127774 way "Bank of America Financial Center, 100, North Tryon Street, First Ward, 1st Ward, Charlotte, Mecklenburg County, North Carolina, 28202, United States" amenity bank 0.562086077089553 United States FALSE
+a123 systems us Americas Northern America FALSE 1 2021-02-03 149702337 way "A123 Systems, CBS Fox Drive, Livonia, Wayne County, Michigan, 48167-3958, United States" building yes 0.201 United States FALSE
+aaa us Americas Northern America FALSE 1 2021-02-03 159632298 way "AAA, 650, 2nd Street West, Sonoma, Sonoma County, California, 95476, United States" office insurance 0.5584454244094 United States FALSE
+abbott us Americas Northern America FALSE 1 2021-02-03 258779362 relation "Abbott, Hill County, Texas, 76621, United States" boundary administrative 0.53646269181841 United States FALSE
+abc news/ washington post us Americas Northern America FALSE 1 2021-02-03 169691814 way "Washington Boulevard, Newport News, Virginia, 23604, United States" highway secondary 0.3 United States FALSE
+abraxis us Americas Northern America FALSE 1 2021-02-03 205714967 way "Pharmacia & Pfizer & Abraxis, Carretera Militar, Florida Afuera, Barceloneta, Puerto Rico, 00617, United States" man_made works 0.101 United States FALSE
+academic board us Americas Northern America FALSE 1 2021-02-03 2617885 node "Middle School M256 Academic and Athletic Excellence, 154, West 93rd Street, Upper West Side, Manhattan Community Board 7, Manhattan, New York County, New York, 10025, United States" amenity school 0.201 United States FALSE
+academy of natural sciences us Americas Northern America FALSE 1 2021-02-03 171334462 way "Academy of Natural Sciences of Drexel University, 1900, Benjamin Franklin Parkway, Philadelphia, Philadelphia County, Pennsylvania, 19103, United States" tourism museum 0.786028263148971 United States FALSE
+acceleron us Americas Northern America FALSE 1 2021-02-03 169075485 way "24, Acceleron Pharma, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" landuse commercial 0.3 United States FALSE
+across mexico us Americas Northern America FALSE 1 2021-02-03 238602315 way "RMZ 1 Cut Across Road, San Juan County, New Mexico, United States" highway service 0.275 United States FALSE
+advanced bionics us Americas Northern America FALSE 1 2021-02-03 107738073 way "Advanced Bionics, Westinghouse Place, Santa Clarita, Los Angeles County, California, 91310, United States" building commercial 0.201 United States FALSE
+aerb us Americas Northern America FALSE 1 2021-02-03 259296849 relation "Nichols Arboretum, Ann Arbor, Washtenaw County, Michigan, United States" leisure park 0.316531580368862 United States FALSE
+aero-acoustic propulsion laboratory us Americas Northern America FALSE 1 2021-02-03 150820880 way "Aero-Acoustic Propulsion Laboratory, Road K, Brook Park, Cuyahoga County, Ohio, 44142, United States" building government 0.401 United States FALSE
+agency us Americas Northern America FALSE 1 2021-02-03 258146830 relation "Agency, Wapello County, Iowa, 52530, United States" boundary administrative 0.53283621062172 United States FALSE
+ai now institute us Americas Northern America FALSE 1 2021-02-03 73395982 node "AI Now Institute, West 12th Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10014, United States" office research 0.301 United States FALSE
+alaska department of natural resources us Americas Northern America FALSE 1 2021-02-03 29679173 node "Vitus Lake Cabin, Yakutat, Alaska, United States" tourism wilderness_hut 0.101 United States FALSE
+alaska fisheries science center us Americas Northern America FALSE 1 2021-02-03 300441187 way "University of Alaska Fairbanks School of Fisheries and Ocean Science, 17101, Point Lena Loop Road, NOAA Fisheries, Lena Beach, Juneau, Alaska, 99801, United States" building university 0.301 United States FALSE
+alexion pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 156694688 way "Alexion Pharmaceuticals, 100, South Frontage Road, Downtown, New Haven, New Haven County, Connecticut, 06519, United States" office company 0.201 United States FALSE
+allen brain institute us Americas Northern America FALSE 1 2021-02-03 176152346 way "Allen Institute for Brain Science, 615, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office research 0.301 United States FALSE
+alpert medical school us Americas Northern America FALSE 1 2021-02-03 259282365 relation "Warren Alpert Medical School, 222, Richmond Street, Jewelry District, Providence, Providence County, Rhode Island, 02903, United States" building office 0.301 United States FALSE
+alpha us Americas Northern America FALSE 1 2021-02-03 257837726 relation "Alpha, Warren County, New Jersey, United States" boundary administrative 0.458705675544455 United States FALSE
+alphastar us Americas Northern America FALSE 1 2021-02-03 64296768 node "AlphaStar, Pacific Coast Highway, Los Altos, Long Beach, Los Angeles County, California, 90804:90815, United States" office company 0.101 United States FALSE
+american academy of neurology us Americas Northern America FALSE 1 2021-02-03 127199908 way "American Academy of Neurology, Chicago Avenue South, Minneapolis, Hennepin County, Minnesota, 55415, United States" building yes 0.401 United States FALSE
+american association of science us Americas Northern America FALSE 1 2021-02-03 8123167 node "AAAS / Science, 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" tourism attraction 0.201 United States FALSE
+american association of university women us Americas Northern America FALSE 1 2021-02-03 2978211 node "American Association of University Women, Connecticut Avenue Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States" building yes 0.501 United States FALSE
+american college of physicians us Americas Northern America FALSE 1 2021-02-03 2973429 node "American College of Physicians, 190, North Independence Mall West, Philadelphia, Philadelphia County, Pennsylvania, 19106, United States" amenity doctors 0.401 United States FALSE
+american diabetes association us Americas Northern America FALSE 1 2021-02-03 3050591 node "American Diabetes Association Building, Penn Center Boulevard, Penn Center East, Oak Hill, Wilkins Township, Allegheny County, Pennsylvania, 15145, United States" building yes 0.301 United States FALSE
+american institute of physics in college park us Americas Northern America FALSE 1 2021-02-03 210348591 way "American Institute of Physics, 500, Sunnyside Boulevard, Oyster Bay, Nassau County, New York, 11797, United States" building university 0.501 United States FALSE
+american meteorological society us Americas Northern America FALSE 1 2021-02-03 80718663 node "American Meteorological Society, 45, Beacon Street, Downtown Crossing, Beacon Hill, Boston, Suffolk County, Massachusetts, 02108, United States" office association 0.301 United States FALSE
+american southwest us Americas Northern America FALSE 1 2021-02-03 131418716 way "American, Bounce, Midland, Midland County, Texas, United States" highway service 0.175 United States FALSE
+american superconductor us Americas Northern America FALSE 1 2021-02-03 140147943 way "American Superconductor, 64, Jackson Road, Devens, Harvard, Worcester County, Massachusetts, 01434, United States" building industrial 0.201 United States FALSE
+american university washington college of law us Americas Northern America FALSE 1 2021-02-03 106829662 way "American University- Washington College of Law, Tenley Circle Northwest, Tenleytown, American University Park, Washington, District of Columbia, 20016-2137, United States" amenity university 0.601 United States FALSE
+amgen of thousand oaks us Americas Northern America FALSE 1 2021-02-03 178550546 way "Amgen, Thousand Oaks, Ventura County, California, United States" landuse industrial 0.5 United States FALSE
+ancestry.com us Americas Northern America FALSE 1 2021-02-03 183450633 way "Ancestry.com, Carterville Trail, Riverbottoms, Provo, Utah County, Utah, 84604, United States" building commercial 0.201 United States FALSE
+ann & robert h. lurie children's hospital of chicago us Americas Northern America FALSE 1 2021-02-03 102467870 way "Ann & Robert H. Lurie Children's Hospital, 225, East Chicago Avenue, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States" amenity hospital 1.04352463088163 United States FALSE
+another house us Americas Northern America FALSE 1 2021-02-03 42793507 node "Another, 9500, Gilman Drive, University Center, San Diego, San Diego County, California, 92092, United States" tourism artwork 0.101 United States FALSE
+antarctic marine geology research facility us Americas Northern America FALSE 1 2021-02-03 145738961 way "Antarctic Marine Geology Research Facility, Academic Way, Tallahassee, Leon County, Florida, 32306, United States" building university 0.501 United States FALSE
+apache point observatory us Americas Northern America FALSE 1 2021-02-03 100736830 way "Apache Point Observatory, Otero County, New Mexico, United States" landuse observatory 0.777953726983006 United States FALSE
+applied physics laboratory us Americas Northern America FALSE 1 2021-02-03 258543667 relation "Henderson Hall, 1013, Northeast Lincoln Way, University District, Seattle, King County, Washington, 98105-6286, United States" building yes 0.001 United States FALSE
+arch street us Americas Northern America FALSE 1 2021-02-03 87129318 way "Arch Street, Northwest Triangle, York, York County, Pennsylvania, 17403, United States" highway tertiary 0.3 United States FALSE
+archbold biological station us Americas Northern America FALSE 1 2021-02-03 259248207 relation "Archbold Biological Station, Highlands County, Florida, United States" boundary protected_area 0.425 United States FALSE
+arf us Americas Northern America FALSE 1 2021-02-03 246438766 way "ARF, Marian View Drive, Idyllwild, Riverside County, California, 92549, United States" amenity animal_shelter 0.101 United States FALSE
+argonne us Americas Northern America FALSE 1 2021-02-03 396960 node "Argonne, Town of Argonne, Forest County, Wisconsin, 54511, United States" place village 0.356321943137092 United States FALSE
+armstrong us Americas Northern America FALSE 1 2021-02-03 258347195 relation "Armstrong County, Texas, 79019, United States" boundary administrative 0.653833128209837 United States FALSE
+asia society us Americas Northern America FALSE 1 2021-02-03 156760684 way "Asia Society, Park Avenue, Carnegie Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10021, United States" tourism museum 0.600038865094841 United States FALSE
+astronomical observatory us Americas Northern America FALSE 1 2021-02-03 88928538 way "Astronomical Observatory, Caddo Parish, Louisiana, United States" highway residential 0.3 United States FALSE
+astronomical observatory of milan us Americas Northern America FALSE 1 2021-02-03 41593478 node "Astronomical Observatory, Cats Path, Academic Core, University of Kentucky, Lexington, Fayette County, Kentucky, 40506, United States" man_made tower 0.301 United States FALSE
+at&t us Americas Northern America FALSE 1 2021-02-03 146631567 way "AT&T, 1302, North Tustin Street, Orange, Orange County, California, 92867, United States" shop mobile_phone 0.780778860724176 United States FALSE
+audubon alaska us Americas Northern America FALSE 1 2021-02-03 86079238 way "Audubon Drive, Anchorage, Alaska, 99516, United States" highway residential 0.3 United States FALSE
+aurora flight sciences us Americas Northern America FALSE 1 2021-02-03 109389915 way "Orbital Sciences Corporation Launch Systems Group L-1011 Flight Operations, 17143, Avtel Street, Mojave, Kern County, California, 93501, United States" building yes 0.201 United States FALSE
+awm us Americas Northern America FALSE 1 2021-02-03 3175077 node "West Memphis Municipal Airport, South College Boulevard, West Memphis, Crittenden County, Arkansas, 72301, United States" aeroway aerodrome 0.233228686818865 United States FALSE
+axial us Americas Northern America FALSE 1 2021-02-03 378998 node "Axial, Moffat County, Colorado, United States" place hamlet 0.35 United States FALSE
+b612 foundation of mill valley us Americas Northern America FALSE 1 2021-02-03 80081794 node "B612 Foundation, 20, Sunnyside Avenue, Mill Valley, Marin County, California, 94941, United States" office foundation 0.401 United States FALSE
+babcock us Americas Northern America FALSE 1 2021-02-03 257473949 way "Babcock, Miller County, Georgia, United States" boundary administrative 0.45 United States FALSE
+balearics us Americas Northern America FALSE 1 2021-02-03 168510467 way "Balearics Drive, Saint Augustine Shores, St. Augustine Shores, St. Johns County, Florida, 32086, United States" highway residential 0.2 United States FALSE
+ball aerospace us Americas Northern America FALSE 1 2021-02-03 249881855 way "Ball Aerospace, 48th Street, Boulder, Boulder County, Colorado, 80303-1229, United States" office company 0.201 United States FALSE
+bantam us Americas Northern America FALSE 1 2021-02-03 259427115 relation "Bantam, Litchfield, Litchfield County, Connecticut, United States" boundary administrative 0.413940046679794 United States FALSE
+barnard college us Americas Northern America FALSE 1 2021-02-03 100812162 way "Barnard College, Reunion Plaza, Morningside Heights, Manhattan Community Board 9, Manhattan, New York County, New York, United States" amenity university 0.708762447831959 United States FALSE
+baruch college us Americas Northern America FALSE 1 2021-02-03 105392869 way "Baruch College, Kelly Drive, Suffolk County, New York, 11794, United States" building dormitory 0.201 United States FALSE
+bassett medical center us Americas Northern America FALSE 1 2021-02-03 209192057 way "Bassett Medical Center, 1, Atwell Road, Cooperstown, Town of Otsego, Otsego County, New York, 13326, United States" amenity hospital 0.507534521399027 United States FALSE
+battelle memorial institute us Americas Northern America FALSE 1 2021-02-03 194506873 way "Battelle Memorial Institute, 505, King Avenue, University District District 4, Columbus, Franklin, Ohio, 43201, United States" building office 0.66833684603196 United States FALSE
+baystate medical center us Americas Northern America FALSE 1 2021-02-03 198191111 way "Baystate Medical Center, 759, Chestnut Street, North End, Springfield, Hampden County, Massachusetts, 01199, United States" amenity hospital 0.528876356713622 United States FALSE
+beagle us Americas Northern America FALSE 1 2021-02-03 377197 node "Beagle, Miami County, Kansas, United States" place hamlet 0.35 United States FALSE
+beaumont health us Americas Northern America FALSE 1 2021-02-03 240362052 way "Beaumont Health, 26901, Beaumont Boulevard, Southfield, Oakland County, Michigan, 48033, United States" building commercial 0.201 United States FALSE
+bellatrix us Americas Northern America FALSE 1 2021-02-03 213865135 way "Bellatrix, Altair, Orange County Great Park, Irvine, Orange County, California, 92619, United States" highway residential 0.2 United States FALSE
+belle ii us Americas Northern America FALSE 1 2021-02-03 294506250 way "2, Belle, San Juan County, Washington, 98279, United States" place house 0.101 United States FALSE
+berkeley center us Americas Northern America FALSE 1 2021-02-03 118620616 way "Berkeley Center, 3000, North Lemon Street, Downtown Fullerton, Fullerton, Orange County, California, 92832, United States" building yes 0.201 United States FALSE
+berkley us Americas Northern America FALSE 1 2021-02-03 257341204 relation "Berkley, Boone County, Iowa, United States" boundary administrative 0.532062340731545 United States FALSE
+bidmc us Americas Northern America FALSE 1 2021-02-03 39717217 node "Blue Bikes - BIDMC - Brookline at Burlington St, Burlington Avenue, Audubon Square, Boston, Suffolk County, Massachusetts, 02215, United States" amenity bicycle_rental 0.101 United States FALSE
+big bear solar observatory us Americas Northern America FALSE 1 2021-02-03 124213771 way "Big Bear Solar Observatory, San Bernardino County, California, United States" landuse observatory 0.678015094618814 United States FALSE
+bigelow aerospace us Americas Northern America FALSE 1 2021-02-03 161499859 way "Bigelow Aerospace, LLC, 1899, West Brooks Avenue, North Las Vegas, Clark County, Nevada, 89032, United States" man_made works 0.60124284206117 United States FALSE
+bigelow aerospace of las vegas us Americas Northern America FALSE 1 2021-02-03 161499859 way "Bigelow Aerospace, LLC, 1899, West Brooks Avenue, North Las Vegas, Clark County, Nevada, 89032, United States" man_made works 0.80124284206117 United States FALSE
+biocurious us Americas Northern America FALSE 1 2021-02-03 20734454 node "BioCurious, Stewart Drive, Sunnyvale, Santa Clara County, California, 94088-3453, United States" leisure hackerspace 0.167710111330712 United States FALSE
+biogen idec us Americas Northern America FALSE 1 2021-02-03 249632722 way "Biogen Idec, 115, Broadway, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" building commercial 0.201 United States FALSE
+biohub us Americas Northern America FALSE 1 2021-02-03 297451046 relation "BioHub Boston, Waltham, Middlesex County, Massachusetts, United States" landuse commercial 0.3 United States FALSE
+black hills institute of geological research us Americas Northern America FALSE 1 2021-02-03 189013937 way "Black Hills Museum of Natural History, Main Street, Hill City, Pennington County, South Dakota, 57745, United States" tourism museum 0.490508362962683 United States FALSE
+bloom us Americas Northern America FALSE 1 2021-02-03 366194 node "Bloom, Ford County, Kansas, United States" place village 0.41356076917903 United States FALSE
+bloom energy us Americas Northern America FALSE 1 2021-02-03 301192108 node "Bloom Energy, 4353, North 1st Street, Alviso, San Jose, Santa Clara County, California, 95134, United States" office company 0.201 United States FALSE
+blue origin us Americas Northern America FALSE 1 2021-02-03 224462797 way "Blue Origin, Kent, King County, Washington, United States" landuse industrial 0.4 United States FALSE
+board us Americas Northern America FALSE 1 2021-02-03 435229 node "Board, Mason County, West Virginia, United States" place hamlet 0.35 United States FALSE
+board of regents us Americas Northern America FALSE 1 2021-02-03 213673109 way "Georgia Museum of Art, 90, Carlton Street, Athens-Clarke County Unified Government, Athens-Clarke County, Georgia, 30602, United States" tourism museum 0.380014158487789 United States FALSE
+boise state university us Americas Northern America FALSE 1 2021-02-03 187946735 way "Boise State University, South Broadway Avenue, Boise, Ada County, Idaho, 83735, United States" amenity university 0.744647217327514 United States FALSE
+border protection us Americas Northern America FALSE 1 2021-02-03 148436560 way "U.S. Customs and Border Protection, Ogdensburg, Saint Lawrence County, New York, United States" landuse commercial 0.4 United States FALSE
+boston common us Americas Northern America FALSE 1 2021-02-03 94132085 way "Boston Common, Beacon Hill, Boston, Suffolk County, Massachusetts, United States" leisure park 0.618142367209955 United States FALSE
+boston dynamics us Americas Northern America FALSE 1 2021-02-03 161862452 way "Boston Dynamics, 78, Fourth Avenue, Waltham, Middlesex County, Massachusetts, 02451, United States" office company 0.590005927058632 United States FALSE
+boston marathon us Americas Northern America FALSE 1 2021-02-03 80407008 node "Boston Marathon Memorial, Boylston Street, Newbury Street, Back Bay, Boston, Suffolk County, Massachusetts, 02116, United States" historic memorial 0.656343487668219 United States FALSE
+boston university school of law us Americas Northern America FALSE 1 2021-02-03 2695220 node "Boston University School of Law, Bay State Road, Audubon Square, Boston, Suffolk County, Massachusetts, 02215, United States" amenity school 0.501 United States FALSE
+bowling green state university us Americas Northern America FALSE 1 2021-02-03 258878654 relation "Bowling Green State University, 1001, East Wooster Street, Bentwood Estates, Bowling Green, Wood County, Ohio, 43403-0001, United States" amenity university 0.882362468990463 United States FALSE
+bradley university us Americas Northern America FALSE 1 2021-02-03 113901474 way "Bradley University, 1501, West Bradley Avenue, St. James Apartments, Peoria, Peoria County, Illinois, 61625, United States" amenity university 0.641769278273552 United States FALSE
+brain research institute us Americas Northern America FALSE 1 2021-02-03 133163876 way "Brain Research Institute, 670, Charles E Young Drive South, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity research_institute 0.301 United States FALSE
+brain science institute us Americas Northern America FALSE 1 2021-02-03 176152346 way "Allen Institute for Brain Science, 615, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office research 0.301 United States FALSE
+brenco us Americas Northern America FALSE 1 2021-02-03 82037986 node "Brenco, Walton Street, Pine Gardens, Petersburg, Virginia, 23805, United States" railway crossover 0.101 United States FALSE
+brent central us Americas Northern America FALSE 1 2021-02-03 259444301 relation "Brent, Bibb County, Alabama, 35034, United States" boundary administrative 0.522385266730329 United States FALSE
+brigham & women's hospital us Americas Northern America FALSE 1 2021-02-03 258770706 relation "Brigham and Women's Hospital, 75, Francis Street, Roxbury, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.77720861480317 United States FALSE
+broad and berkeley us Americas Northern America FALSE 1 2021-02-03 100963106 way "Broad Ax Branch, Berkeley County, South Carolina, United States" waterway stream 0.4 United States FALSE
+broad institute of m.i.t. us Americas Northern America FALSE 1 2021-02-03 97512477 way "Broad Institute, Charles Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02141, United States" building university 0.893012981942171 United States FALSE
+bronx zoo us Americas Northern America FALSE 1 2021-02-03 101896162 way "Bronx Zoo, Bronx River Parkway, The Bronx, Bronx County, New York, 10460, United States" tourism zoo 0.641531223132584 United States FALSE
+brookings us Americas Northern America FALSE 1 2021-02-03 258255410 relation "Brookings County, South Dakota, United States" boundary administrative 0.575721107070673 United States FALSE
+broomfield us Americas Northern America FALSE 1 2021-02-03 354302 node "Broomfield, City and County of Broomfield, Colorado, 80020, United States" place town 0.609273128324911 United States FALSE
+brothers us Americas Northern America FALSE 1 2021-02-03 2865253 node "The Brothers, Humboldt County, California, United States" place island 0.425 United States FALSE
+bryan cave us Americas Northern America FALSE 1 2021-02-03 54504450 node "Bryan Cave, 211 #3600, North Broadway, Downtown, City of Saint Louis, Missouri, 63102, United States" office lawyer 0.201 United States FALSE
+bryn mawr college us Americas Northern America FALSE 1 2021-02-03 116358987 way "Bryn Mawr College, Old Gulph Road, Lower Merion Township, Montgomery County, Pennsylvania, 19085, United States" amenity college 0.78287678963334 United States FALSE
+bti us Americas Northern America FALSE 1 2021-02-03 153377685 way "Barter Island Long Range Radar Site Airport, Pipsuk Avenue, Kaktovik, North Slope, Alaska, United States" aeroway aerodrome 0.242327847659036 United States FALSE
+bu us Americas Northern America FALSE 1 2021-02-03 258894158 relation "Boston University, Brighton Avenue, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134, United States" amenity university 0.582119069629869 United States FALSE
+bucknell university us Americas Northern America FALSE 1 2021-02-03 259556528 relation "Bucknell University, South 5th Street, Lewisburg, Union County, Pennsylvania, 17837, United States" amenity university 0.201 United States FALSE
+building opportunities for self-sufficiency us Americas Northern America FALSE 1 2021-02-03 68032222 node "BOSS, 1916;1918, University Avenue, Downtown Berkeley, Berkeley, Alameda County, California, 94704, United States" office ngo 0.101 United States FALSE
+butler hospital us Americas Northern America FALSE 1 2021-02-03 185761944 way "Butler Hospital, 345, Blackstone Boulevard, Blackstone, Providence, Providence County, Rhode Island, 02906-4800, United States" amenity hospital 0.453363019766637 United States FALSE
+calico us Americas Northern America FALSE 1 2021-02-03 330304 node "Calico, Kern County, California, 93250, United States" place locality 0.507681409931154 United States FALSE
+calif us Americas Northern America FALSE 1 2021-02-03 258350986 relation "California, United States" boundary administrative 0.912136384157707 United States FALSE
+california academy of science us Americas Northern America FALSE 1 2021-02-03 196077698 way "California Academy of Mathematics and Science, 1000, East Victoria Street, Carson, Los Angeles County, California, 90747, United States" amenity school 0.401 United States FALSE
+california department of forestry and fire protection us Americas Northern America FALSE 1 2021-02-03 102294799 way "Cal Fire (California Department of Forestry and Fire Protection) CZU Felton Headquarters, CA 9, Felton, Santa Cruz County, California, 95018-9704, United States" amenity fire_station 0.701 United States FALSE
+california department of public health us Americas Northern America FALSE 1 2021-02-03 178363904 way "California Department of Public Health, Capitol Avenue, Sacramento, Sacramento County, California, 95811, United States" building commercial 0.501 United States FALSE
+california medical facility us Americas Northern America FALSE 1 2021-02-03 213015691 way "California Medical Facility, 1600, California Drive, Vacaville, Solano County, California, 95696, United States" amenity prison 0.574532111506442 United States FALSE
+california polytechnic state university us Americas Northern America FALSE 1 2021-02-03 160705772 way "California Polytechnic State University, North Santa Rosa Street, San Luis Obispo, San Luis Obispo County, California, 93407-0283, United States" amenity university 0.877289721429052 United States FALSE
+california state university in chico us Americas Northern America FALSE 1 2021-02-03 96242249 way "California State University, Chico, 400, West 1st Street, Chico, Butte County, California, 95929, United States" amenity university 0.842852642190115 United States FALSE
+calvin college us Americas Northern America FALSE 1 2021-02-03 258188696 relation "Calvin, Cavalier County, North Dakota, United States" boundary administrative 0.48265030002841 United States FALSE
+canada-france-hawaii telescope us Americas Northern America FALSE 1 2021-02-03 102686691 way "Canada-France-Hawaii Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.773004776697036 United States FALSE
+canadian forest service us Americas Northern America FALSE 1 2021-02-03 259077830 relation "Canadian, Hemphill County, Texas, United States" boundary administrative 0.575446574770995 United States FALSE
+carnegie us Americas Northern America FALSE 1 2021-02-03 258387827 relation "Carnegie, Allegheny County, Pennsylvania, 15106, United States" boundary administrative 0.459613385609502 United States FALSE
+carnegie endowment for international peace us Americas Northern America FALSE 1 2021-02-03 2981835 node "The Carnegie Endowment for International Peace, Massachusetts Avenue Northwest, Dupont Circle and surrunding block, Dupont Circle, Washington, District of Columbia, 20036, United States" building yes 0.501 United States FALSE
+carnegie institution of washington dc us Americas Northern America FALSE 1 2021-02-03 106777669 way "Carnegie Institution Building, 1530, P Street Northwest, Logan Circle/Shaw, Dupont Circle, Washington, District of Columbia, 2005, United States" building yes 0.574617736328324 United States FALSE
+carnegie museum of natural history us Americas Northern America FALSE 1 2021-02-03 126423240 way "Carnegie Museum of Natural History, 4400, Forbes Avenue, North Oakland, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States" tourism museum 0.903846782985069 United States FALSE
+carnegies us Americas Northern America FALSE 1 2021-02-03 27489275 node "Carnegie's, 1600, Oregon Street, Redding, Shasta County, California, 96001, United States" amenity restaurant 0.001 United States FALSE
+carter center us Americas Northern America FALSE 1 2021-02-03 3094933 node "Carter Presidential Center, John Lewis Freedom Parkway Northeast, Linwood, Atlanta, Fulton County, Georgia, 30306 DASH4279, United States" tourism museum 0.201 United States FALSE
+carthage college us Americas Northern America FALSE 1 2021-02-03 181816840 way "Carthage College, 2001, Alford Park Drive, Kenosha, Kenosha County, Wisconsin, 53140, United States" amenity college 0.59394918828843 United States FALSE
+case western university us Americas Northern America FALSE 1 2021-02-03 115838150 way "Computing, Arts, Sciences and Education, University Drive, Miami-Dade County, Florida, 33199, United States" building university 0.101 United States FALSE
+cato institute us Americas Northern America FALSE 1 2021-02-03 159055081 way "Cato Center & Halsey Institute of Contemporary Art, Saint Phillip Street, Charleston, Charleston County, South Carolina, 29401, United States" building college 0.201 United States FALSE
+cca us Americas Northern America FALSE 1 2021-02-03 133975195 way "California College of the Arts, 8th Street, San Francisco, San Francisco City and County, California, 90103, United States" amenity university 0.417511672002615 United States FALSE
+ccdc us Americas Northern America FALSE 1 2021-02-03 103502726 way "Child Care Development Center, West Van Week Street, Edinburg, Hidalgo County, Texas, 78539, United States" building yes 0.001 United States FALSE
+ccri us Americas Northern America FALSE 1 2021-02-03 190410505 way "Community College of Rhode Island Liston Campus, 1, Hilton Street, Providence, Providence County, Rhode Island, 02905, United States" amenity college 0.001 United States FALSE
+cdb us Americas Northern America FALSE 1 2021-02-03 899163 node "Cold Bay Airport, North to South Apron Service Road, Cold Bay, Aleutians East, Alaska, 99571, United States" aeroway aerodrome 0.281311730611622 United States FALSE
+cdcr us Americas Northern America FALSE 1 2021-02-03 100211824 way "Prado Conservation Camp, 14467, Central Avenue, Chino, San Bernardino County, California, 91710, United States" amenity fire_station 0.001 United States FALSE
+cdw us Americas Northern America FALSE 1 2021-02-03 166168670 way "CDW, 200, North Milwaukee Avenue, Mellody Farm, Vernon Hills, Lake County, Illinois, 60061, United States" building commercial 0.430139264553753 United States FALSE
+center for astrophysics us Americas Northern America FALSE 1 2021-02-03 257732815 relation "Center for Astrophysics, 60, Observatory Access Road, Old Cambridge, Cambridge, Middlesex County, Massachusetts, 02138-2706, United States" building university 0.301 United States FALSE
+center for ethics us Americas Northern America FALSE 1 2021-02-03 78586365 node "Center for Applied Ethics, 221, 10th Avenue East, Menomonie, Dunn County, Wisconsin, 54751, United States" office research 0.301 United States FALSE
+center for genomics us Americas Northern America FALSE 1 2021-02-03 151793647 way "Center for Genomics and Systems Biology, 16, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States" building university 0.301 United States FALSE
+center for genomics and systems biology us Americas Northern America FALSE 1 2021-02-03 151793647 way "Center for Genomics and Systems Biology, 16, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States" building university 0.601 United States FALSE
+central laser facility us Americas Northern America FALSE 1 2021-02-03 228612591 way "Central Laser Facility, West 2500 South, Millard County, Utah, United States" man_made observatory 0.301 United States FALSE
+central washington university us Americas Northern America FALSE 1 2021-02-03 206740946 way "Central Washington University, East Vantage Highway, Ellensburg, Kittitas County, Washington, 98926, United States" amenity university 0.69394918828843 United States FALSE
+centre for northern studies us Americas Northern America FALSE 1 2021-02-03 2328806 node "Center for Northern Studies, Cross Road, Lamoille County, Vermont, United States" amenity school 0.301 United States FALSE
+cgs us Americas Northern America FALSE 1 2021-02-03 258450803 relation "College Park Airport, 1909, Corporal Frank Scott Drive, University of Maryland Research Park, Old Town, College Park, Prince George's County, Maryland, 20740, United States" aeroway aerodrome 0.290812406874276 United States FALSE
+chaco canyon us Americas Northern America FALSE 1 2021-02-03 90959436 way "Chaco Canyon, Cedar Park, Williamson County, Texas, 78613, United States" highway residential 0.3 United States FALSE
+chaffey college us Americas Northern America FALSE 1 2021-02-03 99601399 way "Chaffey College, Banyan Street, Rancho Cucamonga, San Bernardino County, California, 91737, United States" amenity college 0.549235472656649 United States FALSE
+channel islands us Americas Northern America FALSE 1 2021-02-03 259434584 relation "Channel Islands, Ventura County, California, 90704, United States" place archipelago 0.711550869264683 United States FALSE
+chapman university in orange us Americas Northern America FALSE 1 2021-02-03 258413846 relation "Chapman University, 1, University Drive, Orange, Orange County, California, 92866, United States" amenity university 0.732173490264596 United States FALSE
+charles stark draper laboratory us Americas Northern America FALSE 1 2021-02-03 98075251 way "The Charles Stark Draper Laboratory, Inc, 555, Technology Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" office research 0.401 United States FALSE
+chemosphere us Americas Northern America FALSE 1 2021-02-03 187794541 way "Chemosphere, 7776, Torreyson Drive, Hollywood Hills West, Los Angeles, Los Angeles County, California, 90046, United States" building house 0.354365194683011 United States FALSE
+chicago zoological society us Americas Northern America FALSE 1 2021-02-03 132582604 way "Brookfield Zoo, 8400, 31st Street, Brookfield, Proviso Township, Cook County, Illinois, 60513, United States" tourism zoo 0.319018527529768 United States FALSE
+children's cancer research institute us Americas Northern America FALSE 1 2021-02-03 157002637 way "Children's Cancer Research Institute, 8403, Floyd Curl Drive, South Texas Medical Center, San Antonio, Bexar County, Texas, 78229, United States" building yes 0.501 United States FALSE
+children's medical center us Americas Northern America FALSE 1 2021-02-03 96926132 way "Children's Medical Center of Dallas, 1935, Medical District Drive, Dallas, TX, Dallas, Dallas County, Texas, 75235, United States" amenity hospital 0.581472839091896 United States FALSE
+children's national medical center us Americas Northern America FALSE 1 2021-02-03 156002689 way "Children's National Medical Center, 111, Michigan Avenue Northwest, McMillan Filter Plant & Reservoir, Washington, District of Columbia, 20010, United States" amenity hospital 0.501 United States FALSE
+children's research institute us Americas Northern America FALSE 1 2021-02-03 134977531 way "Children's Research Institute (CRI), Mound Park Avenue South, Roser Park, St. Petersburg, Pinellas County, Florida, 33701, United States" building university 0.401 United States FALSE
+chrysler us Americas Northern America FALSE 1 2021-02-03 412742 node "Chrysler, Monroe County, Alabama, United States" place hamlet 0.35 United States FALSE
+cir us Americas Northern America FALSE 1 2021-02-03 99147609 way "Circle, Unorganized Borough, Alaska, United States" boundary administrative 0.472859588409935 United States FALSE
+circuit court us Americas Northern America FALSE 1 2021-02-03 20736035 node "Circuit Court, Maryland Avenue, Croydon Park, Rockville, Montgomery County, Maryland, 20850, United States" amenity courthouse 0.403130333992136 United States FALSE
+citadel us Americas Northern America FALSE 1 2021-02-03 195543970 way "The Citadel, 171, Moultrie Street, Charleston, Charleston County, South Carolina, 29409, United States" amenity university 0.531222267761364 United States FALSE
+clark university us Americas Northern America FALSE 1 2021-02-03 259488327 relation "Clark University, Rosslare Drive, Botany Bay, Columbus Park, Worcester, Worcester County, Massachusetts, 01602, United States" amenity university 0.660196767278603 United States FALSE
+cleveland biolabs us Americas Northern America FALSE 1 2021-02-03 192431632 way "Cleveland BioLabs, North Oak Street, Buffalo Niagara Medical Campus, Buffalo, Erie County, New York, 14209, United States" building yes 0.201 United States FALSE
+climate central us Americas Northern America FALSE 1 2021-02-03 78587650 node "Climate, 5282, Monahans Avenue, The Shops at Clearfork, Fort Worth, Tarrant County, Texas, 76109, United States" shop sports 0.101 United States FALSE
+climate home us Americas Northern America FALSE 1 2021-02-03 78587650 node "Climate, 5282, Monahans Avenue, The Shops at Clearfork, Fort Worth, Tarrant County, Texas, 76109, United States" shop sports 0.101 United States FALSE
+climate research us Americas Northern America FALSE 1 2021-02-03 137741682 way "NOAA Center for Weather and Climate Prediction, 5830, University Research Court, University of Maryland Research Park, College Park, Prince George's County, Maryland, 20740, United States" building office 0.201 United States FALSE
+clinical services us Americas Northern America FALSE 1 2021-02-03 258895288 relation "Clinical Services, East 18th Avenue, Eugene, Lane County, Oregon, 907403, United States" building university 0.201 United States FALSE
+clio us Americas Northern America FALSE 1 2021-02-03 257120514 relation "Clio, Wayne County, Iowa, 50052, United States" boundary administrative 0.531727684347105 United States FALSE
+clothing distribution center us Americas Northern America FALSE 1 2021-02-03 14884299 node "Beehive Clothing Distribution Center, Charmant Drive, La Jolla Colony, University City, San Diego, San Diego County, California, 92161, United States" shop clothes 0.301 United States FALSE
+cloud health us Americas Northern America FALSE 1 2021-02-03 192444442 way "Cloud County Health Center, 1100, Highland Drive, Concordia, Cloud County, Kansas, 66956, United States" amenity hospital 0.347788039106501 United States FALSE
+cmu us Americas Northern America FALSE 1 2021-02-03 258357673 relation "Carnegie Mellon University, Warwick Terrace, Squirrel Hill North, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States" amenity university 0.561734322664205 United States FALSE
+cobb institute us Americas Northern America FALSE 1 2021-02-03 153585197 way "Georgia Tech Research Institute Cobb County Research Facility South, 1941, Dixie Avenue Southeast, Smyrna, Cobb County, Georgia, 30080, United States" building yes 0.201 United States FALSE
+cohen commission us Americas Northern America FALSE 1 2021-02-03 103899851 way "Buffalo Building, 300; 302; 304; 306; 308; 310; 312, East Buffalo Street, Commission Row, Milwaukee, Milwaukee County, Wisconsin, 53202, United States" historic building 0.210430435186894 United States FALSE
+colgate university in hamilton us Americas Northern America FALSE 1 2021-02-03 172145457 way "Colgate University, Campus Footpaths, Hamilton, Town of Hamilton, Madison County, New York, 13346, United States" amenity university 0.777980138982284 United States FALSE
+collaborative research centre us Americas Northern America FALSE 1 2021-02-03 234889363 way "Biosciences Collaborative Laboratory, de France Avenue, Ames Research Center, Mountain View, Santa Clara County, California, 94035-0016, United States" building yes 0.201 United States FALSE
+college board us Americas Northern America FALSE 1 2021-02-03 184461788 way "College Board, Penn Street, Newtown Gate, Newtown Township, Bucks County, Pennsylvania, 189440, United States" building yes 0.201 United States FALSE
+college of american pathologists us Americas Northern America FALSE 1 2021-02-03 53752747 node "College Of American Pathologists, 325, Waukegan Road, Northfield, Northfield Township, Cook County, Illinois, 60093, United States" amenity college 0.401 United States FALSE
+college of public health us Americas Northern America FALSE 1 2021-02-03 102868021 way "College of Public Health, USF Banyan Circle, Tampa, Hillsborough County, Florida, 33612, United States" building yes 0.401 United States FALSE
+college of southern nevada us Americas Northern America FALSE 1 2021-02-03 112597747 way "College of Southern Nevada, Mosswood Drive, Henderson, Clark County, Nevada, 89015, United States" amenity college 0.401 United States FALSE
+college of william & mary us Americas Northern America FALSE 1 2021-02-03 259442397 relation "College of William and Mary, Compton Drive, Williamsburg, Williamsburg (city), Virginia, 23186, United States" amenity university 0.898687544181304 United States FALSE
+college of wooster us Americas Northern America FALSE 1 2021-02-03 162127042 way "College of Wooster, 1189, Beall Avenue, Wooster Public Square Historic District, Wooster, Wayne County, Ohio, 44691, United States" amenity college 0.72322557465216 United States FALSE
+colorado college us Americas Northern America FALSE 1 2021-02-03 258559117 relation "Colorado College, 14, East Cache la Poudre Street, Colorado Springs, El Paso County, Colorado, 80903, United States" amenity university 0.652672658024048 United States FALSE
+columbia hills us Americas Northern America FALSE 1 2021-02-03 246982992 way "Columbia Hills, Klickitat County, Washington, 98673, United States" natural mountain_range 0.5 United States FALSE
+columbia sportswear us Americas Northern America FALSE 1 2021-02-03 160437176 way "Columbia, 3, Monroe Parkway, Mountain Park, Lake Oswego, Metro, Oregon, 97035, United States" shop clothes 0.101 United States FALSE
+columbia university irving medical center us Americas Northern America FALSE 1 2021-02-03 121491710 way "Columbia University Irving Medical Center, 630, West 168th Street, Washington Heights, Manhattan Community Board 12, Manhattan, New York County, New York, 10031, United States" amenity hospital 0.855322560505529 United States FALSE
+columbia water center us Americas Northern America FALSE 1 2021-02-03 89099032 way "Columbia Rd 44, Tide Water, Columbia County, Arkansas, 71753, United States" highway residential 0.3 United States FALSE
+columbus us Americas Northern America FALSE 1 2021-02-03 258190114 relation "Columbus, Franklin, Ohio, United States" boundary administrative 0.729439910682055 United States FALSE
+colville us Americas Northern America FALSE 1 2021-02-03 257341974 relation "Colville, Stevens County, Washington, United States" boundary administrative 0.47774807032046 United States FALSE
+commercial spaceflight federation us Americas Northern America FALSE 1 2021-02-03 80658144 node "Commercial Spaceflight Federation, 1444, I Street Northwest, Downtown, Washington, District of Columbia, 20006, United States" office ngo 0.301 United States FALSE
+common fund us Americas Northern America FALSE 1 2021-02-03 56944182 node "Staunton Creative Community Fund, 10, Byers Street, Dogwood Hill, Staunton, Virginia, 24401, United States" office nonprofit 0.101 United States FALSE
+community and public sector union us Americas Northern America FALSE 1 2021-02-03 172957567 way "The Center for Community and Public Safety, University Drive, North Union Township, Fayette County, Pennsylvania, 15465, United States" building university 0.401 United States FALSE
+concordia university us Americas Northern America FALSE 1 2021-02-03 124004751 way "Concordia University, 2811, Northeast Holman Street, Concordia, Portland, Metro, Oregon, 97211, United States" amenity university 0.525928585624107 United States FALSE
+confederated tribes of the colville reservation us Americas Northern America FALSE 1 2021-02-03 38301258 node "Omak Lake Campground, North End Omak Lake Road, Okanogan County, Washington, United States" tourism camp_site 0.001 United States FALSE
+congress for the nih us Americas Northern America FALSE 1 2021-02-03 77612239 node "Betty McCollum for Congress, 661, Lasalle Street, St. Paul, Ramsey County, Minnesota, 55114, United States" office government 0.201 United States FALSE
+connecticut agricultural experiment station us Americas Northern America FALSE 1 2021-02-03 195858196 way "Connecticut Agricultural Experiment Station, 123, Prospect Hill Historic District, New Haven, New Haven County, Connecticut, 06504-1106, United States" landuse institutional 0.6 United States FALSE
+continental resources us Americas Northern America FALSE 1 2021-02-03 127263494 way "Continental Resources, 175, Ledge Street, Ward 4, Nashua, Hillsborough County, New Hampshire, 03060, United States" building yes 0.201 United States FALSE
+cooper's ferry us Americas Northern America FALSE 1 2021-02-03 299474742 way "Cooper's Ferry Park, Monticello, Lawrence County, Mississippi, United States" leisure park 0.45 United States FALSE
+cornell lab of ornithology us Americas Northern America FALSE 1 2021-02-03 544921 node "159, Cornell Laboratory of Ornithology, Lansing, Lansing Town, Tompkins County, New York, 14850, United States" place locality 0.525 United States FALSE
+corte madera us Americas Northern America FALSE 1 2021-02-03 258504269 relation "Corte Madera, Marin County, California, 94925, United States" boundary administrative 0.633600484003591 United States FALSE
+coskata us Americas Northern America FALSE 1 2021-02-03 496405 node "Coskata, Nantucket County, Massachusetts, United States" place hamlet 0.270881295424728 United States FALSE
+council on foreign relations us Americas Northern America FALSE 1 2021-02-03 2638895 node "Council on Foreign Relations, 58, East 68th Street, Upper East Side, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" office association 0.401 United States FALSE
+courant institute us Americas Northern America FALSE 1 2021-02-03 55398385 node "Courant Institute of Mathematical Sciences, 251, Mercer Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States" amenity university 0.622385266730329 United States FALSE
+covanta us Americas Northern America FALSE 1 2021-02-03 108431439 way "Covanta, Hempstead, Nassau County, New York, United States" landuse industrial 0.3 United States FALSE
+cprs us Americas Northern America FALSE 1 2021-02-03 171962530 way "CPRS, Dairy Lane, Lancaster County, Pennsylvania, 17022, United States" leisure sports_centre 0.101 United States FALSE
+crh us Americas Northern America FALSE 1 2021-02-03 2951088 node "Choate Rosemary Hall, 333, Christian Street, Wallingford, Connecticut, New Haven County, Connecticut, 06492, United States" amenity school 0.381143934225165 United States FALSE
+cross us Americas Northern America FALSE 1 2021-02-03 258347599 relation "Cross County, Arkansas, United States" boundary administrative 0.598270979527558 United States FALSE
+csh vienna us Americas Northern America FALSE 1 2021-02-03 70048369 node "Vienna, Recreation Drive, Sunnyvale, Santa Clara County, California, 94089-2701, United States" railway station 0.383208261767925 United States FALSE
+cso us Americas Northern America FALSE 1 2021-02-03 5565914 node "Caltech Submillimeter Observatory, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.362945678183792 United States FALSE
+curie institute us Americas Northern America FALSE 1 2021-02-03 62876393 node "Marie Curie Institute of Engineering and Communication, Curie Lane, City of Amsterdam, Montgomery County, New York, United States" amenity school 0.201 United States FALSE
+cwru us Americas Northern America FALSE 1 2021-02-03 259081536 relation "Case Western Reserve University, 10900, Euclid Avenue, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States" amenity university 0.514467419199317 United States FALSE
+daiichi sankyo us Americas Northern America FALSE 1 2021-02-03 80948574 node "Daiichi Sankyo, Village Circle, Solana Plaza, Westlake, Tarrant County, Texas, 76092, United States" office yes 0.201 United States FALSE
+dallas cowboys us Americas Northern America FALSE 1 2021-02-03 102618220 way "AT&T Stadium, 900, East Randol Mill Road, Arlington, Tarrant County, Texas, 76011, United States" tourism attraction 0.484986544882205 United States FALSE
+dana farber cancer institute us Americas Northern America FALSE 1 2021-02-03 145616376 way "Dana-Farber Cancer Institute, 450, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States" amenity hospital 0.71689306175332 United States FALSE
+dca us Americas Northern America FALSE 1 2021-02-03 224465042 way "Disney California Adventure, 1620, South Disneyland Drive, Anaheim, Orange County, California, 92802, United States" tourism theme_park 0.462070869758741 United States FALSE
+decc us Americas Northern America FALSE 1 2021-02-03 129379664 way "Duluth Entertainment Convention Center, Railroad Street, Duluth, Saint Louis County, Minnesota, 55802, United States" building yes 0.317609725634953 United States FALSE
+defenders of wildlife us Americas Northern America FALSE 1 2021-02-03 57901658 node "Defenders of Wildlife, 1130, N Street Northwest, Dupont Circle, Washington, District of Columbia, 20037, United States" tourism information 0.301 United States FALSE
+denison us Americas Northern America FALSE 1 2021-02-03 257424444 relation "Denison, Grayson County, Texas, 75020, United States" boundary administrative 0.62462611732643 United States FALSE
+denver museum of nature & science us Americas Northern America FALSE 1 2021-02-03 99790553 way "Denver Museum of Nature and Science, 2001, Colorado Boulevard, Denver, Denver County, Colorado, 80205, United States" tourism museum 0.833256970094253 United States FALSE
+denver museum of nature and science us Americas Northern America FALSE 1 2021-02-03 99790553 way "Denver Museum of Nature and Science, 2001, Colorado Boulevard, Denver, Denver County, Colorado, 80205, United States" tourism museum 0.933256970094253 United States FALSE
+department of enterprise us Americas Northern America FALSE 1 2021-02-03 3043821 node "Enterprise Fire Department, South Main Street, Singing Brook, Enterprise, Coffee County, Alabama, 36330-1915, United States" amenity fire_station 0.301 United States FALSE
+department of environmental quality us Americas Northern America FALSE 1 2021-02-03 220675454 way "Department of Environmental Quality, Aspen Street, Helena, Lewis and Clark County, Montana, 59602-1217, United States" office government 0.401 United States FALSE
+department of labor us Americas Northern America FALSE 1 2021-02-03 196192727 way "Department of Labor, 550, South 16th Street, Capitol View, Haymarket, Lincoln, Lancaster County, Nebraska, 68508, United States" office government 0.301 United States FALSE
+department of radiation oncology us Americas Northern America FALSE 1 2021-02-03 204988396 way "Department of Radiation Oncology, 2280, Inwood Road, Dallas, TX, Dallas, Dallas County, Texas, 75390, United States" building university 0.401 United States FALSE
+depaul university us Americas Northern America FALSE 1 2021-02-03 95148601 way "DePaul University, North Bissell Street, Lincoln Park, Chicago, Cook County, Illinois, 60614, United States" amenity university 0.695671053119323 United States FALSE
+des moines university us Americas Northern America FALSE 1 2021-02-03 126157336 way "Des Moines University, 3200, Grand Avenue, Grand Oaks Condominiums, Des Moines, Polk County, Iowa, 50312, United States" amenity university 0.625616522175778 United States FALSE
+devon energy us Americas Northern America FALSE 1 2021-02-03 121803437 way "Devon Energy, Central Business District, Oklahoma City, Oklahoma County, Oklahoma, United States" landuse commercial 0.4 United States FALSE
+dhhs us Americas Northern America FALSE 1 2021-02-03 80387349 node "DHHS, 220, Capitol Street, Augusta, Kennebec County, Maine, 04330, United States" place house 0.101 United States FALSE
+diamond and washington university us Americas Northern America FALSE 1 2021-02-03 189612585 way "West Diamond Drive, University House, Fayetteville, Washington County, Arkansas, 72701, United States" highway service 0.375 United States FALSE
+dias us Americas Northern America FALSE 1 2021-02-03 100102213 way "Diaz, Jackson County, Arkansas, United States" boundary administrative 0.376527586886318 United States FALSE
+doe joint genome institute us Americas Northern America FALSE 1 2021-02-03 235834399 way "Joint Genome Institute, Smoot Road, Berkeley, Alameda County, California, 94720, United States" building yes 0.610439474412231 United States FALSE
+doe's lawrence berkeley national laboratory us Americas Northern America FALSE 1 2021-02-03 201093023 way "Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States" amenity research_institute 0.501 United States FALSE
+dora us Americas Northern America FALSE 1 2021-02-03 258379011 relation "Dora, Walker County, Alabama, 35038, United States" boundary administrative 0.525494508146147 United States FALSE
+double star us Americas Northern America FALSE 1 2021-02-03 226790102 way "Double Star, Tyler, Smith County, Texas, United States" landuse residential 0.4 United States FALSE
+dow agrosciences us Americas Northern America FALSE 1 2021-02-03 158311065 way "Dow AgroSciences, Ruby H Harper Boulevard, Gilbert Gardens, Plunket Town, Atlanta, Fulton County, Georgia, 30354, United States" building warehouse 0.201 United States FALSE
+drew university us Americas Northern America FALSE 1 2021-02-03 104995030 way "Drew University, Vinal Place, Fairwoods, Madison, Morris County, New Jersey, 07940, United States" amenity university 0.631278630270434 United States FALSE
+duke clinical research institute us Americas Northern America FALSE 1 2021-02-03 100768801 way "Duke Clinical Research Institute, 300, West Morgan Street, American Tobacco Historic District, Durham, Durham County, North Carolina, 27701, United States" building yes 0.401 United States FALSE
+duke lemur center us Americas Northern America FALSE 1 2021-02-03 212038174 way "Duke Lemur Center, Evans Street, Welcome Circle, Durham, Durham County, North Carolina, 27705, United States" tourism zoo 0.605872022275768 United States FALSE
+duke university in durham us Americas Northern America FALSE 1 2021-02-03 259450641 relation "Duke University, 15th Street, 9th Street District, Durham, Durham County, North Carolina, 27705, United States" amenity university 0.993140337132867 United States FALSE
+duke university medical center us Americas Northern America FALSE 1 2021-02-03 259450641 relation "Duke University, 15th Street, 9th Street District, Durham, Durham County, North Carolina, 27705, United States" amenity university 0.793140337132867 United States FALSE
+dunn solar telescope us Americas Northern America FALSE 1 2021-02-03 139772916 way "Dunn Solar Telescope, Telescope Loop, Sacramento Peak Observatory, Sunspot, Otero County, New Mexico, 88349, United States" building yes 0.301 United States FALSE
+dupont corporation us Americas Northern America FALSE 1 2021-02-03 54825357 node "Fort DuPont Redevelopment & Preservation Corporation, 260, Old Elm Avenue, New Castle County, Delaware, 19706, United States" place house 0.201 United States FALSE
+earth system science center us Americas Northern America FALSE 1 2021-02-03 54925314 node "Center for Science in the Earth System, 3737, Brooklyn Avenue Northeast, University District, Seattle, King County, Washington, 98105-6286, United States" office research 0.401 United States FALSE
+earth system science centre us Americas Northern America FALSE 1 2021-02-03 54925314 node "Center for Science in the Earth System, 3737, Brooklyn Avenue Northeast, University District, Seattle, King County, Washington, 98105-6286, United States" office research 0.301 United States FALSE
+earth venture us Americas Northern America FALSE 1 2021-02-03 71060837 node "Earth, Wood & Fire, 214, Mountain Road, Bagleys Venture, Lynchs Corner, Fallston, Harford County, Maryland, 21047, United States" amenity restaurant 0.201 United States FALSE
+ecosystem services us Americas Northern America FALSE 1 2021-02-03 80480832 node "Ecosystem Services, Group Meeting Area, Palo Alto, Santa Clara County, California, 94303, United States" tourism information 0.201 United States FALSE
+edgcomb us Americas Northern America FALSE 1 2021-02-03 88605407 way "Edgcomb Avenue, Knoxville, Tioga County, Pennsylvania, 16928, United States" highway residential 0.2 United States FALSE
+eec us Americas Northern America FALSE 1 2021-02-03 92923719 way "Swanzy Lake Rd, Swanzy, Forsyth Township, Marquette County, Michigan, 49841, United States" highway residential 0.1 United States FALSE
+ekström us Americas Northern America FALSE 1 2021-02-03 89393268 way "Ekstrom, Pierce County, Washington, 98327, United States" highway residential 0.1 United States FALSE
+eldora us Americas Northern America FALSE 1 2021-02-03 258353320 relation "Eldora, Hardin County, Iowa, 50627, United States" boundary administrative 0.542383952483738 United States FALSE
+ellis us Americas Northern America FALSE 1 2021-02-03 258432178 relation "Ellis County, Texas, United States" boundary administrative 0.657733133901671 United States FALSE
+emmett conrad high school us Americas Northern America FALSE 1 2021-02-03 191982414 way "Emmett J Conrad High School, 7502, Fair Oaks Avenue, Vickery Meadows PID, Dallas, Dallas County, Texas, 75231, United States" amenity school 0.662719188578863 United States FALSE
+energy us Americas Northern America FALSE 1 2021-02-03 257952569 relation "Energy, Williamson County, Illinois, 62933, United States" boundary administrative 0.523032671836241 United States FALSE
+energy and minerals us Americas Northern America FALSE 1 2021-02-03 24228476 node "Pathfinder energy service, 1111, Southern Minerals Road, Corpus Christi, Nueces County, Texas, 78409, United States" building industrial 0.201 United States FALSE
+enserch us Americas Northern America FALSE 1 2021-02-03 187679938 way "Enserch Corporation, Gregg County, Texas, United States" landuse industrial 0.3 United States FALSE
+environmental justice us Americas Northern America FALSE 1 2021-02-03 225124870 way "Literacy For Environmental Justice, 1150, Carroll Avenue, San Francisco, San Francisco City and County, California, 94188, United States" building yes 0.201 United States FALSE
+environmental law institute us Americas Northern America FALSE 1 2021-02-03 67439590 node "Environmental Law Institute, 1730, M Street Northwest, Golden Triangle, Washington, District of Columbia, 20036, United States" office association 0.301 United States FALSE
+environmental progress us Americas Northern America FALSE 1 2021-02-03 151121616 way "ACF Environmental, 25, Progress Avenue, Nashua, Hillsborough County, New Hampshire, 03062, United States" building yes 0.201 United States FALSE
+epri us Americas Northern America FALSE 1 2021-02-03 149351356 way "EPRI High Voltage Lab, New Lenox, Lenox, Berkshire County, Massachusetts, United States" landuse industrial 0.3 United States FALSE
+erma us Americas Northern America FALSE 1 2021-02-03 258445399 relation "Erma, Lower Township, Cape May County, New Jersey, United States" place census-designated 0.43674906391142 United States FALSE
+esvelt us Americas Northern America FALSE 1 2021-02-03 85834685 way "Esvelt Road, Daisy, Stevens County, Washington, United States" highway residential 0.2 United States FALSE
+ethical treatment of animals us Americas Northern America FALSE 1 2021-02-03 251457165 way "People for the Ethical Treatment of Animals, Front Street, Norfolk, Virginia, 23510, United States" amenity social_facility 0.401 United States FALSE
+eugene us Americas Northern America FALSE 1 2021-02-03 257538846 relation "Eugene, Lane County, Oregon, United States" boundary administrative 0.678763756395741 United States FALSE
+european society us Americas Northern America FALSE 1 2021-02-03 84196080 node "European Republic, 213, Chestnut Street, Society Hill, Philadelphia, Philadelphia County, Pennsylvania, 19106, United States" amenity fast_food 0.201 United States FALSE
+evergreen state college us Americas Northern America FALSE 1 2021-02-03 258893745 relation "The Evergreen State College, Brenner Road Northwest, Thurston County, Washington, 98505, United States" amenity university 0.301 United States FALSE
+ewing bank us Americas Northern America FALSE 1 2021-02-03 257926178 relation "Ewing, Franklin County, Illinois, United States" boundary administrative 0.524872581583534 United States FALSE
+exeter university us Americas Northern America FALSE 1 2021-02-03 89930509 way "Exeter, University Town Center, Irvine, Orange County, California, 92612, United States" highway residential 0.3 United States FALSE
+fairview health services us Americas Northern America FALSE 1 2021-02-03 158126320 way "Health Services, McMIllan Road, La Loma Park, Berkeley, Alameda County, California, 94720, United States" building yes 0.201 United States FALSE
+fallon paiute-shoshone tribe us Americas Northern America FALSE 1 2021-02-03 231265905 way "Fallon Paiute - Shoshone Tribe, Fallon, Churchill County, Nevada, United States" boundary aboriginal_lands 0.525 United States FALSE
+fdna us Americas Northern America FALSE 1 2021-02-03 90193129 way "Fdna Lane, Las Vegas, Clark County, Nevada, 89102-4345, United States" highway residential 0.2 United States FALSE
+federal express us Americas Northern America FALSE 1 2021-02-03 233799488 way "Federal Express, Santa Fe, Santa Fe County, New Mexico, United States" landuse industrial 0.4 United States FALSE
+federal security service us Americas Northern America FALSE 1 2021-02-03 154159910 way "Navy Federal Credit Union, 141, Security Drive, Winchester, Frederick County, Virginia, 22602, United States" office Credit_Union 0.201 United States FALSE
+federation of american societies us Americas Northern America FALSE 1 2021-02-03 154221123 way "FGAS Cultural Center, 150, Spencerport Road, Rochester, Gates, Monroe County, New York, 14606, United States" building house 0.001 United States FALSE
+feld entertainment us Americas Northern America FALSE 1 2021-02-03 189595545 way "Entertainment, Foothill Ranch Towne Center, Foothill Ranch, Lake Forest, Orange County, California, 92610, United States" highway service 0.175 United States FALSE
+first solar us Americas Northern America FALSE 1 2021-02-03 61379150 node "First Solar, 350, West Washington Street, Tempe, Maricopa County, Arizona, 85281, United States" office yes 0.593222260239594 United States FALSE
+florida gulf coast university in fort myers us Americas Northern America FALSE 1 2021-02-03 35558902 node "Florida Gulf Coast University, 10501, FGCU Boulevard South, North Lake Village, Fort Myers, Lee County, Florida, 33965-6565, United States" building school 0.975561325671519 United States FALSE
+florida museum of natural history us Americas Northern America FALSE 1 2021-02-03 182064668 way "Florida Museum of Natural History, 3215, Hull Road, Gainesville, Alachua County, Florida, 32611, United States" tourism museum 0.868804350670811 United States FALSE
+florida state us Americas Northern America FALSE 1 2021-02-03 257824147 relation "Florida, United States" boundary administrative 0.951213972798062 United States FALSE
+folsom state prison us Americas Northern America FALSE 1 2021-02-03 102683947 way "Folsom State Prison, Johnny Cash Trail, Folsom, Sacramento County, California, 95630, United States" amenity prison 0.680889254526519 United States FALSE
+food & water watch us Americas Northern America FALSE 1 2021-02-03 4509818 node "Duck Deli, 1221, Duck Road, Ships Watch, Duck, Dare County, North Carolina, 27949, United States" amenity restaurant 0.101 United States FALSE
+foothill college us Americas Northern America FALSE 1 2021-02-03 2853914 node "Foothill College, Loop Road, Los Altos Hills, Santa Clara County, California, 94022, United States" amenity school 0.201 United States FALSE
+forensic science service us Americas Northern America FALSE 1 2021-02-03 145457220 way "Forensic Science, Merton Minter, South Texas Medical Center, San Antonio, Bexar County, Texas, 78229, United States" building yes 0.201 United States FALSE
+fort collins us Americas Northern America FALSE 1 2021-02-03 258131035 relation "Fort Collins, Larimer County, Colorado, United States" boundary administrative 0.726613055164061 United States FALSE
+forty seven us Americas Northern America FALSE 1 2021-02-03 2501141 node "Cow Island Number Forty-seven, Memphis, Shelby County, Tennessee, United States" place island 0.525 United States FALSE
+foundation center us Americas Northern America FALSE 1 2021-02-03 51536219 node "Foundation Center, 33, Old Slip, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10005, United States" amenity library 0.201 United States FALSE
+foundation for the nih us Americas Northern America FALSE 1 2021-02-03 154743130 way "The Annenberg Space for Photography, 2000, Avenue of the Stars, Century City, Los Angeles, Los Angeles County, California, 90067, United States" tourism museum 0.523710213530857 United States FALSE
+foundation medicine us Americas Northern America FALSE 1 2021-02-03 43539867 node "Foundation Medicine, Inc. Headquarters, 150, Second Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" office research 0.201 United States FALSE
+fred hutchinson cancer center us Americas Northern America FALSE 1 2021-02-03 179513052 way "Fred Hutchinson Cancer Research Center, 1100, Fairview Avenue North, South Lake Union, Capitol Hill, Seattle, King County, Washington, 98109, United States" amenity research_institute 0.731005307834616 United States FALSE
+fred hutchinson research center us Americas Northern America FALSE 1 2021-02-03 179513052 way "Fred Hutchinson Cancer Research Center, 1100, Fairview Avenue North, South Lake Union, Capitol Hill, Seattle, King County, Washington, 98109, United States" amenity research_institute 0.731005307834616 United States FALSE
+fsi us Americas Northern America FALSE 1 2021-02-03 3120194 node "Henry Post Army Airfield, Condon Road, Lawton, Comanche County, Oklahoma, 73503, United States" aeroway aerodrome 0.23181178765026 United States FALSE
+fullerton us Americas Northern America FALSE 1 2021-02-03 258631737 relation "Fullerton, Orange County, California, United States" boundary administrative 0.608922490506601 United States FALSE
+funk us Americas Northern America FALSE 1 2021-02-03 258441607 relation "Funk, Phelps County, Nebraska, United States" boundary administrative 0.437009666411203 United States FALSE
+gadzooks us Americas Northern America FALSE 1 2021-02-03 163941067 way "Gadzooks Drive, Silver Ridge, Sandy, Salt Lake County, Utah, 84020, United States" highway residential 0.2 United States FALSE
+gallaher us Americas Northern America FALSE 1 2021-02-03 387807 node "Gallaher, Curry County, New Mexico, 88103, United States" place hamlet 0.35 United States FALSE
+gallup us Americas Northern America FALSE 1 2021-02-03 258164532 relation "Gallup, McKinley County, New Mexico, 87301, United States" boundary administrative 0.564154606259328 United States FALSE
+galveston national laboratory us Americas Northern America FALSE 1 2021-02-03 229364111 way "NMFS - Galveston Laboratory, NOAA, Galveston, Galveston County, Texas, 77551, United States" office government 0.201 United States FALSE
+game commission us Americas Northern America FALSE 1 2021-02-03 70479424 node "Nebraska Game and Parks Commission, 2200, North 33rd Street, Lincoln, Lancaster County, Nebraska, 68503, United States" office government 0.482582546755277 United States FALSE
+gaston berger university us Americas Northern America FALSE 1 2021-02-03 190185049 way "Mary Gaston Residence Hall, South Drive, University Heights, Greenville, Greenville County, South Carolina, 29614, United States" building residential 0.201 United States FALSE
+geha us Americas Northern America FALSE 1 2021-02-03 257939755 relation "Geauga County, Ohio, United States" boundary administrative 0.515207975256723 United States FALSE
+genentech hall us Americas Northern America FALSE 1 2021-02-03 122738337 way "Genentech Hall, Roger Evans Terrace, Mission Bay, San Francisco, San Francisco City and County, California, United States" building yes 0.201 United States FALSE
+general atomics us Americas Northern America FALSE 1 2021-02-03 18281619 node "General Atomics, John Hopkins Court, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States" building office 0.587535809977585 United States FALSE
+general conference us Americas Northern America FALSE 1 2021-02-03 149079985 way "Center for Christian Ministries Churches of God, General Conference, 700, East Melrose Avenue, Bent Tree, Findlay, Hancock County, Ohio, 45840, United States" building yes 0.201 United States FALSE
+general mills us Americas Northern America FALSE 1 2021-02-03 254985713 way "General Mills, Great Falls, Cascade County, Montana, United States" landuse industrial 0.4 United States FALSE
+general services administration us Americas Northern America FALSE 1 2021-02-03 258573536 relation "General Services Administration, 1800, F Street Northwest, Golden Triangle, Washington, District of Columbia, 20037, United States" office government 0.466903631515068 United States FALSE
+geneva university hospitals us Americas Northern America FALSE 1 2021-02-03 203412230 way "University Hospitals Geneva Medical Center, 870, West Main Street, Geneva, Ashtabula County, Ohio, 44041, United States" amenity hospital 0.301 United States FALSE
+genome analysis centre us Americas Northern America FALSE 1 2021-02-03 170711270 way "Genome Analysis Center, 830, West Campus Drive, West Haven, New Haven County, Connecticut, 06516, United States" building university 0.201 United States FALSE
+genome research us Americas Northern America FALSE 1 2021-02-03 100166139 way "Genome Research Institute, Ronald Reagan Cross County Highway, Reading, Hamilton County, Ohio, 45215-5417, United States" amenity research_institute 0.201 United States FALSE
+genomic research us Americas Northern America FALSE 1 2021-02-03 85844826 way "Genomic Drive, University Research Park, Madison, Dane County, Wisconsin, 53719, United States" highway residential 0.3 United States FALSE
+george washington university school us Americas Northern America FALSE 1 2021-02-03 106978219 way "George Washington University, I Street Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States" amenity university 0.861031504404982 United States FALSE
+georgetown university medical center us Americas Northern America FALSE 1 2021-02-03 105725399 way "Georgetown University, 3700, O Street Northwest, Georgetown, Washington, District of Columbia, 20057, United States" amenity university 0.787586492717596 United States FALSE
+georgia state us Americas Northern America FALSE 1 2021-02-03 50248915 node "Georgia State, 2, Martin Luther King Junior Drive Southeast, Five Points, Atlanta, Fulton County, Georgia, 30303-3506, United States" railway station 0.201 United States FALSE
+georgia tech research institute us Americas Northern America FALSE 1 2021-02-03 82853123 node "Georgia Tech Research Institute, 2970, Presidential Drive, Wright Executive Center, Fairborn, Greene County, Ohio, 45324, United States" office educational_institution 0.401 United States FALSE
+github us Americas Northern America FALSE 1 2021-02-03 21615383 node "GitHub, 88, Colin P. Kelly Junior Street, South Beach, San Francisco, San Francisco City and County, California, 94107, United States" office company 0.101 United States FALSE
+gladstone institutes us Americas Northern America FALSE 1 2021-02-03 108770743 way "J David Gladstone Institutes, 1650, Owens Street, Mission Bay, San Francisco, San Francisco City and County, California, 94158, United States" building office 0.201 United States FALSE
+glenn research center us Americas Northern America FALSE 1 2021-02-03 60822274 node "NASA John H. Glenn Research Center at Lewis Field, Taylor Road, Brook Park, Cuyahoga County, Ohio, 44126, United States" office research 0.739197856791149 United States FALSE
+global congress us Americas Northern America FALSE 1 2021-02-03 173285347 way "SRG Global, 601, North Congress Avenue, Smythe, Evansville, Vanderburgh County, Indiana, 47715, United States" building yes 0.201 United States FALSE
+global ecology us Americas Northern America FALSE 1 2021-02-03 147781560 way "Global Ecology Research Center, Searsville Road, Stanford, Santa Clara County, California, 94305-6015, United States" building yes 0.201 United States FALSE
+global health us Americas Northern America FALSE 1 2021-02-03 118152495 way "Global Center for Health Innovation, 133, Saint Clair Avenue Northeast, East 4th Street, Warehouse District, Cleveland, Cuyahoga County, Ohio, 44114, United States" building yes 0.494028740055238 United States FALSE
+global security us Americas Northern America FALSE 1 2021-02-03 177539015 way "Global Security, East 33rd Street, Vancouver, Clark County, Washington, 98663, United States" office company 0.201 United States FALSE
+greenwood genetic center us Americas Northern America FALSE 1 2021-02-03 121423652 way "Greenwood Genetic Center, Columbia Office, 1911, Pulaski Street, Elmwood, Columbia, Richland County, South Carolina, 29201, United States" building yes 0.301 United States FALSE
+grinnell us Americas Northern America FALSE 1 2021-02-03 258144015 relation "Grinnell, Gove County, Kansas, 67738, United States" boundary administrative 0.51550718966255 United States FALSE
+gsr us Americas Northern America FALSE 1 2021-02-03 123444071 way "Graduate School & Research Building, Bosque Street, San Antonio, Bexar County, Texas, 78249-1620, United States" building university 0.001 United States FALSE
+guardian us Americas Northern America FALSE 1 2021-02-03 2795396 node "The Guardian, San Juan County, Colorado, United States" natural peak 0.4 United States FALSE
+guardian angels us Americas Northern America FALSE 1 2021-02-03 52339565 node "Guardian Angels, 581, East 14 Mile Road, Clawson, Oakland County, Michigan, 48014, United States" amenity place_of_worship 0.201 United States FALSE
+gulfstream v us Americas Northern America FALSE 1 2021-02-03 152738447 way "Gulfstream, Conroe, Montgomery County, Texas, 77303, United States" highway residential 0.2 United States FALSE
+hall us Americas Northern America FALSE 1 2021-02-03 258640088 relation "Hall County, Texas, United States" boundary administrative 0.654110162810059 United States FALSE
+hampton university us Americas Northern America FALSE 1 2021-02-03 258960793 relation "Hampton University, 100, East Queen Street, Kecoughtan, Hampton, Virginia, 23668, United States" amenity university 0.637183546812171 United States FALSE
+harlem junior high school us Americas Northern America FALSE 1 2021-02-03 194527401 way "Harlem Junior High School, Northfield Avenue, Loves Park, Winnebago County, Illinois, 61111, United States" amenity school 0.401 United States FALSE
+harris county public health us Americas Northern America FALSE 1 2021-02-03 70168132 node "Dillard St at E Main St (County Public Health), South Dillard Street, Downtown Durham, Durham, Durham County, North Carolina, 27701, United States" highway bus_stop 0.301 United States FALSE
+hartwick college us Americas Northern America FALSE 1 2021-02-03 121610396 way "Hartwick College, 1, Hartwick Drive, Oneonta, City of Oneonta, Otsego County, New York, 13820, United States" amenity university 0.573438300637181 United States FALSE
+harvard business school us Americas Northern America FALSE 1 2021-02-03 2751379 node "Harvard Business School, Harvard Way, Allston, Boston, Suffolk County, Massachusetts, 02138-3824, United States" amenity university 0.839985702342783 United States FALSE
+harvard forest us Americas Northern America FALSE 1 2021-02-03 97627124 way "Harvard Forest, Quaker Drive, Petersham, Worcester County, Massachusetts, 01366, United States" leisure nature_reserve 0.201 United States FALSE
+harvard university lab us Americas Northern America FALSE 1 2021-02-03 258370425 relation "Harvard University, Kingsley Street, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134-1420, United States" amenity university 0.977190722653673 United States FALSE
+harvey mudd college us Americas Northern America FALSE 1 2021-02-03 98492541 way "Harvey Mudd College, East Foothill Boulevard, Claremont, Los Angeles County, California, 91711, United States" amenity university 0.700782553145287 United States FALSE
+has us Americas Northern America FALSE 1 2021-02-03 257963057 relation "Harrison County, Ohio, United States" boundary administrative 0.518837343149246 United States FALSE
+hastings center us Americas Northern America FALSE 1 2021-02-03 459457 node "Hastings Center, Town of Hastings, Oswego County, New York, 13036, United States" place hamlet 0.45 United States FALSE
+haverford us Americas Northern America FALSE 1 2021-02-03 447354 node "Haverford, Lower Merion Township, Montgomery County, Pennsylvania, 19003, United States" place hamlet 0.503670690295642 United States FALSE
+haverford college us Americas Northern America FALSE 1 2021-02-03 115142668 way "Haverford College, East Railroad Avenue, Haverford Township, Delaware County, Pennsylvania, 19010, United States" amenity college 0.657348082673311 United States FALSE
+hawaiian volcano observatory us Americas Northern America FALSE 1 2021-02-03 102153617 way "Hawaiian Volcano Observatory, Crater Rim Trail, Hawaiʻi County, Hawaii, 96718, United States" building yes 0.301 United States FALSE
+hawks us Americas Northern America FALSE 1 2021-02-03 435217 node "Hawks, Bismark Township, Presque Isle County, Michigan, 49743, United States" place hamlet 0.35 United States FALSE
+hcmc us Americas Northern America FALSE 1 2021-02-03 123770771 way "Hennepin County Medical Center, 701, Park Avenue South, Minneapolis, Hennepin County, Minnesota, 55415, United States" amenity hospital 0.250254845255209 United States FALSE
+health and human services us Americas Northern America FALSE 1 2021-02-03 159574403 way "Health and Human Services, Dove Street, Clinton Township, Macomb County, Michigan, 48038, United States" building university 0.401 United States FALSE
+healthcare us Americas Northern America FALSE 1 2021-02-03 257378484 way "Healthcare, Shiloh, Lancaster County, South Carolina, 29720-2135, United States" highway service 0.175 United States FALSE
+heidelberg university hospital us Americas Northern America FALSE 1 2021-02-03 164310513 way "Heidelberg University, Governor's Trail, College Hill, Tiffin, Seneca County, Ohio, 44883, United States" amenity university 0.519018527529768 United States FALSE
+helios us Americas Northern America FALSE 1 2021-02-03 111625127 way "Helios, 1600, 2nd Avenue, Pike Place Market Area, Belltown, Seattle, King County, Washington, 98101, United States" building apartments 0.361844955490085 United States FALSE
+hennepin county medical center us Americas Northern America FALSE 1 2021-02-03 123770771 way "Hennepin County Medical Center, 701, Park Avenue South, Minneapolis, Hennepin County, Minnesota, 55415, United States" amenity hospital 0.650254845255209 United States FALSE
+henry ford hospital us Americas Northern America FALSE 1 2021-02-03 193942596 way "Henry Ford Hospital, 2799, West Grand Boulevard, Henry Ford, New Center, Detroit, Wayne County, Michigan, 48202, United States" amenity hospital 0.670940340656356 United States FALSE
+henrys us Americas Northern America FALSE 1 2021-02-03 334760 node "Henrys, Maple Valley, King County, Washington, 98010, United States" place hamlet 0.35 United States FALSE
+hershey us Americas Northern America FALSE 1 2021-02-03 258025884 relation "Hershey, Dauphin County, Pennsylvania, United States" boundary administrative 0.570462886806853 United States FALSE
+hess us Americas Northern America FALSE 1 2021-02-03 464089 node "Hess, Harford County, Maryland, United States" place hamlet 0.35 United States FALSE
+hewlett us Americas Northern America FALSE 1 2021-02-03 257852582 relation "Hewlett, Hempstead, Nassau County, New York, United States" boundary administrative 0.498524014044495 United States FALSE
+hewlett foundation us Americas Northern America FALSE 1 2021-02-03 258952342 relation "Hewlett Foundation, 2121, Sand Hill Road, Stanford Hills, Menlo Park, San Mateo County, California, 94028, United States" office ngo 0.201 United States FALSE
+high point university us Americas Northern America FALSE 1 2021-02-03 2719486 node "High Point University, North University Parkway, High Point, Guilford County, North Carolina, 27262, United States" amenity school 0.701151058873139 United States FALSE
+hill us Americas Northern America FALSE 1 2021-02-03 258432168 relation "Hill County, Texas, United States" boundary administrative 0.654736575831137 United States FALSE
+history of natural science us Americas Northern America FALSE 1 2021-02-03 3051871 node "El Campo Museum of Art, History, and Natural Science, North Mechanic Street, El Campo, Wharton County, Texas, 77437, United States" tourism museum 0.401 United States FALSE
+hoover institution us Americas Northern America FALSE 1 2021-02-03 103143878 way "Hoover Institution on War, Revolution and Peace, Galvez Street, Stanford, Santa Clara County, California, 94305-6015, United States" amenity college 0.65558864174307 United States FALSE
+hopewell us Americas Northern America FALSE 1 2021-02-03 259361968 relation "Hopewell, Virginia, United States" boundary administrative 0.579389836000794 United States FALSE
+hopewell culture national historical park us Americas Northern America FALSE 1 2021-02-03 259178645 relation "Hopewell Culture National Historical Park, Ross County, Ohio, United States" leisure park 0.92962282009393 United States FALSE
+houghton us Americas Northern America FALSE 1 2021-02-03 258207257 relation "Houghton County, Michigan, United States" boundary administrative 0.601814895980315 United States FALSE
+house appropriations committee us Americas Northern America FALSE 1 2021-02-03 81345390 node "House Appropriations Committee, North 9th Street, Shockoe Slip, Richmond, Virginia, 23219, United States" office government 0.301 United States FALSE
+house of representative us Americas Northern America FALSE 1 2021-02-03 87659921 way "2 Portland Fish Pier Portland ME Representative Pingrees Office, Old Port, Downtown, Portland, Cumberland County, Maine, 04101-4145, United States" highway residential 0.3 United States FALSE
+houston methodist research institute us Americas Northern America FALSE 1 2021-02-03 147281798 way "Houston Methodist Research Institute, 6670, Bertner Avenue, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" building hospital 0.401 United States FALSE
+howard university us Americas Northern America FALSE 1 2021-02-03 258484447 relation "Howard University, Howard Place Northwest, Howard University, Washington, District of Columbia, 20001, United States" amenity university 0.719338807988632 United States FALSE
+hudson institute us Americas Northern America FALSE 1 2021-02-03 3044001 node "Hudson Institute, Quaker Ridge Road, Cortlandt, Westchester, New York, 10520, United States" building yes 0.201 United States FALSE
+human health us Americas Northern America FALSE 1 2021-02-03 94919022 way "Western Human Nutrition Research Center, West Health Sciences Drive, Yolo County, California, 95616-5270, United States" building university 0.201 United States FALSE
+humane society us Americas Northern America FALSE 1 2021-02-03 38478592 node "The Humane Society, 7115, Georgia Avenue Northwest, Shepherd Park, Washington, District of Columbia, 20012, United States" shop pet 0.201 United States FALSE
+humane society of the united states us Americas Northern America FALSE 1 2021-02-03 38478592 node "The Humane Society, 7115, Georgia Avenue Northwest, Shepherd Park, Washington, District of Columbia, 20012, United States" shop pet 0.601 United States FALSE
+humpty dumpty us Americas Northern America FALSE 1 2021-02-03 164108425 way "Humpty Dumpty, West Barnstable, Barnstable, Barnstable County, Massachusetts, 0264, United States" highway path 0.275 United States FALSE
+hurd us Americas Northern America FALSE 1 2021-02-03 500391 node "Hurd, Caribou, Aroostook County, Maine, United States" place hamlet 0.35 United States FALSE
+ibm research us Americas Northern America FALSE 1 2021-02-03 98702289 way "IBM Almaden Research Center, 650, Harry Road, IBM Almaden Research Center, San Jose, Santa Clara County, California, 95120, United States" building yes 0.483827688081076 United States FALSE
+ibm research at almaden research center us Americas Northern America FALSE 1 2021-02-03 98702289 way "IBM Almaden Research Center, 650, Harry Road, IBM Almaden Research Center, San Jose, Santa Clara County, California, 95120, United States" building yes 0.883827688081076 United States FALSE
+ibm thomas j. watson research center us Americas Northern America FALSE 1 2021-02-03 110787015 way "IBM Yorktown research lab, Adams Road, Town of New Castle, Town of Yorktown, Westchester, New York, 10562, United States" office research 0.201 United States FALSE
+icf international us Americas Northern America FALSE 1 2021-02-03 70920084 node "ICF International, 615, Southwest Alder Street, Downtown, Portland, Metro, Oregon, 97205, United States" office company 0.201 United States FALSE
+ieee us Americas Northern America FALSE 1 2021-02-03 258920692 relation "IEEE, 445, Hoes Lane, Piscataway Township, Middlesex County, New Jersey, 08854, United States" building yes 0.101 United States FALSE
+igm us Americas Northern America FALSE 1 2021-02-03 214200010 way "Kingman Airport, Mohave Airport Drive, Mohave County, Arizona, United States" aeroway aerodrome 0.2885709817045 United States FALSE
+illinois institute of technology us Americas Northern America FALSE 1 2021-02-03 127098290 way "Illinois Institute of Technology, East 30th Street, Douglas, Chicago, Cook County, Illinois, 60616, United States" amenity university 0.879673085462407 United States FALSE
+illinois natural history survey us Americas Northern America FALSE 1 2021-02-03 2344232 node "Illinois Natural History Survey Area, Moultrie County, Illinois, 61951, United States" leisure park 0.55 United States FALSE
+illinois state university us Americas Northern America FALSE 1 2021-02-03 259445049 relation "Illinois State University, North Main Street, Normal, McLean County, Illinois, 61761, United States" amenity university 0.301 United States FALSE
+impc us Americas Northern America FALSE 1 2021-02-03 204982626 way "IMPC, Inglesby Drive, Williamsburg East, Richland County, South Carolina, 29223, United States" amenity place_of_worship 0.101 United States FALSE
+indian national trust us Americas Northern America FALSE 1 2021-02-03 102851004 way "Woodbridge Conservation Trust (35 Indian Trail), Woodbridge, New Haven County, Connecticut, United States" natural wood 0.4 United States FALSE
+indiana state university us Americas Northern America FALSE 1 2021-02-03 107213197 way "Indiana State University, North 7th Street, Terre Haute, Vigo County, Indiana, 47804, United States" amenity university 0.736151154174256 United States FALSE
+indiana university bloomington us Americas Northern America FALSE 1 2021-02-03 107215239 way "Indiana University Bloomington, East 3rd Street, Bloomington, Monroe County, Indiana, 47401-6124, United States" amenity university 0.301 United States FALSE
+information center us Americas Northern America FALSE 1 2021-02-03 88944375 way "Information Center, Polk County, Arkansas, 71953, United States" highway residential 0.3 United States FALSE
+information power us Americas Northern America FALSE 1 2021-02-03 2959862 node "Fish Ladder and New England Power Company Information Center, Bridge Street, Bellows Falls Downtown Historic District, Bellows Falls, Rockingham, Windham County, Vermont, 03609, United States" tourism information 0.201 United States FALSE
+inouye solar telescope us Americas Northern America FALSE 1 2021-02-03 150478014 way "Daniel K. Inouye Solar Telescope, Crater Road, Maui County, Hawaii, United States" man_made telescope 0.551308416199056 United States FALSE
+institute for cancer research us Americas Northern America FALSE 1 2021-02-03 102403056 way "David H. Koch Institute for Integrative Cancer Research, 500, Main Street, East Cambridge, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02142, United States" building university 0.697580560553068 United States FALSE
+institute of forensic science us Americas Northern America FALSE 1 2021-02-03 149986396 way "Forensic Science Institute, East 2nd Street, Edmond, Oklahoma County, Oklahoma, 73083, United States" building yes 0.301 United States FALSE
+institute of human virology us Americas Northern America FALSE 1 2021-02-03 171936676 way "Institute of Human Virology, 725, West Lombard Street, Ridgely's Delight, Baltimore, Maryland, 21201, United States" building university 0.401 United States FALSE
+institute of immunology us Americas Northern America FALSE 1 2021-02-03 54695744 node "Allergy Asthma & Immunology Institute: Laura Ispas-Ponas, MD, 19455, Deerfield Avenue, Lansdowne Woods of Virginia, Lansdowne, Loudoun County, Virginia, 20176, United States" amenity doctors 0.301 United States FALSE
+institute of life sciences us Americas Northern America FALSE 1 2021-02-03 126803509 way "Life Sciences Institute, Washtenaw Avenue, Ann Arbor, Washtenaw County, Michigan, 48108, United States" building university 0.478140546517606 United States FALSE
+integrated research facility us Americas Northern America FALSE 1 2021-02-03 158319264 way "Integrated Biorefinery Research Facility, Denver West Parkway, Pleasant View, Jefferson County, Colorado, 80401-4015, United States" building yes 0.301 United States FALSE
+intellectual ventures us Americas Northern America FALSE 1 2021-02-03 70855788 node "Intellectual Ventures Laboratory, 14360, Southeast Eastgate Way, Eastgate, Bellevue, King County, Washington, 98007, United States" office company 0.201 United States FALSE
+internal medicine us Americas Northern America FALSE 1 2021-02-03 209636367 way "Internal Medicine, Chestnut Avenue, Dansville, North Dansville, Livingston County, New York, 14437, United States" amenity doctors 0.201 United States FALSE
+international finance corporation us Americas Northern America FALSE 1 2021-02-03 106721102 way "International Finance Corporation, 2121, Pennsylvania Avenue Northwest, Washington, District of Columbia, 20006, United States" office yes 0.301 United States FALSE
+international rescue committee us Americas Northern America FALSE 1 2021-02-03 82409109 node "International Rescue Committee, 1535, Liberty Lane, Westside, Missoula, Missoula County, Montana, 59807, United States" amenity social_centre 0.301 United States FALSE
+irena us Americas Northern America FALSE 1 2021-02-03 257479734 relation "Irena, Worth County, Missouri, United States" boundary administrative 0.447285603202449 United States FALSE
+irving us Americas Northern America FALSE 1 2021-02-03 258777731 relation "Irving, Dallas County, Texas, United States" boundary administrative 0.616662915473728 United States FALSE
+isle royale us Americas Northern America FALSE 1 2021-02-03 258888859 relation "Isle Royale, Keweenaw County, Michigan, United States" place island 0.55796975755477 United States FALSE
+isro satellite center us Americas Northern America FALSE 1 2021-02-03 68074173 node "The Satellite Center, Williams Boulevard, Kenner, Jefferson Parish, Louisiana, 70062, United States" shop yes 0.201 United States FALSE
+j. paul getty museum us Americas Northern America FALSE 1 2021-02-03 55027361 node "The J. Paul Getty Museum, Beverly Park Drive, Brentwood, Los Angeles, Los Angeles County, California, 90049, United States" tourism museum 0.873062316630288 United States FALSE
+j&j us Americas Northern America FALSE 1 2021-02-03 49289982 node "J and J, Ward County, Texas, 79756, United States" place neighbourhood 0.45 United States FALSE
+jackson state university us Americas Northern America FALSE 1 2021-02-03 118809848 way "Jackson State University, Saint Louis Street, Jackson, Hinds County, Mississippi, 39203, United States" amenity university 0.721467320409497 United States FALSE
+jacksonville state university us Americas Northern America FALSE 1 2021-02-03 258550067 relation "Jacksonville State University, 700, Pelham Road North, Jacksonville, Calhoun County, Alabama, 36265, United States" amenity university 0.301 United States FALSE
+jaguar us Americas Northern America FALSE 1 2021-02-03 83098527 node "Jaguar, Gurabo, Puerto Rico, 00778, United States" place suburb 0.375 United States FALSE
+james madison university us Americas Northern America FALSE 1 2021-02-03 259182914 relation "James Madison University, Harrison Street, Harrisonburg, Rockingham County, Virginia, 22801, United States" amenity university 0.764385501255418 United States FALSE
+janssen pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 171007297 way "Janssen Pharmaceuticals, Ortho Drive, Raritan, Somerset County, New Jersey, 08869, United States" building yes 0.201 United States FALSE
+jason us Americas Northern America FALSE 1 2021-02-03 454400 node "Jason, Greene County, North Carolina, 28551:28580, United States" place hamlet 0.35 United States FALSE
+jci us Americas Northern America FALSE 1 2021-02-03 254337932 way "1100, JCI, Selma, Johnston County, North Carolina, 27576, United States" landuse industrial 0.3 United States FALSE
+jefferies us Americas Northern America FALSE 1 2021-02-03 487880 node "Jefferis, Menallen Township, Fayette County, Pennsylvania, 15484, United States" place hamlet 0.25 United States FALSE
+jefferson us Americas Northern America FALSE 1 2021-02-03 258358929 relation "Jefferson County, Texas, United States" boundary administrative 0.657913863605315 United States FALSE
+jefferson community and technical college us Americas Northern America FALSE 1 2021-02-03 181934405 way "Eastern Gateway Community College, Jefferson County Campus, 4000, Sunset Boulevard, Braybarton Boulevard Historic District, Becker Highlands, Steubenville, Jefferson County, Ohio, 43952, United States" amenity college 0.672343749103071 United States FALSE
+jefferson parish us Americas Northern America FALSE 1 2021-02-03 258214613 relation "Jefferson Parish, Louisiana, United States" boundary administrative 0.685339066716717 United States FALSE
+john jay college of criminal justice us Americas Northern America FALSE 1 2021-02-03 169888445 way "John Jay College of Criminal Justice, 11th Avenue, Hell's Kitchen, Manhattan Community Board 4, Manhattan, New York County, New York, 10018, United States" amenity college 0.987075864564083 United States FALSE
+johns hopkins bayview medical center us Americas Northern America FALSE 1 2021-02-03 109799549 way "Johns Hopkins Bayview Medical Center, 4940, Eastern Avenue, Greektown, Baltimore, Maryland, 21224, United States" amenity hospital 0.799042266993274 United States FALSE
+johnson & johnson of new brunswick us Americas Northern America FALSE 1 2021-02-03 99014438 way "Johnson and Johnson, New Brunswick, Middlesex County, New Jersey, 08903, United States" highway service 0.475 United States FALSE
+joint institute us Americas Northern America FALSE 1 2021-02-03 96516634 way "Joint Institute for Lab Astrophysics, 1900, Colorado Avenue, The Hill, Boulder, Boulder County, Colorado, 80309, United States" building university 0.526239076957718 United States FALSE
+joslin diabetes center us Americas Northern America FALSE 1 2021-02-03 147408996 way "Joslin Diabetes Center, 1, Joslin Place, Boston, Suffolk County, Massachusetts, 02215, United States" amenity clinic 0.557277503353622 United States FALSE
+jst us Americas Northern America FALSE 1 2021-02-03 146469981 way "Johnstown-Cambria County Airport, Airport Road, Richland Township, Cambria County, Pennsylvania, 15904, United States" aeroway aerodrome 0.217338060184506 United States FALSE
+jupiters us Americas Northern America FALSE 1 2021-02-03 151252671 way "Jupiter's, 1350, Smith Avenue, Mt Washington Mill, Baltimore, Maryland, 21209, United States" amenity restaurant 0.001 United States FALSE
+kahea us Americas Northern America FALSE 1 2021-02-03 89134590 way "Kahea Street, Makakilo Heights, Kapolei, Honolulu County, Hawaii, 96707, United States" highway residential 0.2 United States FALSE
+kaiser foundation health plan us Americas Northern America FALSE 1 2021-02-03 212439225 way "Kaiser Foundation Hospital, Modesto Helipad, Health Care Way, Modesto, Stanislaus County, California, 95368, United States" aeroway helipad 0.301 United States FALSE
+kaiser foundation hospitals us Americas Northern America FALSE 1 2021-02-03 195863008 way "MetroHealth Parma Medical Office, 12031, Snow Road, Parma, Cuyahoga County, Ohio, 44130, United States" amenity hospital 0.001 United States FALSE
+kellogg biological station us Americas Northern America FALSE 1 2021-02-03 2299744 node "Kellogg Biological Preserve, Emmett Charter Township, Calhoun County, Michigan, 49014, United States" leisure park 0.35 United States FALSE
+kellys us Americas Northern America FALSE 1 2021-02-03 239282811 way "The Kelly's, Edina, Hennepin County, Minnesota, United States" landuse residential 0.2 United States FALSE
+kenyon college us Americas Northern America FALSE 1 2021-02-03 174692957 way "Kenyon College, Gambier Road, Gambier, College Township, Knox County, Ohio, 43022, United States" amenity college 0.640956111033812 United States FALSE
+ketchum us Americas Northern America FALSE 1 2021-02-03 257781466 relation "Ketchum, Blaine County, Idaho, 83340, United States" boundary administrative 0.49577998822869 United States FALSE
+kibble us Americas Northern America FALSE 1 2021-02-03 2423509 node "Kibble Hill, Monroe County, West Virginia, United States" natural peak 0.4 United States FALSE
+kic us Americas Northern America FALSE 1 2021-02-03 101634590 way "Mesa Del Rey Airport, Bitterwater Road, King City, Monterey County, California, 93930, United States" aeroway aerodrome 0.18463416789672 United States FALSE
+kids us Americas Northern America FALSE 1 2021-02-03 123412820 way "Kids, Gunnison County, Colorado, 81230, United States" highway path 0.175 United States FALSE
+king juan carlos university us Americas Northern America FALSE 1 2021-02-03 152402826 way "King Juan Carlos I of Spain Center, 54, Washington Square South, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States" building university 0.301 United States FALSE
+king kong us Americas Northern America FALSE 1 2021-02-03 89019482 way "King Kong, Bexar County, Texas, 78236, United States" highway residential 0.3 United States FALSE
+kings us Americas Northern America FALSE 1 2021-02-03 258002610 relation "Kings County, California, United States" boundary administrative 0.648553789525574 United States FALSE
+kingsbrook jewish medical center us Americas Northern America FALSE 1 2021-02-03 209315997 way "Kingsbrook Jewish Medical Center, 585, Schenectady Avenue, East Flatbush, Brooklyn, Kings County, New York, 11203, United States" amenity hospital 0.653363019766637 United States FALSE
+korean studies us Americas Northern America FALSE 1 2021-02-03 259381167 relation "Center for Korean Studies, 1881, East West Road, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" building university 0.201 United States FALSE
+kqed us Americas Northern America FALSE 1 2021-02-03 45347963 node "KQED, 50, West San Fernando Street, Downtown Historic District, San Jose, Santa Clara County, California, 95110, United States" amenity studio 0.439805842395375 United States FALSE
+ksu us Americas Northern America FALSE 1 2021-02-03 134730614 way "Kent State University, Health Center Drive, Kent, Portage County, Ohio, 44242-0001, United States" amenity university 0.481992451472996 United States FALSE
+kuhlman us Americas Northern America FALSE 1 2021-02-03 427205 node "Kuhlman, Highlands County, Florida, 33872:33875, United States" place hamlet 0.35 United States FALSE
+l-1 us Americas Northern America FALSE 1 2021-02-03 177817604 way "L-1, Palm Beach County, Florida, 33417, United States" waterway canal 0.45 United States FALSE
+la jolla institute of immunology us Americas Northern America FALSE 1 2021-02-03 149701516 way "La Jolla Institute for Allergy and Immunology, Athena Circle, Science Research Park, University City, San Diego, San Diego County, California, 92039, United States" building university 0.401 United States FALSE
+la parguera us Americas Northern America FALSE 1 2021-02-03 51134028 node "La Parguera, Parguera, Lajas, Puerto Rico, United States" place suburb 0.475 United States FALSE
+labcorp us Americas Northern America FALSE 1 2021-02-03 209061591 way "LabCorp, Burlington, Alamance County, North Carolina, United States" highway residential 0.2 United States FALSE
+laboratory of virology us Americas Northern America FALSE 1 2021-02-03 133911148 way "Primate Virology & Immunology Laboratory, 188, County Road 98, Plainfield, Davis, Yolo County, California, 95616, United States" building university 0.201 United States FALSE
+lafayette college us Americas Northern America FALSE 1 2021-02-03 259082367 relation "Lafayette College, 730, High Street, College Hill, Easton, Northampton County, Pennsylvania, 18042, United States" amenity university 0.659772446157665 United States FALSE
+lake mercer us Americas Northern America FALSE 1 2021-02-03 258399251 relation "Grand Lake–Saint Marys, Montezuma, Mercer County, Ohio, 45822, United States" natural water 0.522734482343971 United States FALSE
+langone medical center us Americas Northern America FALSE 1 2021-02-03 125494622 way "NYU Langone Medical Center, East 30th Street, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10016, United States" amenity hospital 0.653159798268413 United States FALSE
+large binocular telescope observatory us Americas Northern America FALSE 1 2021-02-03 104893463 way "Large Binocular Telescope, Mount Graham International Observatory Road, Old Columbine, Graham County, Arizona, United States" man_made observatory 0.829506969685059 United States FALSE
+larsen c us Americas Northern America FALSE 1 2021-02-03 445188 node "Larsen, Jacksonville, Duval County, Florida, 32207, United States" place hamlet 0.45 United States FALSE
+lawrence university us Americas Northern America FALSE 1 2021-02-03 258589542 relation "Lawrence University, 711, East Boldt Way, Appleton, Outagamie County, Wisconsin, 54911, United States" amenity university 0.624872581583534 United States FALSE
+lb myrtle us Americas Northern America FALSE 1 2021-02-03 89847089 way "Myrtle, Houston, Harris County, Texas, 77054, United States" highway residential 0.2 United States FALSE
+lee university us Americas Northern America FALSE 1 2021-02-03 217690083 way "Lee University, North Ocoee Street, Cleveland, Bradley County, Tennessee, 37311, United States" amenity university 0.562774714414326 United States FALSE
+lehigh university us Americas Northern America FALSE 1 2021-02-03 2597738 node "Lehigh University, Library Drive, Sayre Park, Bethlehem, Northampton County, Pennsylvania, 18015, United States" amenity school 0.201 United States FALSE
+lehman college of the city university of new york us Americas Northern America FALSE 1 2021-02-03 107135502 way "Lehman College of the City University of New York, 250, Bedford Park Boulevard West, The Bronx, Bronx County, New York, 10468, United States" amenity university 1.2697288539961 United States FALSE
+lena foundation us Americas Northern America FALSE 1 2021-02-03 26990642 node "LENA Research Foundation, 5525, Central Avenue, Boulder, Boulder County, Colorado, 80301, United States" office research 0.201 United States FALSE
+life sciences us Americas Northern America FALSE 1 2021-02-03 252383599 way "Life Sciences, Suffolk County, New York, 11794-5252, United States" highway footway 0.275 United States FALSE
+lifelong medical care us Americas Northern America FALSE 1 2021-02-03 52123935 node "Lifelong Medical Care, 11th Street, Iron Triangle, Richmond, Contra Costa County, California, 94801, United States" amenity clinic 0.301 United States FALSE
+lille university hospital us Americas Northern America FALSE 1 2021-02-03 169772928 way "Friedberg Lifelong Learning Center (LL-31C), West University Drive, Boca Raton, Palm Beach County, Florida, 33431, United States" building university 0.101 United States FALSE
+lincoln park zoo us Americas Northern America FALSE 1 2021-02-03 258697898 relation "Lincoln Park Zoo, 2001, North Clark Street, Belgravia Terrace, Lincoln Park, Chicago, Cook County, Illinois, 60614, United States" tourism zoo 0.635161875786798 United States FALSE
+llnl us Americas Northern America FALSE 1 2021-02-03 95865246 way "Lawrence Livermore National Laboratory, South Vasco Road, Livermore, Alameda County, California, 94550, United States" amenity science_park 0.493328255224182 United States FALSE
+local motors us Americas Northern America FALSE 1 2021-02-03 51604923 node "Local Motors, 151, Saint George Boulevard, National Harbor, Potomac Vista, Fort Washington, Prince George's County, Maryland, 20745, United States" office company 0.201 United States FALSE
+lockheed us Americas Northern America FALSE 1 2021-02-03 87602610 way "Lockheed, Willow Park, Parker County, Texas, United States" highway residential 0.2 United States FALSE
+lockheed martin of denver us Americas Northern America FALSE 1 2021-02-03 69800309 node "Lockheed Martin, North Mathilda Avenue, Sunnyvale, Santa Clara County, California, 94089, United States" railway station 0.51689306175332 United States FALSE
+loma linda university us Americas Northern America FALSE 1 2021-02-03 244288874 way "Loma Linda University, Tulip Avenue, Loma Linda, San Bernardino County, California, 92350, United States" amenity university 0.301 United States FALSE
+long island university us Americas Northern America FALSE 1 2021-02-03 142291190 way "The Island, 4213, 5th Avenue Northeast, University District, Seattle, King County, Washington, 98105, United States" building yes 0.201 United States FALSE
+los alamos us Americas Northern America FALSE 1 2021-02-03 257505561 relation "Los Alamos, Los Alamos County, New Mexico, United States" boundary administrative 0.677156057530702 United States FALSE
+los angeles county superior court us Americas Northern America FALSE 1 2021-02-03 19959088 node "Los Angeles County Superior Court, South Commonwealth Avenue, Westlake, Los Angeles, Los Angeles County, California, 90005, United States" amenity courthouse 0.501 United States FALSE
+los angeles times us Americas Northern America FALSE 1 2021-02-03 258868206 relation "Los Angeles Times, 202, South Spring Street, Historic Core District, Downtown, Los Angeles, Los Angeles County, California, 90013, United States" office newspaper 0.503130333992136 United States FALSE
+louisiana state university in baton rouge us Americas Northern America FALSE 1 2021-02-03 100338394 way "Louisiana State University, West Lakeshore Drive, College Town, Baton Rouge, East Baton Rouge Parish, Louisiana, 70802, United States" amenity university 1.05035884372188 United States FALSE
+loyola university chicago us Americas Northern America FALSE 1 2021-02-03 259482995 relation "Loyola University Chicago, 1032, West Sheridan Road, Rogers Park, Chicago, Rogers Park Township, Cook County, Illinois, 60660, United States" amenity university 0.78906723611033 United States FALSE
+loyola university medical center us Americas Northern America FALSE 1 2021-02-03 134129591 way "Loyola University Medical Center, 2160, South 1st Avenue, Maywood, Proviso Township, Cook County, Illinois, 60153, United States" amenity hospital 0.661844955490085 United States FALSE
+loyola university of chicago us Americas Northern America FALSE 1 2021-02-03 123418197 way "Loyola University Water Tower Campus, North Rush Street, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States" amenity university 0.78906723611033 United States FALSE
+lunar planetary institute us Americas Northern America FALSE 1 2021-02-03 2467172 node "Lunar and Planetary Institute Rice University, West Oaks Drive, Pasadena, Harris County, Texas, 77058, United States" amenity school 0.301 United States FALSE
+lyft us Americas Northern America FALSE 1 2021-02-03 157118156 way "Lyft, 26th Street, Potrero Terrace, San Francisco, San Francisco City and County, California, 94124, United States" building yes 0.101 United States FALSE
+macchiarini us Americas Northern America FALSE 1 2021-02-03 106996300 way "Peter Macchiarini Steps, Telegraph Hill, San Francisco, San Francisco City and County, California, 94113, United States" highway steps 0.175 United States FALSE
+magdalena ridge observatory us Americas Northern America FALSE 1 2021-02-03 210665019 way "Magdalena Ridge Observatory 2.4 m Telescope, Water Canyon Road, Socorro County, New Mexico, United States" man_made telescope 0.301 United States FALSE
+magee-womens research institute us Americas Northern America FALSE 1 2021-02-03 174580335 way "Magee-Womens Research Institute, 204, Craft Avenue, South Oakland, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States" building apartments 0.401 United States FALSE
+maharishi university of management us Americas Northern America FALSE 1 2021-02-03 232195936 way "Maharishi International University, 1000, North 4th Street, Fairfield, Jefferson County, Iowa, 52557, United States" amenity university 0.201 United States FALSE
+manchester university us Americas Northern America FALSE 1 2021-02-03 182019486 way "Manchester University, 604, East College Avenue, North Manchester, Wabash County, Indiana, 46962, United States" amenity university 0.534623598134972 United States FALSE
+manufacturing usa us Americas Northern America FALSE 1 2021-02-03 234440084 way "Zippo Manufacturing Company, Bradford Township, McKean County, Pennsylvania, United States" landuse industrial 0.492802990599768 United States FALSE
+marine policy center us Americas Northern America FALSE 1 2021-02-03 108710790 way "Bush River Yacht Club, 4001, East Baker Avenue, Wildwood, Harford County, Maryland, 21009, United States" leisure marina 0.001 United States FALSE
+marine research us Americas Northern America FALSE 1 2021-02-03 26002868 node "West Marine, Research Boulevard, North Crossing, Austin, Travis County, Texas, 78752, United States" shop boat 0.201 United States FALSE
+marquette university us Americas Northern America FALSE 1 2021-02-03 258967349 relation "Marquette University, West Canal Street, Menomonee River Valley, Milwaukee, Milwaukee County, Wisconsin, 53208, United States" amenity university 0.69509364958047 United States FALSE
+marriott harrison us Americas Northern America FALSE 1 2021-02-03 210483963 way "Marriott Renaissance, Hutchinson River Parkway, Town of Harrison, New York, 10577, United States" tourism hotel 0.201 United States FALSE
+mary lyon centre us Americas Northern America FALSE 1 2021-02-03 684057 node "Mary Lyon, 50, Beechcroft Street, Faneuil, Brighton, Boston, Suffolk County, Massachusetts, 02135, United States" amenity school 0.201 United States FALSE
+mason inman us Americas Northern America FALSE 1 2021-02-03 223001264 way "Mason Road, Pleasent Meadows Apartments, Inman, Spartanburg County, South Carolina, 29349, United States" highway residential 0.3 United States FALSE
+mass. us Americas Northern America FALSE 1 2021-02-03 258278823 relation "Massachusetts, United States" boundary administrative 0.836449761303479 United States FALSE
+massachusetts institute of technology in cambridge us Americas Northern America FALSE 1 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 1.24674262776464 United States FALSE
+massachusetts institute of technology lincoln laboratory us Americas Northern America FALSE 1 2021-02-03 20038570 node "Massachusetts Institute of Technology Lincoln Laboratory, 244, Wood Street, Lexington, Middlesex County, Massachusetts, 01731, United States" building industrial 0.601 United States FALSE
+massachusetts of technology us Americas Northern America FALSE 1 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 0.946742627764641 United States FALSE
+masten space systems us Americas Northern America FALSE 1 2021-02-03 82389889 node "Masten Space Systems, 1570, Sabovich Street, Mojave, Kern County, California, 93501, United States" office company 0.644815486121403 United States FALSE
+masten space systems of mojave us Americas Northern America FALSE 1 2021-02-03 82389889 node "Masten Space Systems, 1570, Sabovich Street, Mojave, Kern County, California, 93501, United States" office company 0.744815486121403 United States FALSE
+mbl us Americas Northern America FALSE 1 2021-02-03 133977853 way "Manistee County-Blacker Airport, Chippewa Highway, Manistee Township, Manistee County, Michigan, 49660, United States" aeroway aerodrome 0.252344279227432 United States FALSE
+mcafee us Americas Northern America FALSE 1 2021-02-03 98813875 way "McAfee, Mission College Boulevard, Santa Clara, Santa Clara County, California, 95054-1231, United States" building yes 0.566266067536779 United States FALSE
+mcgovern institute for brain research us Americas Northern America FALSE 1 2021-02-03 488056 node "McGovern Institute for Brain Research (MIT), 43, Vassar Street, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" amenity research_institute 0.810037958989748 United States FALSE
+mclean hospital us Americas Northern America FALSE 1 2021-02-03 200768064 way "McLean Hospital, 115, Mill Street, Kendall Gardens, Belmont, Middlesex County, Massachusetts, 02478, United States" amenity hospital 0.526548011937258 United States FALSE
+media lab us Americas Northern America FALSE 1 2021-02-03 133210918 way "E14 - Media Lab, 75, Amherst Street, Cambridge, Middlesex County, Massachusetts, 02139, United States" building university 0.201 United States FALSE
+medical college of wisconsin us Americas Northern America FALSE 1 2021-02-03 223514733 way "Medical College of Wisconsin, 8701, East Connell Court, Wauwatosa, Milwaukee County, Wisconsin, 53226, United States" amenity university 0.755899467051989 United States FALSE
+meharry medical college us Americas Northern America FALSE 1 2021-02-03 195325955 way "Meharry Medical College, 1005, Dr D B Todd Jr Boulevard, Nashville-Davidson, Davidson County, Tennessee, 37208, United States" amenity university 0.301 United States FALSE
+merck & co. us Americas Northern America FALSE 1 2021-02-03 299016689 node "Merck & Co., 4633, Merck Road, Finch Mill, Wilson, Wilson County, North Carolina, 27893, United States" amenity pharmacy 0.201 United States FALSE
+"merck, johnson & johnson" us Americas Northern America FALSE 1 2021-02-03 210048712 way "Merck Campus, De Soto, Johnson County, Kansas, United States" landuse industrial 0.5 United States FALSE
+merrimack pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 43463000 node "Merrimack Pharmaceuticals, 1, Broadway, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity research_institute 0.201 United States FALSE
+methodist hospital us Americas Northern America FALSE 1 2021-02-03 170349304 way "Methodist Hospital, 2301, South Broad Street, South Philadelphia, Philadelphia, Philadelphia County, Pennsylvania, 19145, United States" amenity hospital 0.341913844040538 United States FALSE
+metropolitan state university of denver us Americas Northern America FALSE 1 2021-02-03 20321803 node "Metropolitan State University of Denver, Lawrence Street Mall, Auraria, Denver, Denver County, Colorado, 80217, United States" amenity university 0.851537799411788 United States FALSE
+mexican national forest commission us Americas Northern America FALSE 1 2021-02-03 69476412 node "San Antonio and Mexican Gulf Railroad, FM 1090, Port Lavaca, Calhoun County, Texas, 77979, United States" tourism information 0.101 United States FALSE
+miami university of ohio in oxford us Americas Northern America FALSE 1 2021-02-03 134890642 way "Miami University, McKee Avenue, Oxford, Oxford Township, Butler County, Ohio, 45056, United States" amenity university 0.901832830623064 United States FALSE
+micron technology us Americas Northern America FALSE 1 2021-02-03 139763063 way "Micron Technology, Boise, Ada County, Idaho, United States" landuse industrial 0.4 United States FALSE
+military college of south carolina us Americas Northern America FALSE 1 2021-02-03 195543970 way "The Citadel, 171, Moultrie Street, Charleston, Charleston County, South Carolina, 29409, United States" amenity university 0.631222267761364 United States FALSE
+millipore us Americas Northern America FALSE 1 2021-02-03 202253346 way "Millipore, 11, Prescott Road, Squantum, Jaffrey, Cheshire County, New Hampshire, 03452, United States" building commercial 0.101 United States FALSE
+millipore sigma us Americas Northern America FALSE 1 2021-02-03 259388950 relation "Millipore Sigma, North Harrison Road, Pleasant Gap, Spring Township, Centre County, Pennsylvania, 16823, United States" building commercial 0.201 United States FALSE
+minnesota department of natural resources us Americas Northern America FALSE 1 2021-02-03 79363327 node "Minnesota Department of Natural Resources, County Road 21, Jameson, Ranier, Koochiching County, Minnesota, 56649, United States" office government 0.501 United States FALSE
+minnesota state fair us Americas Northern America FALSE 1 2021-02-03 86373774 way "Minnesota Avenue, Fair Oaks, Sacramento County, California, 95628-7416, United States" highway residential 0.4 United States FALSE
+miss us Americas Northern America FALSE 1 2021-02-03 258375642 relation "Mississippi, United States" boundary administrative 0.800391778545257 United States FALSE
+missile defense agency us Americas Northern America FALSE 1 2021-02-03 123924708 way "Missile Defense Agency, 18th Street, Fort Belvoir South Post, Fort Belvoir, Fairfax County, Virginia, 22060, United States" building yes 0.301 United States FALSE
+mission blue us Americas Northern America FALSE 1 2021-02-03 258451463 relation "Mission, Umatilla County, Oregon, United States" boundary administrative 0.424032054467804 United States FALSE
+missouri university of science and technology us Americas Northern America FALSE 1 2021-02-03 259052765 relation "Missouri University of Science and Technology, North Walker Avenue, Rolla, Phelps County, Missouri, 65409, United States" amenity university 1.00078255314529 United States FALSE
+mit press us Americas Northern America FALSE 1 2021-02-03 63902179 node "The MIT Press Bookstore, 297, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" shop books 0.201 United States FALSE
+mit press of cambridge us Americas Northern America FALSE 1 2021-02-03 63902179 node "The MIT Press Bookstore, 297, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" shop books 0.301 United States FALSE
+mitre corporation us Americas Northern America FALSE 1 2021-02-03 103399470 way "The MITRE Corporation, 202, Burlington Road, Bedford, Middlesex County, Massachusetts, 01730, United States" building office 0.201 United States FALSE
+mo us Americas Northern America FALSE 1 2021-02-03 258150217 relation "Missouri, United States" boundary administrative 0.73288134470033 United States FALSE
+mo. us Americas Northern America FALSE 1 2021-02-03 258150217 relation "Missouri, United States" boundary administrative 0.73288134470033 United States FALSE
+moe us Americas Northern America FALSE 1 2021-02-03 258150217 relation "Missouri, United States" boundary administrative 0.73288134470033 United States FALSE
+molecular ecology us Americas Northern America FALSE 1 2021-02-03 257345614 way "Wildlife Molecular Ecology Office, 2322, Mowry Road, Gainesville, Alachua County, Florida, 32611, United States" office research 0.201 United States FALSE
+molycorp us Americas Northern America FALSE 1 2021-02-03 174420277 way "Molycorp Evaporation Ponds, San Bernardino County, California, United States" landuse disused:industrial 0.3 United States FALSE
+monell us Americas Northern America FALSE 1 2021-02-03 370315 node "Monell, Sweetwater County, Wyoming, United States" place hamlet 0.35 United States FALSE
+montana state us Americas Northern America FALSE 1 2021-02-03 258349675 relation "Montana, United States" boundary administrative 0.901736049923475 United States FALSE
+morehouse school of medicine us Americas Northern America FALSE 1 2021-02-03 296931474 node "Morehouse School of Medicine, 720, Westview Drive Southwest, Joel Chandler Harris Homes, Atlanta, Fulton County, Georgia, 30310, United States" amenity university 0.740791981823335 United States FALSE
+morgan mitchell us Americas Northern America FALSE 1 2021-02-03 2475110 node "Morgan Peak, Mitchell County, Texas, 79565, United States" natural peak 0.5 United States FALSE
+mote marine laboratory us Americas Northern America FALSE 1 2021-02-03 73893475 node "Mote Marine Laboratory and Aquarium, 1600, Ken Thompson Parkway, Sarasota, Sarasota County, Florida, 34236, United States" tourism museum 0.301 United States FALSE
+mothers against drunk driving us Americas Northern America FALSE 1 2021-02-03 55217955 node "Mothers Against Drunk Driving, Del Prado Boulevard South, Cape Coral, Lee County, Florida, 33990, United States" office association 0.401 United States FALSE
+mount discovery us Americas Northern America FALSE 1 2021-02-03 2597020 node "Mount Discovery, Essex County, New York, 12950, United States" natural peak 0.5 United States FALSE
+mount holyoke college us Americas Northern America FALSE 1 2021-02-03 96922935 way "Mount Holyoke College, Ferry Street, South Hadley, Hampshire County, Massachusetts, 01075, United States" amenity college 0.761796795268744 United States FALSE
+mount sinai medical center us Americas Northern America FALSE 1 2021-02-03 167167559 way "Mount Sinai Medical Center, 4300, Alton Road, Miami Beach, Miami-Dade County, Florida, 33140, United States" amenity hospital 0.633228686818865 United States FALSE
+ms us Americas Northern America FALSE 1 2021-02-03 258375642 relation "Mississippi, United States" boundary administrative 0.700391778545257 United States FALSE
+msu us Americas Northern America FALSE 1 2021-02-03 165822886 way "Montana State University, West College Street, Bozeman, Gallatin County, Montana, 59715, United States" amenity university 0.429796188420265 United States FALSE
+multiple sclerosis foundation us Americas Northern America FALSE 1 2021-02-03 57425651 node "Multiple Sclerosis Foundation, 6520, North Andrews Avenue, Fort Lauderdale, Broward County, Florida, 33309, United States" office company 0.301 United States FALSE
+museum of natural history us Americas Northern America FALSE 1 2021-02-03 2968697 node "Museum of Natural History, 17, North Clinton Street, Iowa City, Johnson County, Iowa, 52245, United States" tourism museum 0.659145294756841 United States FALSE
+nasa federal credit union us Americas Northern America FALSE 1 2021-02-03 74145150 node "NASA Federal Credit Union, 2452, Solomons Island Road, Dorsey Heights, Parole, Anne Arundel County, Maryland, 20776:21037, United States" amenity bank 0.401 United States FALSE
+nasa headquarters us Americas Northern America FALSE 1 2021-02-03 103417943 way "National Aeronautics and Space Administration Headquarters, E Street Southwest, Southwest Employment Area, Washington, District of Columbia, 20546, United States" office government 0.101 United States FALSE
+nashville zoo us Americas Northern America FALSE 1 2021-02-03 7117976 node "Croft House, Elysian Fields Road, Paragon Mills, Nashville-Davidson, Davidson County, Tennessee, 37211, United States" tourism museum 0.101 United States FALSE
+national agency us Americas Northern America FALSE 1 2021-02-03 258146830 relation "Agency, Wapello County, Iowa, 52530, United States" boundary administrative 0.53283621062172 United States FALSE
+national bureau of economic research us Americas Northern America FALSE 1 2021-02-03 97970473 way "National Bureau of Economic Research, 1050, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02138, United States" building yes 0.934032993844314 United States FALSE
+national center for genome resources in santa fe us Americas Northern America FALSE 1 2021-02-03 234806388 way "National Center for Genome Resources, Santa Fe, Santa Fe County, New Mexico, United States" landuse commercial 0.9 United States FALSE
+national center for health research us Americas Northern America FALSE 1 2021-02-03 182466192 way "CHER, West 2nd Street, Morehead, Rowan County, Kentucky, 40351, United States" building school 0.001 United States FALSE
+national climate service us Americas Northern America FALSE 1 2021-02-03 78587650 node "Climate, 5282, Monahans Avenue, The Shops at Clearfork, Fort Worth, Tarrant County, Texas, 76109, United States" shop sports 0.101 United States FALSE
+national comprehensive cancer center us Americas Northern America FALSE 1 2021-02-03 170461892 way "Comprehensive Cancer Center, 340, Exempla Circle, Lafayette, Boulder County, Colorado, 80026, United States" office yes 0.301 United States FALSE
+national energy research scientific computing center us Americas Northern America FALSE 1 2021-02-03 167787512 way "National Energy Research Scientific Computing Center (NERSC), Cyclotron Road, Northside, Berkeley, Alameda County, California, 94720, United States" building yes 0.601 United States FALSE
+national engineering technology research center us Americas Northern America FALSE 1 2021-02-03 105357679 way "Engineering Systems Building, Technology Trail, GE Global Research Center, Niskayuna, Schenectady County, New York, 12309, United States" building industrial 0.401 United States FALSE
+national foundation us Americas Northern America FALSE 1 2021-02-03 49534292 node "Foundation, Monahans, Ward County, Texas, 79756, United States" place neighbourhood 0.35 United States FALSE
+national geographic society us Americas Northern America FALSE 1 2021-02-03 104285798 way "National Geographic Society, Sumner Row, Golden Triangle, Washington, District of Columbia, 20006-5346, United States" building government 0.85218387169211 United States FALSE
+national heart us Americas Northern America FALSE 1 2021-02-03 356190 node "Heart, Fulton County, Arkansas, 72539, United States" place hamlet 0.35 United States FALSE
+national hurricane center us Americas Northern America FALSE 1 2021-02-03 212513790 way "National Hurricane Center, Miami-Dade County, Florida, 33199, United States" highway service 0.375 United States FALSE
+national institute of food and agriculture us Americas Northern America FALSE 1 2021-02-03 102637103 way "National Institute of Food and Agriculture, Waterfront Centre, 9th Street Southwest, Southwest Waterfront, Washington, District of Columbia, 20024, United States" building yes 0.906728041583383 United States FALSE
+national intelligence us Americas Northern America FALSE 1 2021-02-03 23760341 node "Intelligence, Babson Boulder Trail, Gloucester, Essex County, Massachusetts, 01930-3540, United States" historic archaeological_site 0.101 United States FALSE
+national kidney foundation us Americas Northern America FALSE 1 2021-02-03 8481622 node "National Kidney Foundation, 100, North Main Street, Keister Addition, Blacksburg, Montgomery County, Virginia, 24060-7401, United States" office association 0.301 United States FALSE
+national library of medicine us Americas Northern America FALSE 1 2021-02-03 100564321 way "NLM, 8600, Rockville Pike, Glenbrook, East Bethesda, Bethesda, Montgomery County, Maryland, 20894, United States" amenity library 0.574397490815619 United States FALSE
+national nuclear laboratory us Americas Northern America FALSE 1 2021-02-03 3063674 node "Vallecitos Nuclear Center, Vallecitos Road, Alameda County, California, 94586, United States" building yes 0.469114061872155 United States FALSE
+national reconnaissance office us Americas Northern America FALSE 1 2021-02-03 153231959 way "National Reconnaissance Office, Fairfax County, Virginia, United States" landuse military 0.790008541274048 United States FALSE
+national renewable energy laboratory us Americas Northern America FALSE 1 2021-02-03 136641314 way "Solar Energy Research Facility, Denver West Parkway, Pleasant View, Jefferson County, Colorado, 80401-4015, United States" building yes 0.101 United States FALSE
+national research centre us Americas Northern America FALSE 1 2021-02-03 123856183 way "National Research Center, 30th Street, Boulder, Boulder County, Colorado, 80304, United States" building office 0.201 United States FALSE
+national science library us Americas Northern America FALSE 1 2021-02-03 124347967 way "Brown University Sciences Library, 101-109, Thayer Street, College Hill, Providence, Providence County, Rhode Island, 02912, United States" amenity library 0.474532111506442 United States FALSE
+national wildlife federation us Americas Northern America FALSE 1 2021-02-03 232820332 way "National Wildlife Federation, Business Center Drive, Pinecrest, Reston, Fairfax County, Virginia, 20190, United States" man_made works 0.301 United States FALSE
+natural sciences us Americas Northern America FALSE 1 2021-02-03 205619227 way "Natural Sciences, 34th Avenue, Phoenix, Maricopa County, Arizona, 85019, United States" building yes 0.201 United States FALSE
+nature center us Americas Northern America FALSE 1 2021-02-03 107104919 way "Nature Center, Mendon, Monroe County, New York, United States" landuse construction 0.4 United States FALSE
+nature news us Americas Northern America FALSE 1 2021-02-03 95688403 way "Sandy Bottom Nature Park, 1255, Morrison, Hampton, Newport News, Virginia, 23666, United States" boundary national_park 0.325 United States FALSE
+nau us Americas Northern America FALSE 1 2021-02-03 138822770 way "Northern Arizona University, South Beaver Street, Flagstaff Normal Addition, Flagstaff, Coconino County, Arizona, 86001, United States" amenity university 0.451100009026849 United States FALSE
+navajo nation reservation us Americas Northern America FALSE 1 2021-02-03 259240483 relation "Navajo Nation, United States" boundary aboriginal_lands 0.692311230103081 United States FALSE
+naval postgraduate school us Americas Northern America FALSE 1 2021-02-03 199378988 way "US Naval Postgraduate School, 1, Del Monte, Monterey, Monterey County, California, 93943, United States" landuse military 0.5 United States FALSE
+ncsu us Americas Northern America FALSE 1 2021-02-03 2661843 node "NCSU Pond Number One Dam, Wake County, North Carolina, 27603-2668, United States" waterway dam 0.35 United States FALSE
+ne us Americas Northern America FALSE 1 2021-02-03 257963338 relation "Nebraska, United States" boundary administrative 0.799657112825905 United States FALSE
+netflix us Americas Northern America FALSE 1 2021-02-03 169311000 way "Netflix, 3175, Northeast Aloclek Drive, East Hillsboro, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, 97124, United States" office company 0.101 United States FALSE
+new bedford whaling museum us Americas Northern America FALSE 1 2021-02-03 142269179 way "New Bedford Whaling Museum, 18, Johnny Cake Hill, New Bedford, Bristol County, Massachusetts, 02740, United States" tourism museum 0.660958143076972 United States FALSE
+new harvest us Americas Northern America FALSE 1 2021-02-03 176266386 way "New Harvest, Spruce Street, Spruce Hill, Philadelphia, Philadelphia County, Pennsylvania, 19139, United States" amenity fast_food 0.201 United States FALSE
+new jersey institute of technology us Americas Northern America FALSE 1 2021-02-03 185826691 way "New Jersey Institute of Technology, Wickliffe Street, University Heights, Newark, Essex County, New Jersey, 07103, United States" amenity university 0.913510524610342 United States FALSE
+new madrid us Americas Northern America FALSE 1 2021-02-03 258032415 relation "New Madrid County, Missouri, United States" boundary administrative 0.712205972002166 United States FALSE
+new york institute of technology us Americas Northern America FALSE 1 2021-02-03 214578329 way "New York Institute of Technology, North Hempstead Turnpike, Old Westbury, Oyster Bay, Nassau County, New York, 11548, United States" amenity university 0.501 United States FALSE
+new york stock exchange us Americas Northern America FALSE 1 2021-02-03 158002696 way "New York Stock Exchange, 11, Wall Street, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10005, United States" tourism attraction 0.401 United States FALSE
+new york university medical center us Americas Northern America FALSE 1 2021-02-03 158641184 way "New York University Medical Center, East 38th Street, Murray Hill, Manhattan Community Board 6, Manhattan, New York County, New York, 10016, United States" amenity clinic 0.501 United States FALSE
+newhall us Americas Northern America FALSE 1 2021-02-03 257449480 relation "Newhall, Benton County, Iowa, United States" boundary administrative 0.53504820152981 United States FALSE
+nicholls state university us Americas Northern America FALSE 1 2021-02-03 100200943 way "Nicholls State University, 906, East 1st Street, Thibodaux, Lafourche Parish, Louisiana, 70301, United States" amenity university 0.69394918828843 United States FALSE
+nightingale us Americas Northern America FALSE 1 2021-02-03 439499 node "Nightingale, Frederick County, Maryland, 21774, United States" place hamlet 0.35 United States FALSE
+nih clinical center us Americas Northern America FALSE 1 2021-02-03 101358622 way "NIH Clinical Center, 10, Center Drive, National Institutes of Health, Maplewood, Bethesda, Montgomery County, Maryland, 20892, United States" building hospital 0.615064072959253 United States FALSE
+nlm us Americas Northern America FALSE 1 2021-02-03 100564321 way "NLM, 8600, Rockville Pike, Glenbrook, East Bethesda, Bethesda, Montgomery County, Maryland, 20894, United States" amenity library 0.674397490815619 United States FALSE
+nmfs us Americas Northern America FALSE 1 2021-02-03 248605045 way "NMFS, Cottage Street, Fort Trumbull, Milford, New Haven County, Connecticut, 06461, United States" building service 0.101 United States FALSE
+nomad us Americas Northern America FALSE 1 2021-02-03 259247036 relation "NoMad, Manhattan Community Board 5, Manhattan, New York County, New York, United States" boundary administrative 0.429555066820797 United States FALSE
+non-noaa us Americas Northern America FALSE 1 2021-02-03 248632258 way "NOAA, Pascagoula, Jackson County, Mississippi, 39567, United States" highway tertiary 0.2 United States FALSE
+north carolina department of environmental quality us Americas Northern America FALSE 1 2021-02-03 220675454 way "Department of Environmental Quality, Aspen Street, Helena, Lewis and Clark County, Montana, 59602-1217, United States" office government 0.401 United States FALSE
+northern illinois university us Americas Northern America FALSE 1 2021-02-03 192458528 way "Northern Illinois University, Stadium Drive, DeKalb, DeKalb County, Illinois, 60115, United States" amenity university 0.301 United States FALSE
+northridge us Americas Northern America FALSE 1 2021-02-03 345694 node "Northridge, Los Angeles, Los Angeles County, California, 91324, United States" place suburb 0.518973378442822 United States FALSE
+northwest fisheries science center us Americas Northern America FALSE 1 2021-02-03 173032772 way "Northwest Fisheries Science Center, 2725, Montlake Boulevard East, Montlake, Seattle, King County, Washington, 98112, United States" office government 0.401 United States FALSE
+northwest research associates us Americas Northern America FALSE 1 2021-02-03 2985973 node "Santa Barbara County Building;Lompoc Museum;Lompoc Museum Associates Research Library, 200, South H Street, Lompoc, Santa Barbara County, California, 93436, United States" tourism museum 0.328160971568546 United States FALSE
+npa us Americas Northern America FALSE 1 2021-02-03 10613845 node "Pensacola Naval Air Station/Forrest Sherman Field, Skyhawk Drive, Pensacola, Escambia County, Florida, 32508, United States" aeroway aerodrome 0.426476718565125 United States FALSE
+npr us Americas Northern America FALSE 1 2021-02-03 49983705 node "WVXU 91.7 FM, Central Parkway, Betts-Longworth Historic District, West End, Cincinnati, Hamilton County, Ohio, 45210, United States" amenity studio 0.299997827209804 United States FALSE
+nrao us Americas Northern America FALSE 1 2021-02-03 299024599 relation "Green Bank Observatory, ICB Road, Green Bank, Pocahontas County, West Virginia, 24944, United States" amenity research_institute 0.001 United States FALSE
+nrg us Americas Northern America FALSE 1 2021-02-03 6784494 node "NRG, 3600, South Broad Street, Packer Park, South Philadelphia, Philadelphia, Philadelphia County, Pennsylvania, 19112, United States" railway station 0.401865618613023 United States FALSE
+nrg energy us Americas Northern America FALSE 1 2021-02-03 226847874 way "NRG Energy Fly Ash Landfill, Tonawanda, Erie County, New York, United States" landuse landfill 0.4 United States FALSE
+nsa us Americas Northern America FALSE 1 2021-02-03 135361590 way "National Security Agency, Anne Arundel County, Maryland, United States" landuse government 0.566177100706018 United States FALSE
+nucor us Americas Northern America FALSE 1 2021-02-03 132810990 way "Nucor Steel, Montgomery County, Indiana, United States" landuse industrial 0.3 United States FALSE
+ny us Americas Northern America FALSE 1 2021-02-03 257701567 relation "New York, United States" boundary administrative 0.765584640908957 United States FALSE
+nyu school of medicine us Americas Northern America FALSE 1 2021-02-03 12578717 node "NYU School of Medicine, 562, 1st Avenue, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10017-6927, United States" amenity university 0.799286093607089 United States FALSE
+oakland university us Americas Northern America FALSE 1 2021-02-03 101157737 way "Oakland University, 201, Meadow Brook Road, Rochester, Oakland County, Michigan, 48309-4401, United States" amenity university 0.611679724670082 United States FALSE
+obstetrics and gynecology us Americas Northern America FALSE 1 2021-02-03 2345795 node "Obstetrics and Gynecology, 1015, Union Street, Boone, Boone County, Iowa, 50036, United States" amenity doctors 0.301 United States FALSE
+occidental us Americas Northern America FALSE 1 2021-02-03 100208097 way "Occidental, Sonoma County, California, 95465, United States" boundary administrative 0.475700293936422 United States FALSE
+occidental petroleum us Americas Northern America FALSE 1 2021-02-03 185703827 way "Occidental Petroleum, Deauville Boulevard, Westridge Park, Midland, Midland County, Texas, 79703, United States" building yes 0.201 United States FALSE
+occupational safety and health administration us Americas Northern America FALSE 1 2021-02-03 216527579 way "Occupational Safety & Health, Shuler Loop Trailhead, Durant, Bryan County, Oklahoma, 74701, United States" building yes 0.301 United States FALSE
+ocean and atmosphere us Americas Northern America FALSE 1 2021-02-03 179780174 way "W.M. Keck Foundation Center for Ocean Atmosphere Research, San Diego, San Diego County, California, United States" landuse industrial 0.4 United States FALSE
+office for science us Americas Northern America FALSE 1 2021-02-03 3035430 node "The Mary Baker Eddy Library for the Betterment of Humanity, Christian Science Plaza, South End, Boston, Suffolk County, Massachusetts, 02115, United States" amenity library 0.470074815609084 United States FALSE
+office of criminal investigations us Americas Northern America FALSE 1 2021-02-03 3040663 node "Criminal Investigations, South Park Avenue, Titusville, Brevard County, Florida, 32780, United States" building public 0.201 United States FALSE
+office of new drugs us Americas Northern America FALSE 1 2021-02-03 43881066 node "Drugs, 1st Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity pharmacy 0.201 United States FALSE
+office of technology assessment us Americas Northern America FALSE 1 2021-02-03 65556891 node "Research, Technology & Assessment, 1001, East Wooster Street, Bentwood Estates, Bowling Green, Wood County, Ohio, 43403, United States" office educational_institution 0.201 United States FALSE
+office of the united states trade representative us Americas Northern America FALSE 1 2021-02-03 106912217 way "Office of the United States Trade Representative, 600, 17th Street Northwest, Washington, District of Columbia, 20006, United States" office government 0.819931111449548 United States FALSE
+ohio state university medical center us Americas Northern America FALSE 1 2021-02-03 178969993 way "Wexner Medical Center at The Ohio State University, 410, West Tenth Avenue, University District District 4, Columbus, Franklin, Ohio, 43210, United States" amenity hospital 0.700804307025448 United States FALSE
+ohsu us Americas Northern America FALSE 1 2021-02-03 200879490 way "OHSU Center For Health And Healing, 3303, Southwest Bond Avenue, South Portland, Portland, Metro, Oregon, 97239, United States" building yes 0.307534521399027 United States FALSE
+opal us Americas Northern America FALSE 1 2021-02-03 258462411 relation "Opal, Lincoln County, Wyoming, United States" boundary administrative 0.446398790789336 United States FALSE
+open academic society us Americas Northern America FALSE 1 2021-02-03 171172391 way "Health Professions Academic Building, 901, South 9th Street, Society Hill, Philadelphia, Philadelphia County, Pennsylvania, 19107, United States" building hospital 0.319931111449548 United States FALSE
+open phil us Americas Northern America FALSE 1 2021-02-03 448866 node "Phil, Robeson County, North Carolina, United States" place hamlet 0.35 United States FALSE
+operation campus us Americas Northern America FALSE 1 2021-02-03 230031793 way "Faculties Operation, Campus Drive, Concord, Contra Costa County, California, 94521, United States" building school 0.201 United States FALSE
+orasure technologies us Americas Northern America FALSE 1 2021-02-03 69665845 node "OraSure Technologies - Eaton Avenue Facility, 1745, Eaton Avenue, Kaywin, Bethlehem, Lehigh County, Pennsylvania, 18018, United States" man_made works 0.201 United States FALSE
+oregon national primate research center us Americas Northern America FALSE 1 2021-02-03 210428336 way "Oregon National Primate Research Center, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, United States" landuse commercial 0.7 United States FALSE
+overlea high school us Americas Northern America FALSE 1 2021-02-03 111694033 way "Overlea High School, Wildwood Avenue, Linhigh, Overlea, Baltimore County, Maryland, 21206, United States" amenity school 0.301 United States FALSE
+oxford west us Americas Northern America FALSE 1 2021-02-03 196505852 way "Oxford West, Paramount Estates, Auburn Hills, Oakland County, Michigan, 48309-4427, United States" highway residential 0.3 United States FALSE
+pacific institute us Americas Northern America FALSE 1 2021-02-03 160911248 way "Mid-Pacific Institute, Kaaka Place, Lower MÄ<81>noa, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" amenity school 0.469299555080491 United States FALSE
+pacific lutheran university us Americas Northern America FALSE 1 2021-02-03 95404782 way "Pacific Lutheran University, 12180, Park Avenue South, Parkland, Tacoma, Pierce County, Washington, 98447, United States" amenity university 0.686028263148971 United States FALSE
+pacific northwest us Americas Northern America FALSE 1 2021-02-03 257884713 relation "Pacific, King County, Washington, United States" boundary administrative 0.511447002935904 United States FALSE
+pacific northwest research station us Americas Northern America FALSE 1 2021-02-03 7571845 node "Pacific Star, Research Boulevard, Woodland Village, Pond Springs, Austin, Williamson County, Texas, 78759, United States" amenity restaurant 0.201 United States FALSE
+pacific tsunami warning center us Americas Northern America FALSE 1 2021-02-03 297701617 node "Pacific Tsunami Warning Center, Perimeter Road, Pacific Tsunami Warning Center, Ewa Beach, Honolulu County, Hawaii, 96706, United States" man_made monitoring_station 0.754544854295327 United States FALSE
+packard us Americas Northern America FALSE 1 2021-02-03 408214 node "Packard, Town of Wagner, Marinette County, Wisconsin, 49877, United States" place hamlet 0.35 United States FALSE
+pandora us Americas Northern America FALSE 1 2021-02-03 258361127 relation "Pandora, Putnam County, Ohio, 45877, United States" boundary administrative 0.41689306175332 United States FALSE
+park service us Americas Northern America FALSE 1 2021-02-03 120606840 way "Park Service, Groveton, Fairfax County, Virginia, 22310-6299, United States" highway service 0.275 United States FALSE
+peabody museum of archaeology and ethnology us Americas Northern America FALSE 1 2021-02-03 2943218 node "Peabody Museum of Archaeology and Ethnology, 11, Divinity Avenue, Cambridge, Middlesex County, Massachusetts, 02138, United States" tourism museum 1.00313937321747 United States FALSE
+penn state university us Americas Northern America FALSE 1 2021-02-03 258601905 relation "Penn State University, Mount Nittany Expressway, Houserville, College Township, Centre County, Pennsylvania, 16802-2604, United States" amenity university 0.862656889872636 United States FALSE
+perelman school of medicine us Americas Northern America FALSE 1 2021-02-03 103925708 way "Perelman Center for Advanced Medicine, East Service Drive, University City, Philadelphia, Philadelphia County, Pennsylvania, 19104, United States" building yes 0.405371759161912 United States FALSE
+pgc us Americas Northern America FALSE 1 2021-02-03 220208091 way "Grant County Airport, Fish Hatchery Road, Grant County, West Virginia, 26847, United States" aeroway aerodrome 0.110430435186894 United States FALSE
+philip campbell us Americas Northern America FALSE 1 2021-02-03 141178973 way "Saint Philip School, North Campbell Avenue, West Ridge, Rogers Park, Chicago, Jefferson Township, Cook County, Illinois, 60645, United States" amenity school 0.201 United States FALSE
+philip diamond us Americas Northern America FALSE 1 2021-02-03 108999433 way "St. Philip the Apostle Church, 725, Diamond Street, Noe Valley, San Francisco, San Francisco City and County, California, 94114, United States" amenity place_of_worship 0.201 United States FALSE
+phoenix medical school us Americas Northern America FALSE 1 2021-02-03 66777927 node "Phoenix Medical, 176, Merrick Road, Lynbrook, Hempstead, Nassau County, New York, 11563, United States" place house 0.201 United States FALSE
+pik us Americas Northern America FALSE 1 2021-02-03 258470779 relation "Pike County, Ohio, United States" boundary administrative 0.617433418056826 United States FALSE
+pioneer us Americas Northern America FALSE 1 2021-02-03 258145486 relation "Pioneer, Humboldt County, Iowa, United States" boundary administrative 0.530939679465417 United States FALSE
+pioneer hi-bred international us Americas Northern America FALSE 1 2021-02-03 259591250 relation "Pioneer Hi-Bred International Inc., 19456, Victory Drive, Southhaven, Mankato, Blue Earth County, Minnesota, 56001, United States" building commercial 0.401 United States FALSE
+pixar us Americas Northern America FALSE 1 2021-02-03 70771733 node "Pixar, Park Avenue, Emeryville, Alameda County, California, 94608, United States" highway bus_stop 0.101 United States FALSE
+planet labs us Americas Northern America FALSE 1 2021-02-03 154551012 way "Planet Labs, 346, 9th Street, West SoMa, San Francisco, San Francisco City and County, California, 94103, United States" building yes 0.201 United States FALSE
+planetary sciences us Americas Northern America FALSE 1 2021-02-03 39668919 node "Earth, Atmospheric, and Planetary Sciences Library, 550, West Stadium Avenue, West Lafayette, Tippecanoe County, Indiana, 47907, United States" amenity library 0.201 United States FALSE
+planned parenthood us Americas Northern America FALSE 1 2021-02-03 44150828 node "Planned Parenthood, 183, Saint Paul Street, Downtown, Burlington, Chittenden County, Vermont, 05401, United States" amenity clinic 0.201 United States FALSE
+planning commission us Americas Northern America FALSE 1 2021-02-03 145886965 way "Maryland-National Capital Park and Planning Commission, 6611, Kenilworth Avenue, Riverdale Park, Prince George's County, Maryland, 20737, United States" office government 0.497085518539193 United States FALSE
+plasma science and fusion center us Americas Northern America FALSE 1 2021-02-03 98018371 way "Plasma Fusion & Science Ctr, 167, Albany Street, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" building university 0.301 United States FALSE
+pleiades us Americas Northern America FALSE 1 2021-02-03 2294942 node "The Pleiades, Whatcom County, Washington, United States" natural peak 0.4 United States FALSE
+pnnl us Americas Northern America FALSE 1 2021-02-03 47080016 node "PNNL Guesthouse/ User Housing Facility, Battelle Boulevard, Tri-Cities, Benton County, Washington, 99354-2303, United States" tourism guest_house 0.101 United States FALSE
+point carbon us Americas Northern America FALSE 1 2021-02-03 258600968 relation "Carbon County, Montana, United States" boundary administrative 0.583120203849316 United States FALSE
+polar science center us Americas Northern America FALSE 1 2021-02-03 183870807 way "PARS, Polar Aeronomy and Radio Science, Fairbanks, Fairbanks North Star, Alaska, United States" landuse industrial 0.4 United States FALSE
+potash corporation of saskatchewan us Americas Northern America FALSE 1 2021-02-03 180233467 way "Potash Corporation of Saskatchewan Nitrogen Fertilizer, Augusta, Richmond County, Georgia, United States" landuse industrial 0.6 United States FALSE
+powell center us Americas Northern America FALSE 1 2021-02-03 187415894 way "Powell Center, Creston-Kenilworth, Portland, Metro, Oregon, United States" landuse retail 0.4 United States FALSE
+power us Americas Northern America FALSE 1 2021-02-03 258584590 relation "Power County, Idaho, 83211, United States" boundary administrative 0.56152149654469 United States FALSE
+princeton hydro us Americas Northern America FALSE 1 2021-02-03 258173845 relation "Hydro, Caddo County, Oklahoma, United States" boundary administrative 0.383208261767925 United States FALSE
+princeton university press us Americas Northern America FALSE 1 2021-02-03 99832796 way "Princeton University Press, William Street, Princeton, Mercer County, New Jersey, 08540, United States" building university 0.301 United States FALSE
+psc us Americas Northern America FALSE 1 2021-02-03 119085054 way "Peter W. Stott Center, 930, Southwest Hall Street, University District, Downtown, Portland, Metro, Oregon, 97201, United States" leisure sports_centre 0.3277684953714 United States FALSE
+public lab us Americas Northern America FALSE 1 2021-02-03 61104485 node "Public Lab (NYC), 19, Morris Avenue, Brooklyn Navy Yard, Brooklyn, Kings County, New York, 11205, United States" office ngo 0.201 United States FALSE
+qiagen us Americas Northern America FALSE 1 2021-02-03 41703932 node "QIAGEN, 1700, Seaport Boulevard, Pacific Shores Center, Redwood City, San Mateo County, California, 94063, United States" office it 0.101 United States FALSE
+quantum us Americas Northern America FALSE 1 2021-02-03 220451883 way "Quantum, Tallahassee, Leon County, Florida, United States" landuse residential 0.3 United States FALSE
+quest diagnostics us Americas Northern America FALSE 1 2021-02-03 80813530 node "Quest Diagnostics, 319, Longwood Avenue, Boston, Suffolk County, Massachusetts, 02115, United States" place house 0.481311730611622 United States FALSE
+quinnipiac university us Americas Northern America FALSE 1 2021-02-03 259033660 relation "Quinnipiac University, Blandon Drive, Hamden, New Haven County, Connecticut, 06518, United States" amenity university 0.609392399368322 United States FALSE
+r street institute us Americas Northern America FALSE 1 2021-02-03 451003 node "Institute, Jefferson, Kanawha County, West Virginia, 25064, United States" place hamlet 0.554934934074513 United States FALSE
+radio science us Americas Northern America FALSE 1 2021-02-03 183870807 way "PARS, Polar Aeronomy and Radio Science, Fairbanks, Fairbanks North Star, Alaska, United States" landuse industrial 0.4 United States FALSE
+rainbow babies and children's hospital us Americas Northern America FALSE 1 2021-02-03 64089560 node "UH Rainbow Babies & Children’s Hospital, 2101, Adelbert Road, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States" amenity hospital 0.909633810660442 United States FALSE
+raven aerostar us Americas Northern America FALSE 1 2021-02-03 241681489 way "Raven Aerostar, Northeast 3rd Street, Madison, Lake County, South Dakota, 57042, United States" building industrial 0.201 United States FALSE
+rcr us Americas Northern America FALSE 1 2021-02-03 132953507 way "Fulton County Airport, SR 25, Rochester, Fulton County, Indiana, 46975, United States" aeroway aerodrome 0.260058384040688 United States FALSE
+recognition us Americas Northern America FALSE 1 2021-02-03 213255421 way "Volunteer Recognition Park, Schuylerville, Town of Saratoga, Saratoga County, New York, United States" leisure park 0.25 United States FALSE
+red crescent us Americas Northern America FALSE 1 2021-02-03 258176473 relation "Red Creek, Wolcott Town, Wayne County, New York, United States" boundary administrative 0.498906231699698 United States FALSE
+rehabilitation research us Americas Northern America FALSE 1 2021-02-03 176264206 way "Rehabilitation Research Training Building, West Main Street, The Fan, Richmond, Virginia, 23220, United States" building yes 0.201 United States FALSE
+relampago us Americas Northern America FALSE 1 2021-02-03 368618 node "Relampago, Hidalgo County, Texas, United States" place hamlet 0.455899467051989 United States FALSE
+research animal resources center us Americas Northern America FALSE 1 2021-02-03 118554634 way "Research Animal Resources, 1861, Buford Place, St. Paul, Ramsey County, Minnesota, 55108, United States" building yes 0.301 United States FALSE
+research biosecurity us Americas Northern America FALSE 1 2021-02-03 106116575 way "Biosecurity Research Institute, Denison Avenue, Manhattan, Riley County, Kansas, 66506â€<90>1600, United States" building university 0.201 United States FALSE
+research integrity us Americas Northern America FALSE 1 2021-02-03 65571490 node "Police Integrity Research Lab, Ridge Street, Athletics District, Bowling Green, Wood County, Ohio, 43403, United States" office research 0.201 United States FALSE
+research mission us Americas Northern America FALSE 1 2021-02-03 169420504 way "University of Kansas Medical Center Research Institute, 4330, Shawnee Mission Parkway, Fairway, Johnson County, Kansas, 66205, United States" place house 0.201 United States FALSE
+research projects us Americas Northern America FALSE 1 2021-02-03 166563644 way "Defense Advanced Research Projects Agency, 675, North Randolph Street, Ballston, Arlington, Arlington County, Virginia, 22203, United States" office government 0.201 United States FALSE
+research rocket us Americas Northern America FALSE 1 2021-02-03 130028486 way "Research Park Boulevard Northwest, Rideout Village, Huntsville, Madison County, Alabama, 35814, United States" highway motorway 0.2 United States FALSE
+research university us Americas Northern America FALSE 1 2021-02-03 2953848 node "Davies Family Research Library, 1200, Southwest Park Avenue, University District, Downtown, Portland, Metro, Oregon, 97205, United States" amenity library 0.637845445938682 United States FALSE
+review committee us Americas Northern America FALSE 1 2021-02-03 65256602 node "JLARC - Joint Legislative Audit and Review Committee, 11th Avenue Southwest, Olympia, Thurston County, Washington, 98504, United States" office research 0.201 United States FALSE
+revolutionary court us Americas Northern America FALSE 1 2021-02-03 89870391 way "Revolutionary Court, East Pikeland Township, Chester County, Pennsylvania, 19460, United States" highway residential 0.3 United States FALSE
+risk management solutions us Americas Northern America FALSE 1 2021-02-03 65756807 node "Risk Management Solutions, 799, West Gaines Street, Tallahassee, Leon County, Florida, 32304, United States" office yes 0.301 United States FALSE
+robert c. byrd green bank telescope us Americas Northern America FALSE 1 2021-02-03 102881650 way "Green Bank Telescope, Slavin Hollow Road, Pocahontas County, West Virginia, 24944, United States" man_made telescope 0.790988572487363 United States FALSE
+robert h. lurie children's hospital of chicago us Americas Northern America FALSE 1 2021-02-03 208072291 way "Ann & Robert H. Lurie Children's Hospital Heliport, Lurie Children's Hospital Emergency Lane, Streeterville, Near North Side, Chicago, Cook County, Illinois, 60611, United States" aeroway helipad 0.701 United States FALSE
+rochelle diamond us Americas Northern America FALSE 1 2021-02-03 26235794 node "Rochelle Diamond Lodge, 215, North 9th Street, Rochelle, Ogle County, Illinois, 61068, United States" tourism motel 0.201 United States FALSE
+rocky mountain institute us Americas Northern America FALSE 1 2021-02-03 67076208 node "Rocky Mountain Institute/RMI, 2490, Junction Place, Boulder Junction, Boulder, Boulder County, Colorado, 80301, United States" office association 0.301 United States FALSE
+rocky mountain laboratories us Americas Northern America FALSE 1 2021-02-03 214062263 way "Rocky Mountain Laboratories, Leisure Village, Hamilton, Ravalli County, Montana, United States" landuse commercial 0.5 United States FALSE
+roger williams park zoo us Americas Northern America FALSE 1 2021-02-03 162060422 way "Roger Williams Park Zoo, 1000, Elmwood Avenue, Providence, Providence County, Rhode Island, 02907, United States" tourism zoo 0.615498150437213 United States FALSE
+roosevelt university us Americas Northern America FALSE 1 2021-02-03 2336069 node "Roosevelt University, 430, South Michigan Avenue, Printer's Row, Loop, Chicago, Cook County, Illinois, 60605, United States" amenity university 0.614479959227419 United States FALSE
+rosetta stone us Americas Northern America FALSE 1 2021-02-03 37420348 node "Rosetta stone, 6000, North Terminal Parkway, College Park, Clayton County, Georgia, 30337, United States" shop jewelry 0.201 United States FALSE
+royal scientific society us Americas Northern America FALSE 1 2021-02-03 174783944 way "Rensselaer Society of Engineers, 1501, Sage Avenue, City of Troy, Rensselaer County, New York, 12180, United States" building house 0.101 United States FALSE
+rush university medical center us Americas Northern America FALSE 1 2021-02-03 150024552 way "Rush University Medical Center, 1653, West Congress Parkway, Near West Side, Illinois Medical District, Chicago, Illinois Medical District, Illinois, 60612, United States" amenity hospital 0.689701883147039 United States FALSE
+safeway us Americas Northern America FALSE 1 2021-02-03 173823433 way "Safeway, West Pierson Street, Phoenix, Maricopa County, Arizona, 85340, United States" shop supermarket 0.381950414040809 United States FALSE
+saint anselm college us Americas Northern America FALSE 1 2021-02-03 255793083 way "Saint Anselm College, Eaton Road, Pinardville, Goffstown, Hillsborough County, New Hampshire, 03102, United States" amenity university 0.301 United States FALSE
+saint louis university us Americas Northern America FALSE 1 2021-02-03 259124957 relation "Saint Louis University, 1, North Grand Boulevard, St Louis University, City of Saint Louis, Missouri, 63103, United States" amenity university 0.77813837372741 United States FALSE
+saint martin's university us Americas Northern America FALSE 1 2021-02-03 228320701 way "Saint Martin's University, I 5, Lacey, Thurston County, Washington, 98516-5364, United States" amenity university 0.710838391011185 United States FALSE
+salesforce us Americas Northern America FALSE 1 2021-02-03 70950029 node "Salesforce, 433, North Capitol Avenue, Fayette Street Conservation Area, Indianapolis, Marion, Indiana, 46204, United States" office company 0.101 United States FALSE
+salisbury university us Americas Northern America FALSE 1 2021-02-03 186046675 way "Salisbury University, 1101, Camden Avenue, Camden, Salisbury, Wicomico County, Maryland, 21801, United States" amenity university 0.577478932777613 United States FALSE
+san francisco brain research institute us Americas Northern America FALSE 1 2021-02-03 133163876 way "Brain Research Institute, 670, Charles E Young Drive South, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity research_institute 0.301 United States FALSE
+san francisco department of public health us Americas Northern America FALSE 1 2021-02-03 51450093 node "IL Department of Public Health, 422, South 5th Street, Springfield, Sangamon County, Illinois, 62701, United States" office government 0.501 United States FALSE
+sanford underground research facility us Americas Northern America FALSE 1 2021-02-03 182033784 way "630, Sanford Underground Research Facility, Lead, Lawrence County, South Dakota, 57754, United States" landuse industrial 0.6 United States FALSE
+santa clara us Americas Northern America FALSE 1 2021-02-03 258271205 relation "Santa Clara County, California, United States" boundary administrative 0.764168809666577 United States FALSE
+satori us Americas Northern America FALSE 1 2021-02-03 257593503 relation "Story, Sheridan County, Wyoming, 82842, United States" place locality 0.297085518539193 United States FALSE
+scb us Americas Northern America FALSE 1 2021-02-03 3028939 node "Scribner State Airport, 1574, Road 15, Hooper, Dodge County, Nebraska, 68031, United States" aeroway aerodrome 0.178140546517606 United States FALSE
+school of health professions us Americas Northern America FALSE 1 2021-02-03 216286733 way "School of Health Professions, 9th Avenue South, Five Points South, Birmingham, Jefferson County, Alabama, 35294, United States" building university 0.401 United States FALSE
+school of natural resources us Americas Northern America FALSE 1 2021-02-03 26489221 node "Natural Resources, 1367, Valencia Street, Liberty Street Historic District, San Francisco, San Francisco City and County, California, 94110, United States" amenity social_facility 0.201 United States FALSE
+school of social sciences us Americas Northern America FALSE 1 2021-02-03 302307768 node "School of Social Sciences, 6100, Main Street, Houston, Harris County, Texas, 77005, United States" amenity university 0.617338060184506 United States FALSE
+sci us Americas Northern America FALSE 1 2021-02-03 258539307 relation "Scioto County, Ohio, United States" boundary administrative 0.614306518100907 United States FALSE
+science and engineering us Americas Northern America FALSE 1 2021-02-03 105892341 way "Science/Engineering, Panorama Drive, Bakersfield, Kern County, California, 93305, United States" building yes 0.201 United States FALSE
+seaman us Americas Northern America FALSE 1 2021-02-03 258449460 relation "Seaman, Adams County, Ohio, United States" boundary administrative 0.416167966338533 United States FALSE
+seattle us Americas Northern America FALSE 1 2021-02-03 258415102 relation "Seattle, King County, Washington, United States" boundary administrative 0.772979173564379 United States FALSE
+seattle children's hospital us Americas Northern America FALSE 1 2021-02-03 259228662 relation "Seattle Children's Hospital, 4800, Sand Point Way Northeast, Laurelhurst, Seattle, King County, Washington, 98105, United States" amenity hospital 0.678688679458624 United States FALSE
+seattle times us Americas Northern America FALSE 1 2021-02-03 147961931 way "The Seattle Times, 1000, Denny Way, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office newspaper 0.709495227301736 United States FALSE
+seaworld us Americas Northern America FALSE 1 2021-02-03 159858865 way "SeaWorld San Diego, 500, Sea World Drive, San Diego, San Diego County, California, 92109, United States" tourism theme_park 0.479859879460608 United States FALSE
+seaworld entertainment us Americas Northern America FALSE 1 2021-02-03 112132633 way "Aquatica: SeaWorld's Waterpark San Diego, 2052, Entertainment Circle, Chula Vista, San Diego County, California, 92154, United States" tourism theme_park 0.201 United States FALSE
+seton hall university us Americas Northern America FALSE 1 2021-02-03 98909108 way "Seton Hall University, Seton Drive, South Orange, Essex County, New Jersey, 61, United States" amenity university 0.774893814120778 United States FALSE
+seven sons us Americas Northern America FALSE 1 2021-02-03 89368026 way "Seven Sons Road, Grant County, New Mexico, 88026, United States" highway residential 0.3 United States FALSE
+sfb us Americas Northern America FALSE 1 2021-02-03 146097502 way "Orlando Sanford International Airport, Summerlin Avenue, Wynwood, Sanford, Seminole County, Florida, 32773, United States" aeroway aerodrome 0.402243537687533 United States FALSE
+shawnee state university us Americas Northern America FALSE 1 2021-02-03 213692812 way "Shawnee State University, US 23, Boneyfiddle Commercial Historic District, Portsmouth, Scioto County, Ohio, 41175, United States" amenity university 0.301 United States FALSE
+shire pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 140916147 way "Shire Pharmaceuticals, 200, Riverpark Drive, North Reading, Middlesex County, Massachusetts, 01864, United States" building commercial 0.201 United States FALSE
+shoemaker levy 9 us Americas Northern America FALSE 1 2021-02-03 48677113 node "A Shine To Go, 1710, Allied Street, McIntire Plaza Shopping Center, Greenfields, Charlottesville, Virginia, 22903, United States" craft shoemaker 0.101 United States FALSE
+silver spring networks us Americas Northern America FALSE 1 2021-02-03 138261973 way "Silver Spring Networks, 230, West Tasman Drive, San Jose, Santa Clara County, California, 95134-1358, United States" building office 0.301 United States FALSE
+simons center us Americas Northern America FALSE 1 2021-02-03 160830886 way "Simons Center, John S Toll Drive, Suffolk County, New York, 11794, United States" building university 0.201 United States FALSE
+sky news us Americas Northern America FALSE 1 2021-02-03 42369599 node "Blue Sky Cafe, Covered Walkway, Newport News, Virginia, 23602, United States" amenity restaurant 0.201 United States FALSE
+slac national accelerator laboratory in stanford us Americas Northern America FALSE 1 2021-02-03 299175282 way "Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States" amenity research_center 0.927082745074033 United States FALSE
+sloan digital sky us Americas Northern America FALSE 1 2021-02-03 3752682 node "Sloan Digital Sky Survey telescope, Apache Point Road, Otero County, New Mexico, 88349, United States" man_made telescope 0.301 United States FALSE
+small earth nepal us Americas Northern America FALSE 1 2021-02-03 88622633 way "Small Street, White Earth, Mountrail County, North Dakota, United States" highway residential 0.3 United States FALSE
+smc us Americas Northern America FALSE 1 2021-02-03 154928635 way "Space and Missile Systems Center, North Douglas Street, El Segundo, Los Angeles County, California, 90245, United States" office government 0.332141421099015 United States FALSE
+smithsonian conservation biology institute us Americas Northern America FALSE 1 2021-02-03 259518942 relation "Smithsonian Conservation Biology Institute, Front Royal, Warren County, Virginia, United States" boundary national_park 0.734080577887678 United States FALSE
+smithsonian conservation biology institute in front royal us Americas Northern America FALSE 1 2021-02-03 259518942 relation "Smithsonian Conservation Biology Institute, Front Royal, Warren County, Virginia, United States" boundary national_park 1.03408057788768 United States FALSE
+society islands us Americas Northern America FALSE 1 2021-02-03 68173148 node "Audobon Society Wildlife & Marine Sanctuary, Cruz Bay, Saint Thomas - Saint John District, United States Virgin Islands, 000830, United States" leisure park 0.35 United States FALSE
+society of nuclear medicine us Americas Northern America FALSE 1 2021-02-03 108632117 way "Society of Nuclear Medicine and Molecular Imaging, Samuel Morse Drive, Pinecrest, Reston, Fairfax County, Virginia, 20190, United States" building yes 0.401 United States FALSE
+solidarity us Americas Northern America FALSE 1 2021-02-03 48908995 node "The Spirit of Polonia, North 10th Street, Westown, Milwaukee, Milwaukee County, Wisconsin, 53233, United States" tourism artwork 0.339306791900516 United States FALSE
+sonoma state university us Americas Northern America FALSE 1 2021-02-03 136713211 way "Sonoma State University, 1801, East Cotati Avenue, C Section, Rohnert Park, Sonoma County, California, 94928, United States" amenity university 0.720803171748129 United States FALSE
+south african san institute us Americas Northern America FALSE 1 2021-02-03 2850026 node "First African Baptist Church, Institute Street, Statesboro, Bulloch County, Georgia, 30458, United States" amenity place_of_worship 0.201 United States FALSE
+south carolina us Americas Northern America FALSE 1 2021-02-03 257325089 relation "South Carolina, United States" boundary administrative 0.90345926227768 United States FALSE
+south dakota state university in brookings us Americas Northern America FALSE 1 2021-02-03 109863860 way "South Dakota State University, Harvey Dunn Street, Brookings, Brookings County, South Dakota, 57007, United States" amenity university 1.00718370279007 United States FALSE
+southern gardens citrus us Americas Northern America FALSE 1 2021-02-03 88472039 way "West Southern Street, Homosassa Springs, Citrus County, Florida, 34461, United States" highway residential 0.3 United States FALSE
+southern illinois university in carbondale us Americas Northern America FALSE 1 2021-02-03 178049913 way "Southern Illinois University at Carbondale, Susan Schumake Memorial Overpass, East Campus Housing Area, Lake Shore Drive Area, Carbondale, Jackson County, Illinois, 62901, United States" amenity university 0.501 United States FALSE
+southern poverty law center us Americas Northern America FALSE 1 2021-02-03 48759870 node "Southern Poverty Law Center, 400, Washington Avenue, Montgomery, Montgomery County, Alabama, 36104, United States" office association 0.876048939755188 United States FALSE
+space and technology us Americas Northern America FALSE 1 2021-02-03 177657788 way "Holding Space Gallery, 3546, Michigan Avenue, Clark Street Technology Park, Detroit, Wayne County, Michigan, 48216, United States" building commercial 0.201 United States FALSE
+spect us Americas Northern America FALSE 1 2021-02-03 87269115 way "Spect Court, Virginia Hills, Groveton, Fairfax County, Virginia, 22310, United States" highway residential 0.2 United States FALSE
+spirit cave us Americas Northern America FALSE 1 2021-02-03 210761029 way "Cades Spirit Bend, Bee Cave, Travis County, Texas, 78733, United States" highway residential 0.3 United States FALSE
+sri international us Americas Northern America FALSE 1 2021-02-03 2879218 node "SRI International, 333, Ravenswood Avenue, Menlo Park, San Mateo County, California, 94025, United States" office research 0.201 United States FALSE
+st cloud state university us Americas Northern America FALSE 1 2021-02-03 258951532 relation "St. Cloud State University, 720, 4th Avenue South, St. Cloud, Stearns County, Minnesota, 56301, United States" amenity university 0.810507227685364 United States FALSE
+stanford genome technology center us Americas Northern America FALSE 1 2021-02-03 125860486 way "Stanford Genome Technology Center, 855, South California Avenue, Evergreen Park, Palo Alto, Santa Clara County, California, 94304, United States" office research 0.401 United States FALSE
+stanford libraries us Americas Northern America FALSE 1 2021-02-03 147987374 way "Lathrop Library, 518, Memorial Way, Stanford, Santa Clara County, California, 94305-6015, United States" amenity library 0.406301518086152 United States FALSE
+stanford linear accelerator center us Americas Northern America FALSE 1 2021-02-03 299175282 way "Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States" amenity research_center 0.827082745074033 United States FALSE
+stanford medical center us Americas Northern America FALSE 1 2021-02-03 63574186 node "Stanford Medical Center, Quarry Road Extension, Stanford, Palo Alto, Santa Clara County, California, 94305-6015, United States" highway bus_stop 0.301 United States FALSE
+stanford school of medicine us Americas Northern America FALSE 1 2021-02-03 13364304 node "Stanford School Of Medicine, D Street, Menlo Park, San Mateo County, California, 94025, United States" amenity university 0.401 United States FALSE
+star program us Americas Northern America FALSE 1 2021-02-03 254478022 way "North Star, Program Way, Larimer County, Colorado, United States" building cabin 0.201 United States FALSE
+starcraft us Americas Northern America FALSE 1 2021-02-03 52644991 node "Starcraft, Northeast 4th Street, Bellevue, King County, Washington, 98004-5002, United States" tourism artwork 0.101 United States FALSE
+state for energy us Americas Northern America FALSE 1 2021-02-03 123397480 way "United States District Court for Western District of Oklahoma, The Underground, Bank of Oklahoma Plaza, Central Business District, Oklahoma City, Oklahoma County, Oklahoma, 73104:73106, United States" amenity courthouse 0.201 United States FALSE
+stennis space center us Americas Northern America FALSE 1 2021-02-03 225894763 way "John C. Stennis Space Center, Hancock County, Mississippi, 39529, United States" amenity research_institute 0.720736361552565 United States FALSE
+stockton university us Americas Northern America FALSE 1 2021-02-03 95943679 way "Stockton University, Garden State Parkway, Clarks Mill, Galloway Township, Atlantic County, New Jersey, 08241, United States" amenity university 0.563793454953531 United States FALSE
+stony brook university medical center us Americas Northern America FALSE 1 2021-02-03 104502319 way "Stony Brook University, 100, Nicolls Road, Suffolk County, New York, 11794, United States" amenity university 0.803198357564167 United States FALSE
+stowers institute for medical research us Americas Northern America FALSE 1 2021-02-03 174674425 way "Stowers Institute for Medical Research, 1000, East 50th Street, Kansas City, Jackson County, Missouri, 64110, United States" office research 0.715498150437213 United States FALSE
+stuart school of business us Americas Northern America FALSE 1 2021-02-03 2815985 node "Stuart School, 39th Street, Metairie, Jefferson Parish, Louisiana, 70001, United States" amenity school 0.201 United States FALSE
+subaru telescope us Americas Northern America FALSE 1 2021-02-03 101632679 way "Subaru Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.61807260783706 United States FALSE
+suny upstate medical university us Americas Northern America FALSE 1 2021-02-03 300965654 way "SUNY Upstate Medical University Bursar Office, 155, Elizabeth Blackwell Street, University Hill, Syracuse, Onondaga County, New York, 13210, United States" building yes 0.401 United States FALSE
+superior court us Americas Northern America FALSE 1 2021-02-03 89146279 way "Superior Court, The Landings, Toms River, Ocean County, New Jersey, 08755, United States" highway residential 0.3 United States FALSE
+sutter health us Americas Northern America FALSE 1 2021-02-03 17827506 node "Sutter Health, Garden Highway, Sacramento, Sacramento County, California, 95605, United States" building office 0.201 United States FALSE
+takeda pharmaceutical company us Americas Northern America FALSE 1 2021-02-03 235148162 way "Takeda Pharmaceutical, Thousand Oaks, Ventura County, California, United States" landuse industrial 0.4 United States FALSE
+takeda pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 43478299 node "Takeda Pharmaceuticals, 300, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" place house 0.201 United States FALSE
+tama us Americas Northern America FALSE 1 2021-02-03 258588234 relation "Tama County, Iowa, United States" boundary administrative 0.608199002879145 United States FALSE
+task force for global health us Americas Northern America FALSE 1 2021-02-03 103398915 way "The Task Force for Global Health, 325, Swanton Way, Oakhurst, Decatur, DeKalb County, Georgia, 30030, United States" building office 0.501 United States FALSE
+tennessee valley authority us Americas Northern America FALSE 1 2021-02-03 108570171 way "Tennessee Valley Authority, 1101, Market Street, Chattanooga, Hamilton County, Tennessee, 37402, United States" building commercial 0.778949510198751 United States FALSE
+terra bella us Americas Northern America FALSE 1 2021-02-03 258597384 relation "Terra Bella, Tulare County, California, United States" boundary census 0.575700293936422 United States FALSE
+tex us Americas Northern America FALSE 1 2021-02-03 257418219 relation "Texas, United States" boundary administrative 0.858052139534058 United States FALSE
+texas a & m university in college station us Americas Northern America FALSE 1 2021-02-03 259129741 relation "Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States" amenity university 1.25527727305854 United States FALSE
+texas a&m in college station us Americas Northern America FALSE 1 2021-02-03 104362432 way "Texas A & M, Lakeway Drive, College Station, Brazos County, Texas, 77845, United States" building yes 0.501 United States FALSE
+texas a&m university at college station us Americas Northern America FALSE 1 2021-02-03 259129741 relation "Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States" amenity university 1.35527727305854 United States FALSE
+texas children's hospital us Americas Northern America FALSE 1 2021-02-03 50694412 node "Texas Children's Hospital, 6621, Fannin Street, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity hospital 0.699521898980972 United States FALSE
+texas gulf coast us Americas Northern America FALSE 1 2021-02-03 203071766 way "Texas Gulf Coast Regional Airport, Aifport Way, Brazoria County, Texas, United States" aeroway aerodrome 0.550254845255209 United States FALSE
+the boston globe us Americas Northern America FALSE 1 2021-02-03 92324871 way "Boston Street, Globe, Gila County, Arizona, 85501, United States" highway residential 0.3 United States FALSE
+the cdc us Americas Northern America FALSE 1 2021-02-03 172987439 way "CDC, New Center, Detroit, Wayne County, Michigan, United States" landuse farmyard 0.3 United States FALSE
+the circuit court us Americas Northern America FALSE 1 2021-02-03 20736035 node "Circuit Court, Maryland Avenue, Croydon Park, Rockville, Montgomery County, Maryland, 20850, United States" amenity courthouse 0.403130333992136 United States FALSE
+the george washington university us Americas Northern America FALSE 1 2021-02-03 106978219 way "George Washington University, I Street Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States" amenity university 0.861031504404982 United States FALSE
+the guardian us Americas Northern America FALSE 1 2021-02-03 2795396 node "The Guardian, San Juan County, Colorado, United States" natural peak 0.5 United States FALSE
+the institute of mathematical sciences us Americas Northern America FALSE 1 2021-02-03 55398385 node "Courant Institute of Mathematical Sciences, 251, Mercer Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States" amenity university 0.922385266730329 United States FALSE
+the university of california us Americas Northern America FALSE 1 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 0.948194378261701 United States FALSE
+the university of california at berkeley us Americas Northern America FALSE 1 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.1481943782617 United States FALSE
+the university of california at san diego us Americas Northern America FALSE 1 2021-02-03 94305187 way "University of California, San Diego, 9500, Gilman Drive, San Diego, San Diego County, California, 92093, United States" amenity university 1.14938836421927 United States FALSE
+the university of pennsylvania us Americas Northern America FALSE 1 2021-02-03 258680341 relation "University of Pennsylvania, Market Street, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19139, United States" amenity university 0.926036457903365 United States FALSE
+the washington times us Americas Northern America FALSE 1 2021-02-03 162772326 way "Washington Times, 3600, New York Avenue Northeast, Washington, District of Columbia, 20002, United States" office newspaper 0.301 United States FALSE
+the woodrow wilson international center for scholars us Americas Northern America FALSE 1 2021-02-03 47333285 node "Woodrow Wilson International Center for Scholars, 1300, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20004, United States" office government 1.00659791861715 United States FALSE
+thirty meter telescope us Americas Northern America FALSE 1 2021-02-03 5539908 node "Thirty Meter Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.654348884656857 United States FALSE
+thomas jefferson national accelerator facility in newport news us Americas Northern America FALSE 1 2021-02-03 150234788 way "Thomas Jefferson National Accelerator Facility, Oyster Point, Newport News, Virginia, United States" landuse industrial 1 United States FALSE
+thomas jefferson university us Americas Northern America FALSE 1 2021-02-03 259368934 relation "Thomas Jefferson University, Ranstead Street, Society Hill, Philadelphia, Philadelphia County, Pennsylvania, 19107, United States" amenity university 0.709231479174104 United States FALSE
+tlr us Americas Northern America FALSE 1 2021-02-03 102668648 way "Mefford Field, Golden State Highway, Tulare, Tulare County, California, 93274-8029, United States" aeroway aerodrome 0.166903631515068 United States FALSE
+toyota technological institute us Americas Northern America FALSE 1 2021-02-03 67853957 node "Toyota Technological Institute, 6045, South Kenwood Avenue, Woodlawn, Chicago, Hyde Park Township, Cook County, Illinois, 60637, United States" office research 0.638803667479001 United States FALSE
+translational research us Americas Northern America FALSE 1 2021-02-03 100492214 way "Translational Genomics Research Institute, East Taylor Street, Phoenix, Maricopa County, Arizona, 85004, United States" building yes 0.415498150437213 United States FALSE
+triceratops us Americas Northern America FALSE 1 2021-02-03 7673484 node "Triceratops, 940, Skyline Drive, Rapid City, Pennington County, South Dakota, 57702-8170, United States" tourism artwork 0.101 United States FALSE
+trump white house us Americas Northern America FALSE 1 2021-02-03 445769 node "Trump, Baltimore County, Maryland, 21161, United States" place hamlet 0.375244632729739 United States FALSE
+tucson us Americas Northern America FALSE 1 2021-02-03 258050070 relation "Tucson, Pima County, Arizona, United States" boundary administrative 0.70803284036725 United States FALSE
+tulane university school of medicine us Americas Northern America FALSE 1 2021-02-03 169112739 way "Tulane University School of Medicine, 131, South Robertson Street, Storyville, New Orleans, Orleans Parish, Louisiana, 70112, United States" building yes 0.501 United States FALSE
+twas us Americas Northern America FALSE 1 2021-02-03 298656564 way "Twas the Night Before Christmas, Spirit of Christmas Lane, Jefferson Township, Berks County, Pennsylvania, United States" tourism attraction 0.101 United States FALSE
+u.s. national academy of sciences us Americas Northern America FALSE 1 2021-02-03 106787905 way "National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States" office ngo 1.20593943258948 United States FALSE
+u.s. senate us Americas Northern America FALSE 1 2021-02-03 367209 node "Senate, Jack County, Texas, United States" place hamlet 0.55 United States FALSE
+uc-berkeley us Americas Northern America FALSE 1 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 0.748194378261701 United States FALSE
+uc-davis us Americas Northern America FALSE 1 2021-02-03 258689332 relation "University of California, Davis, Russell Boulevard, Davis, Yolo County, California, 95616, United States" amenity university 0.101 United States FALSE
+ucla medical center us Americas Northern America FALSE 1 2021-02-03 19477330 node "UCLA Medical Center, Westwood Plaza, Westwood Village, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" highway bus_stop 0.301 United States FALSE
+ucla ronald reagan medical center us Americas Northern America FALSE 1 2021-02-03 258368083 relation "Ronald Reagan UCLA Medical Center, 757, Westwood Plaza, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity hospital 0.883144349963485 United States FALSE
+ucsb us Americas Northern America FALSE 1 2021-02-03 205319990 way "University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States" place locality 0.125 United States FALSE
+un assembly us Americas Northern America FALSE 1 2021-02-03 161485338 way "1318, The Assembly, Tallahassee, Leon County, Florida, 32303, United States" landuse commercial 0.4 United States FALSE
+unc-chapel hill us Americas Northern America FALSE 1 2021-02-03 258459202 relation "University of North Carolina, South Columbia Street, Downtown, Chapel Hill, Orange County, North Carolina, 27516, United States" amenity university 0.782889212190386 United States FALSE
+underwriters laboratories us Americas Northern America FALSE 1 2021-02-03 154447688 way "Underwriters Laboratories, Pfingsten Road, Northfield Township, Cook County, Illinois, 60015-1331, United States" building yes 0.201 United States FALSE
+uniformed services university us Americas Northern America FALSE 1 2021-02-03 161336966 way "Uniformed Services University of the Health Sciences, 4301, Jones Bridge Road, Bethesda, Montgomery County, Maryland, 20814, United States" place house 0.739197856791149 United States FALSE
+uniformed services university of the health sciences us Americas Northern America FALSE 1 2021-02-03 161336966 way "Uniformed Services University of the Health Sciences, 4301, Jones Bridge Road, Bethesda, Montgomery County, Maryland, 20814, United States" place house 1.13919785679115 United States FALSE
+union carbide us Americas Northern America FALSE 1 2021-02-03 49293344 node "Union Carbide, Odessa, Ector County, Texas, 79763, United States" place neighbourhood 0.45 United States FALSE
+union college us Americas Northern America FALSE 1 2021-02-03 107146317 way "Union College, Seward Place, Schenectady, Schenectady County, New York, 12305:12309, United States" amenity university 0.670997532660143 United States FALSE
+united launch alliance us Americas Northern America FALSE 1 2021-02-03 226339536 way "United Launch Alliance, Morgan County, Alabama, United States" landuse industrial 0.5 United States FALSE
+united states food and drug administration us Americas Northern America FALSE 1 2021-02-03 161684229 way "Food and Drug Administration, San Juan Antiguo, San Juan, Puerto Rico, United States" landuse industrial 0.8 United States FALSE
+united states of america us Americas Northern America FALSE 1 2021-02-03 257984054 relation United States boundary administrative 1.13569136745759 United States FALSE
+united states patent and trademark office us Americas Northern America FALSE 1 2021-02-03 55565757 node "Silicon Valley United States Patent and Trademark Office, South 4th Street, Saint James Square Historic District, Japantown, San Jose, Santa Clara County, California, 95112-3580, United States" office government 0.601 United States FALSE
+university of buffalo us Americas Northern America FALSE 1 2021-02-03 666703 node "University, Main Circle, University Heights, Buffalo, Erie County, New York, 14215, United States" railway station 0.390508362962683 United States FALSE
+university of california at riverside us Americas Northern America FALSE 1 2021-02-03 33709158 node "UCR ARTSblock, 3824, Main Street, Riverside, Riverside County, California, 92501, United States" tourism museum 0.558218474293395 United States FALSE
+university of california berkeley us Americas Northern America FALSE 1 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.0481943782617 United States FALSE
+university of california in merced us Americas Northern America FALSE 1 2021-02-03 129779241 way "University of California, Merced, 5200, Mineral King Road, Merced County, California, 95343, United States" amenity university 0.913735597530124 United States FALSE
+university of california irvine us Americas Northern America FALSE 1 2021-02-03 99651593 way "University of California, Irvine, Mesa View Drive, Newport Beach, Orange County, California, 92617-5135, United States" amenity university 0.932750585799837 United States FALSE
+university of california san diego us Americas Northern America FALSE 1 2021-02-03 94305187 way "University of California, San Diego, 9500, Gilman Drive, San Diego, San Diego County, California, 92093, United States" amenity university 1.04938836421927 United States FALSE
+university of colorado anschutz medical campus us Americas Northern America FALSE 1 2021-02-03 37514871 node "University of Colorado Anschutz Medical Campus, East 17th Place, Aurora, Adams County, Colorado, 80045, United States" amenity university 0.601 United States FALSE
+university of columbia us Americas Northern America FALSE 1 2021-02-03 105725399 way "Georgetown University, 3700, O Street Northwest, Georgetown, Washington, District of Columbia, 20057, United States" amenity university 0.887586492717596 United States FALSE
+university of connecticut avery point us Americas Northern America FALSE 1 2021-02-03 258603549 relation "University of Connecticut Avery Point, 1084, Shennecossett Road, Groton, New London County, Connecticut, 06340, United States" amenity university 0.501 United States FALSE
+university of dallas us Americas Northern America FALSE 1 2021-02-03 209882960 way "University of Dallas, Rochelle Boulevard, Irving, Dallas County, Texas, 75039, United States" amenity university 0.687650262005596 United States FALSE
+university of hawai'i us Americas Northern America FALSE 1 2021-02-03 158423062 way "University of Hawaiʻi, Lower Campus, Woodlawn Drive, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" amenity parking 0.401 United States FALSE
+university of kansas in lawrence us Americas Northern America FALSE 1 2021-02-03 226545942 way "University of Kansas, Louisiana Street, Malls Shopping Center, Lawrence, Douglas County, Kansas, 66046, United States" amenity university 1.06269698033331 United States FALSE
+university of kansas medical center us Americas Northern America FALSE 1 2021-02-03 156808377 way "University of Kansas Medical Center, 3901, Rainbow Boulevard, Kansas City, Wyandotte County, Kansas, 66160, United States" amenity hospital 0.781950414040809 United States FALSE
+university of louisiana us Americas Northern America FALSE 1 2021-02-03 226545942 way "University of Kansas, Louisiana Street, Malls Shopping Center, Lawrence, Douglas County, Kansas, 66046, United States" amenity university 0.862696980333312 United States FALSE
+"university of minnesota, morris" us Americas Northern America FALSE 1 2021-02-03 259054108 relation "University of Minnesota, Morris, Avenida de Cesar Chavez, Morris, Stevens County, Minnesota, 56267, United States" amenity university 0.401 United States FALSE
+university of mons us Americas Northern America FALSE 1 2021-02-03 118474741 way "Alabama State University, 915, South Jackson Street, Montgomery, Montgomery County, Alabama, 36104, United States" amenity university 0.509712984743276 United States FALSE
+university of namur us Americas Northern America FALSE 1 2021-02-03 2897922 node "Notre Dame de Namur University, Laxague Drive, Belmont, San Mateo County, California, 94002, United States" amenity school 0.201 United States FALSE
+university of nebraska medical center us Americas Northern America FALSE 1 2021-02-03 243858337 way "University of Nebraska Medical Center, Dewey Avenue, Omaha, Douglas County, Nebraska, 68198, United States" amenity university 0.501 United States FALSE
+university of nebraska omaha us Americas Northern America FALSE 1 2021-02-03 133934557 way "University of Nebraska at Omaha, University Drive South, Omaha, Douglas County, Nebraska, 68182, United States" amenity university 0.784723197268746 United States FALSE
+university of nebraska state museum us Americas Northern America FALSE 1 2021-02-03 54350454 node "University of Nebraska State Museum, 645, North 14th Street, Downtown, Haymarket, Lincoln, Lancaster County, Nebraska, 68588, United States" tourism museum 0.781950414040809 United States FALSE
+university of nebraska–lincoln us Americas Northern America FALSE 1 2021-02-03 105525403 way "Sheldon Museum of Art, North 12th Street, Downtown, Haymarket, Lincoln, Lancaster County, Nebraska, 68588-0300, United States" tourism gallery 0.603230229325644 United States FALSE
+university of nevada las vegas us Americas Northern America FALSE 1 2021-02-03 127461263 way "University of Nevada, Las Vegas, 4505, Maryland Circle, Midtown UNLV, Las Vegas, Clark County, Nevada, 89154, United States" amenity university 0.983772660357429 United States FALSE
+university of new hampshire school of law us Americas Northern America FALSE 1 2021-02-03 240177061 way "University of New Hampshire School of Law, Blanchard Street, West End, Concord, Merrimack County, New Hampshire, 03301, United States" amenity university 0.701 United States FALSE
+university of north carolina greensboro us Americas Northern America FALSE 1 2021-02-03 198171825 way "University of North Carolina - Greensboro, West Market Street, Westerwood, Greensboro, Guilford County, North Carolina, 27403, United States" amenity university 0.501 United States FALSE
+university of north carolina-chapel hill us Americas Northern America FALSE 1 2021-02-03 258459202 relation "University of North Carolina, South Columbia Street, Downtown, Chapel Hill, Orange County, North Carolina, 27516, United States" amenity university 1.18288921219039 United States FALSE
+university of north florida us Americas Northern America FALSE 1 2021-02-03 2878760 node "University of North Florida, South U N F Drive, Jacksonville, Duval County, Florida, 32246-6624, United States" amenity school 0.401 United States FALSE
+university of northern colorado us Americas Northern America FALSE 1 2021-02-03 167749471 way "University of Northern Colorado, 501, 20th Street, Jackson Field, Greeley, Weld County, Colorado, 80631, United States" amenity university 0.814405926306359 United States FALSE
+university of parma us Americas Northern America FALSE 1 2021-02-03 207662730 way "University Hospitals Parma Medical Center, 7007, Powers Boulevard, Cleveland, Cuyahoga County, Ohio, 44129, United States" amenity hospital 0.201 United States FALSE
+university of puerto rico-mayagüez us Americas Northern America FALSE 1 2021-02-03 144582128 way "Universidad de Puerto Rico - Recinto Universitario de Mayagüez, Calle Ceiba, Ensanche ParÃs, Barrio Pueblo, Mayagüez, Puerto Rico, 00680, United States" amenity university 0.648376470606964 United States FALSE
+university of puget sound us Americas Northern America FALSE 1 2021-02-03 95240431 way "University of Puget Sound, 1500, North Warner Street, Tacoma, Pierce County, Washington, 98416, United States" amenity university 0.841004242546897 United States FALSE
+university of rochester medical center us Americas Northern America FALSE 1 2021-02-03 208125826 way "University of Rochester Medical Center, 601, Elmwood Avenue, Upper Mount Hope, Rochester, Monroe County, New York, 14611, United States" amenity hospital 0.754365194683011 United States FALSE
+university of rutgers us Americas Northern America FALSE 1 2021-02-03 185251759 way "Rutgers University Newark, Washington Street, Teachers Village, Newark, Essex County, New Jersey, 07102, United States" amenity university 0.561038475674441 United States FALSE
+university of south alabama us Americas Northern America FALSE 1 2021-02-03 2909833 node "University of South Alabama, USA South Drive, West Hill, Mobile, Mobile County, Alabama, 36688, United States" amenity university 0.401 United States FALSE
+university of south alabama in mobile us Americas Northern America FALSE 1 2021-02-03 2909833 node "University of South Alabama, USA South Drive, West Hill, Mobile, Mobile County, Alabama, 36688, United States" amenity university 0.501 United States FALSE
+university of south carolina us Americas Northern America FALSE 1 2021-02-03 126084543 way "University of South Carolina, South Pickens Street, Hollywood, Columbia, Richland County, South Carolina, 29205, United States" amenity university 0.923689910980171 United States FALSE
+university of st thomas us Americas Northern America FALSE 1 2021-02-03 101263266 way "University of St. Thomas, Otis Avenue, St. Paul, Ramsey County, Minnesota, 55104, United States" amenity university 0.81644595554698 United States FALSE
+university of washington bothell us Americas Northern America FALSE 1 2021-02-03 101052625 way "University of Washington-Bothell, South Campus Way, Bothell, King County, Washington, 98011, United States" amenity university 0.702778707896871 United States FALSE
+university of wisconsin–madison us Americas Northern America FALSE 1 2021-02-03 259436351 relation "University of Wisconsin-Madison, Lake Mendota Drive, Madison, Dane County, Wisconsin, 53705, United States" amenity university 0.980768897517013 United States FALSE
+uprm us Americas Northern America FALSE 1 2021-02-03 203932623 way "UPRM Solar house project, Paseo Magas, Miradero, Mayagüez, Puerto Rico, 00680, United States" building house 0.101 United States FALSE
+us agricultural research service us Americas Northern America FALSE 1 2021-02-03 48071247 node "USDA, Agricultural Research Service, Phemister Road, Fort Collins, Larimer County, Colorado, 80525-1424, United States" office government 0.401 United States FALSE
+us air national guard us Americas Northern America FALSE 1 2021-02-03 259576829 relation "US Air National Guard, Savannah, Chatham County, Georgia, United States" landuse military 0.6 United States FALSE
+us appeals court us Americas Northern America FALSE 1 2021-02-03 90738673 way "Appeals Court, Independence, Kenton County, Kentucky, 41051, United States" highway residential 0.3 United States FALSE
+us bureau of land management us Americas Northern America FALSE 1 2021-02-03 64573812 node "La Posa South LTVA, US 95, Quartzsite, La Paz County, Arizona, 85346, United States" tourism caravan_site 0.101 United States FALSE
+us bureau of reclamation us Americas Northern America FALSE 1 2021-02-03 81194393 node "US Bureau of Reclamation, 4th Avenue North, West Downtown, Billings, Yellowstone County, Montana, 59101, United States" office government 0.401 United States FALSE
+us cdc us Americas Northern America FALSE 1 2021-02-03 172987439 way "CDC, New Center, Detroit, Wayne County, Michigan, United States" landuse farmyard 0.3 United States FALSE
+us centers for disease control us Americas Northern America FALSE 1 2021-02-03 245173649 way "Centers for Disease Control, Chester Creek Connector, Anchorage, Alaska, 99508-3501, United States" building yes 0.401 United States FALSE
+us central intelligence agency us Americas Northern America FALSE 1 2021-02-03 134865123 way "Central Intelligence Agency, Clearview Manor, McLean, Fairfax County, Virginia, United States" landuse government 0.5 United States FALSE
+us customs us Americas Northern America FALSE 1 2021-02-03 169811968 way "US Customs, Mc Aree Road, Eagle Ridge Apartments, Waukegan, Lake County, Illinois, 60087, United States" office government 0.201 United States FALSE
+us department of agriculture forest service us Americas Northern America FALSE 1 2021-02-03 48599253 node "US Department of Agriculture, Maine Avenue Southwest, Washington, District of Columbia, 20250, United States" office government 1.00973759439018 United States FALSE
+us department of commerce us Americas Northern America FALSE 1 2021-02-03 229151840 way "US Department of Commerce, Observatory Avenue, Garden Court Apartments, Ukiah, Mendocino County, California, 95482, United States" building yes 0.401 United States FALSE
+us department of interior us Americas Northern America FALSE 1 2021-02-03 148880750 way "Rincon Mountain Visitor Center, 3693, South Old Spanish Trail, Tucson, Pima County, Arizona, 85748, United States" tourism information 0.001 United States FALSE
+us department of veterans affairs us Americas Northern America FALSE 1 2021-02-03 231756243 way "US Department of Veterans Affairs, 1535, 1st Avenue East, MedQuarter, Cedar Rapids, Linn County, Iowa, 52402, United States" office government 0.501 United States FALSE
+us drug enforcement agency us Americas Northern America FALSE 1 2021-02-03 183416479 way "US Drug Enforcement Agency, World Communications Drive, Omaha, Douglas County, Nebraska, 68122, United States" building yes 0.401 United States FALSE
+us energy us Americas Northern America FALSE 1 2021-02-03 257952569 relation "Energy, Williamson County, Illinois, 62933, United States" boundary administrative 0.523032671836241 United States FALSE
+us federal aviation administration us Americas Northern America FALSE 1 2021-02-03 129948979 way "Federal Aviation Administration, Bernalillo County, New Mexico, United States" boundary administrative 0.65 United States FALSE
+us federal communications commission us Americas Northern America FALSE 1 2021-02-03 301202937 node "Federal Communications Commission, 45, L Street Northeast, NoMa, Near Northeast, Washington, District of Columbia, 20554, United States" office government 0.894765406107107 United States FALSE
+us government us Americas Northern America FALSE 1 2021-02-03 135061647 way "US Government, Blaine County, Montana, United States" boundary protected_area 0.325 United States FALSE
+us library of congress us Americas Northern America FALSE 1 2021-02-03 257979591 relation "Library of Congress, Thomas Jefferson Building, 2nd Street Southeast, Washington, District of Columbia, 20003, United States" tourism attraction 1.05445651415754 United States FALSE
+us marine corps us Americas Northern America FALSE 1 2021-02-03 11558120 node "US Marine Corps, 64, Kala Bagai Way, Downtown Berkeley, Berkeley, Alameda County, California, 94704, United States" office government 0.301 United States FALSE
+us massachusetts institute of technology us Americas Northern America FALSE 1 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 1.14674262776464 United States FALSE
+us national football league us Americas Northern America FALSE 1 2021-02-03 140878974 way "Bay Area Christian School Football Field, Oak Creek Drive, Oak Creek, League City, Galveston County, Texas, 77573, United States" leisure pitch 0.201 United States FALSE
+us national guard us Americas Northern America FALSE 1 2021-02-03 165631796 way "US National Guard, Montgomery County, Maryland, United States" landuse military 0.5 United States FALSE
+us national hurricane center us Americas Northern America FALSE 1 2021-02-03 212513790 way "National Hurricane Center, Miami-Dade County, Florida, 33199, United States" highway service 0.375 United States FALSE
+us national institute of aerospace us Americas Northern America FALSE 1 2021-02-03 181006875 way "National Institute of Aerospace (NIA) and U.S. Representative Scott Rigell, 1100, Exploration Way, Hampton Roads Center - North Campus, Hampton, Virginia, 23666, United States" building commercial 0.501 United States FALSE
+us national marine fisheries service us Americas Northern America FALSE 1 2021-02-03 98716401 way "National Marine Fisheries Service, Santa Cruz, Santa Cruz County, California, United States" boundary administrative 0.525 United States FALSE
+us national optical astronomy observatory us Americas Northern America FALSE 1 2021-02-03 39657118 node "National Optical Astronomy Observatory, 950, North Cherry Avenue, Tucson, Pima County, Arizona, 85721, United States" amenity research_institute 0.401 United States FALSE
+us national robotics engineering center us Americas Northern America FALSE 1 2021-02-03 162468249 way "National Robotics Engineering Center, 10, 40th Street, Lawrenceville, Central Lawrenceville, Pittsburgh, Allegheny County, Pennsylvania, 15201, United States" building industrial 0.590508362962683 United States FALSE
+us national wildlife federation us Americas Northern America FALSE 1 2021-02-03 232820332 way "National Wildlife Federation, Business Center Drive, Pinecrest, Reston, Fairfax County, Virginia, 20190, United States" man_made works 0.401 United States FALSE
+us office of personnel management us Americas Northern America FALSE 1 2021-02-03 106443728 way "Office of Personnel Management, 1900, E Street Northwest, Washington, District of Columbia, 20006, United States" office government 0.401 United States FALSE
+us pacific tsunami warning center us Americas Northern America FALSE 1 2021-02-03 297701617 node "Pacific Tsunami Warning Center, Perimeter Road, Pacific Tsunami Warning Center, Ewa Beach, Honolulu County, Hawaii, 96706, United States" man_made monitoring_station 0.754544854295327 United States FALSE
+us postal service us Americas Northern America FALSE 1 2021-02-03 224813157 way "US Postal Service, Sutton, Matanuska-Susitna, Alaska, United States" landuse industrial 0.5 United States FALSE
+us ski and snowboard association us Americas Northern America FALSE 1 2021-02-03 253409560 way "Nichols Ski and Snowboard, 21938, Michigan Avenue, Morley Area Residents Association, Dearborn, Wayne County, Michigan, 48124, United States" shop sports 0.401 United States FALSE
+us social security administration us Americas Northern America FALSE 1 2021-02-03 76558039 node "US Social Security Administration, West Sedgley Avenue, Philadelphia, Philadelphia County, Pennsylvania, 19132, United States" office government 0.401 United States FALSE
+us white house us Americas Northern America FALSE 1 2021-02-03 147370893 way "White House, 1600, Pennsylvania Avenue Northwest, Washington, District of Columbia, 20500, United States" historic castle 0.93472115416811 United States FALSE
+usf us Americas Northern America FALSE 1 2021-02-03 258794377 relation "University of San Francisco, 2130, Fulton Street, North of Panhandle, San Francisco, San Francisco City and County, California, 94117, United States" amenity university 0.483095905643059 United States FALSE
+uta us Americas Northern America FALSE 1 2021-02-03 257844025 relation "Utah, United States" boundary administrative 0.803765430740067 United States FALSE
+uw medicine us Americas Northern America FALSE 1 2021-02-03 151366370 way "UW Medicine, North 205th Street - 244th Street Southwest, Edmonds, Snohomish County, Washington, 98026, United States" building yes 0.201 United States FALSE
+vaccine research center us Americas Northern America FALSE 1 2021-02-03 213549295 way "Vaccine Research Center, Convent Drive, National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, 20891, United States" building yes 0.301 United States FALSE
+vanderbilt university medical center us Americas Northern America FALSE 1 2021-02-03 198973508 way "Vanderbilt University Medical Center, 1211, Medical Center Drive, Nashville-Davidson, Davidson County, Tennessee, 37232, United States" amenity hospital 0.7277684953714 United States FALSE
+venter institute us Americas Northern America FALSE 1 2021-02-03 183799690 way "J. Craig Venter Institute, Capricorn Lane, San Diego, San Diego County, California, 92093, United States" building university 0.201 United States FALSE
+vi-systems us Americas Northern America FALSE 1 2021-02-03 173136088 way "Systems, Berry Street, South Beach, San Francisco, San Francisco City and County, California, 94158, United States" tourism artwork 0.101 United States FALSE
+vickers us Americas Northern America FALSE 1 2021-02-03 404820 node "Vickers, Northwood, Wood County, Ohio, 43619, United States" place hamlet 0.35 United States FALSE
+village veterinary medical center us Americas Northern America FALSE 1 2021-02-03 178105276 way "Village Veterinary Medical Center, Kingston Pike, Dixie Lee Junction, Farragut, Knox County, Tennessee, 37934, United States" amenity veterinary 0.401 United States FALSE
+voice of america us Americas Northern America FALSE 1 2021-02-03 243204715 way "Voice of America, Marathon, Monroe County, Florida, United States" landuse industrial 0.5 United States FALSE
+von kleinsmid center us Americas Northern America FALSE 1 2021-02-03 259003738 relation "Von Kleinsmid Center for International and Public Affairs, 3518, Trousdale Parkway, University Park, Los Angeles, Los Angeles County, California, 90089, United States" building university 0.301 United States FALSE
+wakemed us Americas Northern America FALSE 1 2021-02-03 116051721 way "WakeMed Soccer Park, Cary, Wake County, North Carolina, United States" leisure park 0.515288505579639 United States FALSE
+wal-mart us Americas Northern America FALSE 1 2021-02-03 171263241 way "Wal-Mart, Frisco, Denton County, Texas, 75036, United States" highway service 0.275 United States FALSE
+wash us Americas Northern America FALSE 1 2021-02-03 257846660 relation "Washington, United States" boundary administrative 0.812929792315567 United States FALSE
+washington college us Americas Northern America FALSE 1 2021-02-03 195835630 way "Washington College, 300, Washington Avenue, Lees Corner, Chestertown, Kent County, Maryland, 21620, United States" amenity university 0.616731953273046 United States FALSE
+washington times us Americas Northern America FALSE 1 2021-02-03 162772326 way "Washington Times, 3600, New York Avenue Northeast, Washington, District of Columbia, 20002, United States" office newspaper 0.201 United States FALSE
+web of science us Americas Northern America FALSE 1 2021-02-03 64913555 node "Web Science and Digital Libraries Research Group, 4600, Elkhorn Avenue, Norfolk, Virginia, 23508, United States" office yes 0.201 United States FALSE
+weeden us Americas Northern America FALSE 1 2021-02-03 2424327 node "Weeden Hill, Windsor, Windsor County, Vermont, United States" natural peak 0.4 United States FALSE
+welsh us Americas Northern America FALSE 1 2021-02-03 257788849 relation "Welsh, Jefferson Davis Parish, Louisiana, 70591, United States" boundary administrative 0.36851441835616 United States FALSE
+wesleyan us Americas Northern America FALSE 1 2021-02-03 433666 node "Wesleyan, Macon, Bibb County, Georgia, 31210, United States" place neighbourhood 0.35 United States FALSE
+west virginia department of environmental protection us Americas Northern America FALSE 1 2021-02-03 83977046 node "West Virginia Department of Environmental Protection, 607, 57th Street Southeast, Charleston, Kanawha County, West Virginia, 25304, United States" office government 0.601 United States FALSE
+western environmental law center us Americas Northern America FALSE 1 2021-02-03 45649564 node "Western Environmental Law Center: Northern Rockies Office, Reeders Alley, Last Chance Gulch, Helena, Lewis and Clark County, Montana, 59601, United States" office lawyer 0.401 United States FALSE
+white oak conservation center us Americas Northern America FALSE 1 2021-02-03 253782332 way "Conservation Center, Inner Loop, Houston, Harris County, Texas, 77024-8022, United States" building yes 0.201 United States FALSE
+whittemore peterson institute in reno us Americas Northern America FALSE 1 2021-02-03 174133369 way "Whittemore Peterson Institute, North Medical Way, Reno, Washoe County, Nevada, 89557, United States" building university 0.501 United States FALSE
+wichita state university us Americas Northern America FALSE 1 2021-02-03 2785487 node "Wichita State University, Perimeter Road, Wichita, Sedgwick County, Kansas, 67260-0074, United States" amenity university 0.755054694349514 United States FALSE
+wikimedia foundation us Americas Northern America FALSE 1 2021-02-03 60460773 node "Wikimedia Foundation, 120, Kearny Street, Union Square, San Francisco, San Francisco City and County, California, 94104, United States" office foundation 1.04735447105057 United States FALSE
+wildlife department us Americas Northern America FALSE 1 2021-02-03 235737387 way "Red Rock Wildlife Management Area, Game Department Road, Grant County, New Mexico, United States" leisure nature_reserve 0.201 United States FALSE
+wildlife services us Americas Northern America FALSE 1 2021-02-03 208429848 way "US Fish & Wildlife Services, 101, Park de Ville Drive, Fairview Marketplace, Columbia, Boone County, Missouri, 65203, United States" building yes 0.201 United States FALSE
+wilmerhale us Americas Northern America FALSE 1 2021-02-03 299916888 node "WilmerHale, 60, State Street, Dock Square, Financial District, Boston, Suffolk County, Massachusetts, 02109, United States" office lawyer 0.101 United States FALSE
+winthrop hospital us Americas Northern America FALSE 1 2021-02-03 258517235 relation "Winthrop, Suffolk County, Massachusetts, 02152, United States" boundary administrative 0.548258147549701 United States FALSE
+wisc-tv us Americas Northern America FALSE 1 2021-02-03 2318577 node "WISC-TV (Madison), Daytona Beach Drive, Madison, Dane County, Wisconsin, 53711, United States" man_made tower 0.201 United States FALSE
+wisconsin alumni research foundation us Americas Northern America FALSE 1 2021-02-03 101032142 way "Wisconsin Alumni Research Foundation, 614, Walnut Street, Madison, Dane County, Wisconsin, 53706, United States" building university 0.401 United States FALSE
+withers us Americas Northern America FALSE 1 2021-02-03 423638 node "Withers, Washington County, Virginia, United States" place hamlet 0.35 United States FALSE
+woodrow wilson international center for scholars us Americas Northern America FALSE 1 2021-02-03 47333285 node "Woodrow Wilson International Center for Scholars, 1300, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20004, United States" office government 1.00659791861715 United States FALSE
+woods hole us Americas Northern America FALSE 1 2021-02-03 489384 node "Woods Hole, Falmouth, Barnstable County, Massachusetts, 02543, United States" place village 0.599945269937336 United States FALSE
+worcester polytechnic institute us Americas Northern America FALSE 1 2021-02-03 299167589 relation "Worcester Polytechnic Institute, 100, Institute Road, Lincoln Square, Hammond Heights, Worcester, Worcester County, Massachusetts, 01609, United States" amenity university 0.727443521124928 United States FALSE
+world commission us Americas Northern America FALSE 1 2021-02-03 69631578 node "Calhoun County Participation in World War II, South Ann Street, Port Lavaca, Calhoun County, Texas, 77979, United States" tourism information 0.101 United States FALSE
+wyeth us Americas Northern America FALSE 1 2021-02-03 384418 node "Wyeth, Andrew County, Missouri, 64483, United States" place hamlet 0.35 United States FALSE
+xavier university of louisiana us Americas Northern America FALSE 1 2021-02-03 296045405 way "Xavier University of Louisiana, 1, Drexel Drive, Mid-City, New Orleans, Orleans Parish, Louisiana, 70135, United States" amenity university 0.801059138797379 United States FALSE
+xcel energy us Americas Northern America FALSE 1 2021-02-03 119271696 way "Xcel Energy, 1901, East Horsetooth Road, Peachtree, Fort Collins, Larimer County, Colorado, 80525, United States" building yes 0.581776066939633 United States FALSE
+xcor us Americas Northern America FALSE 1 2021-02-03 296995407 way "Xcor Aerospace, Earhart Drive, Midland Spaceport Business Park, Midland, Midland County, Texas, United States" aeroway hangar 0.101 United States FALSE
+xerox us Americas Northern America FALSE 1 2021-02-03 197336370 way "Xerox, Wilsonville, Metro, Oregon, United States" landuse industrial 0.3 United States FALSE
+yahoo us Americas Northern America FALSE 1 2021-02-03 259181165 relation "Yahoo, Sunnyvale, Santa Clara County, California, United States" landuse commercial 0.3 United States FALSE
+yale law school us Americas Northern America FALSE 1 2021-02-03 258747361 relation "Yale Law School, 127, Wall Street, Downtown, New Haven, New Haven County, Connecticut, 06511-8918, United States" building university 0.301 United States FALSE
+zebrafish international resource center us Americas Northern America FALSE 1 2021-02-03 226773628 way "Zebrafish International Resource Center, 1307, Franklin Boulevard, Eugene, Lane County, Oregon, 97403-5274, United States" building yes 0.401 United States FALSE
+zynga us Americas Northern America FALSE 1 2021-02-03 128825110 way "Zynga, 650, Townsend Street, West SoMa, San Francisco, San Francisco City and County, California, 90103, United States" building yes 0.101 United States FALSE
+bwindi impenetrable forest ug Africa Eastern Africa FALSE 1 2021-02-03 258803943 relation "Bwindi Impenetrable Forest, Mpungu Sub-County, Kisoro, Western Region, Uganda" natural wood 0.562719188578863 Uganda FALSE
+civil aviation authority ug Africa Eastern Africa FALSE 1 2021-02-03 170067698 way "Civil Aviation Authority, Airport Road, Old Entebbe Subward, Kigungu Ward, Bukiberu, Wakiso, Central Region, 7545, Uganda" office government 0.61689306175332 Uganda FALSE
+ethiopian airlines ug Africa Eastern Africa FALSE 1 2021-02-03 43675550 node "Ethiopian Airlines, Kimathi Avenue, Kibuli, Nakasero, Kampala Capital City, Kampala, Central Region, 7063, Uganda" office company 0.201 Uganda FALSE
+genetic technologies ug Africa Eastern Africa FALSE 1 2021-02-03 72430341 node "AGT Agro Genetic Technologies, Fort Portal - Kampala Road, Kiwumu, Buloba, Wakiso, Central Region, P.O BOX 14047, Uganda" office research 0.201 Uganda FALSE
+institute of pure ug Africa Eastern Africa FALSE 1 2021-02-03 62440383 node "Umma Islamic Institute Yumbe, Moyo Road, Ibanga, Yumbe, Northern Region, 6, Uganda" amenity school 0.101 Uganda FALSE
+licensing board ug Africa Eastern Africa FALSE 1 2021-02-03 52447752 node "Ministry of Works and Transport - Transport Licensing Board - Main Office, Old Portbell Road, Wankoko, Kiswa, Kampala Capital City, Kampala, Central Region, 24144, Uganda" office government 0.201 Uganda FALSE
+makerere ug Africa Eastern Africa FALSE 1 2021-02-03 22277112 node "Makerere, Kampala Capital City, Kampala, Central Region, P.O. BOX 36152 KAMPALA, Uganda" place suburb 0.375 Uganda FALSE
+mbarara university ug Africa Eastern Africa FALSE 1 2021-02-03 48867675 node "Mbarara University of Science and Technology, University Road, Boma B, Mbarara, Western Region, PO BOX 1051, Uganda" amenity school 0.201 Uganda FALSE
+oci ug Africa Eastern Africa FALSE 1 2021-02-03 60558755 node "Oci, Ajia, Arua, Northern Region, Uganda" place village 0.375 Uganda FALSE
+ötzi ug Africa Eastern Africa FALSE 1 2021-02-03 47932812 node "Mount Otze, Moyo, Northern Region, Uganda" natural peak 0.3 Uganda FALSE
+uganda virus research institute ug Africa Eastern Africa FALSE 1 2021-02-03 176398119 way "Uganda Virus Research Institute, 51-59, Nakiwogo Road, Lunyo Estate, Nakiwogo, Entebbe, Wakiso, Central Region, 31304, Uganda" office research 0.401 Uganda FALSE
+almaz ua Europe Eastern Europe FALSE 1 2021-02-03 2367823 node "Ð<90>лмаз, Пшенична вулицÑ<8f>, Перемога, Борщагівка, СвÑ<8f>тошинÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 03165, Україна" railway halt 0.31689306175332 Україна FALSE
+bogomoletz institute of physiology ua Europe Eastern Europe FALSE 1 2021-02-03 103259236 way "ІнÑ<81>титут фізіології ім. О.О. БогомольцÑ<8f> Ð<9d>Ð<90>Ð<9d>У, 4, Ð<90>кадеміка БогомольцÑ<8f> вулицÑ<8f>, ЛевашовÑ<81>ька Гора, Липки, ПечерÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 01043, Україна" office research 0.001 Україна FALSE
+climate council ua Europe Eastern Europe FALSE 1 2021-02-03 17215913 node "Кліматичний Ñ<81>алон ""Мертвого морÑ<8f>"", 12, Городище вулицÑ<8f>, СуховолÑ<8f>, ТруÑ<81>кавець, ТруÑ<81>кавецька міÑ<81>ька об'єднана територіальна громада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 82200, Україна" amenity doctors 0.001 Україна FALSE
+cwc ua Europe Eastern Europe FALSE 1 2021-02-03 259500805 relation "Міжнародний Ð<90>еропорт Чернівці, УÑ<81>тима Кармелюка вулицÑ<8f>, Чернівці, Чернівецький район, Чернівецька облаÑ<81>Ñ‚ÑŒ, 58009, Україна" aeroway aerodrome 0.343659122005759 Україна FALSE
+elkh ua Europe Eastern Europe FALSE 1 2021-02-03 44342547 node "Ðльх-КаÑ<8f>, ДобровÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, СимферопольÑ<81>кий район, 98533, Україна" natural peak 0.3 Україна FALSE
+grl ua Europe Eastern Europe FALSE 1 2021-02-03 79972495 node "ГРЛ, КиївÑ<81>ький район, Полтава, ПoлтaвÑ<81>ькa міÑ<81>ька громада, ПолтавÑ<81>ький район, ПолтавÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 36007, Україна" place suburb 0.275 Україна FALSE
+hrk ua Europe Eastern Europe FALSE 1 2021-02-03 100226680 way "Міжнародний аеропорт ""Харків"", Планерний провулок, ОÑ<81>нов’Ñ<8f>нÑ<81>ький район, Харків, Ð¥apківÑ<81>ькa міÑ<81>ька громада, ХарківÑ<81>ький район, ХарківÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 61031, Україна" aeroway aerodrome 0.436669512144612 Україна FALSE
+institute of geological sciences ua Europe Eastern Europe FALSE 1 2021-02-03 118391727 way "ІнÑ<81>титут геологічних наук, 55б, ОлеÑ<81>Ñ<8f> Гончара вулицÑ<8f>, СвÑ<8f>тоÑ<81>лавÑ<81>ький Ñ<8f>Ñ€, Центр, ШевченківÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 01054, Україна" building university 0.001 Україна FALSE
+ivf ua Europe Eastern Europe FALSE 1 2021-02-03 257286052 relation "Івано-ФранківÑ<81>ька облаÑ<81>Ñ‚ÑŒ, Україна" boundary administrative 0.598264833674486 Україна FALSE
+national climate council ua Europe Eastern Europe FALSE 1 2021-02-03 17215913 node "Кліматичний Ñ<81>алон ""Мертвого морÑ<8f>"", 12, Городище вулицÑ<8f>, СуховолÑ<8f>, ТруÑ<81>кавець, ТруÑ<81>кавецька міÑ<81>ька об'єднана територіальна громада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 82200, Україна" amenity doctors 0.001 Україна FALSE
+national scientific research council ua Europe Eastern Europe FALSE 1 2021-02-03 126589521 way "Ð<9d>ауководоÑ<81>лідний інÑ<81>титут ""Синтез"", ТуÑ<81>тановичі, БориÑ<81>лав, БориÑ<81>лавÑ<81>ький Ñ<81>тароÑ<81>тинÑ<81>ький округ, БориÑ<81>лавÑ<81>ька міÑ<81>ька рада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, Україна" landuse industrial 0.2 Україна FALSE
+nektar ua Europe Eastern Europe FALSE 1 2021-02-03 157515631 way "4, Ð<9d>ектар, Вишків, Луцьк, Луцька міÑ<81>ька громада, Луцький район, ВолинÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 43000-43499, Україна" landuse industrial 0.2 Україна FALSE
+nmts ua Europe Eastern Europe FALSE 1 2021-02-03 202363077 way "19, Ð<9d>авчальний центр цивільного захиÑ<81>ту, Броди, БродівÑ<81>ька міÑ<81>ька рада, ЗолочівÑ<81>ький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 80600-80603, Україна" landuse commercial 0.2 Україна FALSE
+ods ua Europe Eastern Europe FALSE 1 2021-02-03 138824479 way "Міжнародний аеропорт ""ОдеÑ<81>а"", Івана та ЮріÑ<8f> Лип вулицÑ<8f>, 10-й квартал, Район IV-1 ""Південно-Західний"" (""Черемушки""), МалиновÑ<81>ький район, ОдеÑ<81>а, ОдеÑ<81>ький район, ОдеÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 65078, Україна" aeroway aerodrome 0.445681568627775 Україна FALSE
+polytechnic university of milan ua Europe Eastern Europe FALSE 1 2021-02-03 48343820 node "Політехнічний універÑ<81>итет, Шевченка проÑ<81>пект, Відрада, ПриморÑ<81>ький район, ОдеÑ<81>а, ОдеÑ<81>ький район, ОдеÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 65050, Україна" highway bus_stop 0.001 Україна FALSE
+saints cyril ua Europe Eastern Europe FALSE 1 2021-02-03 22338079 node "Пам'Ñ<8f>тник Кирилу Ñ– Мефодію, Кирила Ñ– МефодіÑ<8f> площа, Пентагон, Мукачево, МукачівÑ<81>ька міÑ<81>ька громада, МукачівÑ<81>ький район, ЗакарпатÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 89600, Україна" historic memorial 0.001 Україна FALSE
+scientific council ua Europe Eastern Europe FALSE 1 2021-02-03 126589521 way "Ð<9d>ауководоÑ<81>лідний інÑ<81>титут ""Синтез"", ТуÑ<81>тановичі, БориÑ<81>лав, БориÑ<81>лавÑ<81>ький Ñ<81>тароÑ<81>тинÑ<81>ький округ, БориÑ<81>лавÑ<81>ька міÑ<81>ька рада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, Україна" landuse industrial 0.2 Україна FALSE
+uae ministry of foreign affairs ua Europe Eastern Europe FALSE 1 2021-02-03 96214681 way "МініÑ<81>терÑ<81>тво закордонних Ñ<81>прав, 1, МихайлівÑ<81>ька площа, Старий Київ, Центр, ШевченківÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 01025, Україна" amenity public_building 0.436669512144612 Україна FALSE
+unified command ua Europe Eastern Europe FALSE 1 2021-02-03 159462615 way "Kommandobunkersilo, Ð<9d>-24, СинюхинобрідÑ<81>ька Ñ<81>ільÑ<81>ька територіальна громада, ПервомайÑ<81>ький район, МиколаївÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 55235, Україна" building silo 0.001 Україна FALSE
+aga khan university tz Africa Eastern Africa FALSE 1 2021-02-03 68562414 node "Aga Khan University, T5, Arusha, Northern Zone, 10086, Tanzania" amenity school 0.301 Tanzania FALSE
+antiquities authority tz Africa Eastern Africa FALSE 1 2021-02-03 49902313 node "Antiquities Authority (to get permit for islands), Kilwa-Nangurukuru Road, Kilwa Masoko, Kilwa, Lindi, Coastal Zone, Tanzania" office government 0.201 Tanzania FALSE
+environmental laboratory tz Africa Eastern Africa FALSE 1 2021-02-03 123904242 way "Environmental Laboratory, Makongo Road, Makongo, Dar es Salaam, Coastal Zone, 225, Tanzania" building school 0.201 Tanzania FALSE
+ifakara health institute tz Africa Eastern Africa FALSE 1 2021-02-03 168888993 way "Ifakara Health Institute, Bagamoyo Road, Mwanakalenge, Bagamoyo, Pwani, Coastal Zone, 66, Tanzania" building yes 0.301 Tanzania FALSE
+imi tz Africa Eastern Africa FALSE 1 2021-02-03 42593582 node "Ihemi, Iringa, Southern Highlands Zone, Tanzania" place village 0.275 Tanzania FALSE
+institute of medical research tz Africa Eastern Africa FALSE 1 2021-02-03 52660057 node "Institute of Rural Development Planning, Machinjioni-Bwiru, Kitangiri, Mihama, Ilemela, Mwanza, Lake Zone, +225, Tanzania" office educational_institution 0.201 Tanzania FALSE
+institute of meteorology tz Africa Eastern Africa FALSE 1 2021-02-03 54166158 node "Institute of Meteorology, Majengo Mwanga Street, Katubuka, Kigoma Rural, Kigoma, Western Zone, 47000, Tanzania" amenity school 0.301 Tanzania FALSE
+nhc tz Africa Eastern Africa FALSE 1 2021-02-03 80286627 node "Nhc, Muleba, Kagera, Lake Zone, Tanzania" place village 0.375 Tanzania FALSE
+obey as house tz Africa Eastern Africa FALSE 1 2021-02-03 46195275 node "Obey, T9, Kasulu, Kigoma, Western Zone, 35, Tanzania" shop stationery 0.201 Tanzania FALSE
+orbital tz Africa Eastern Africa FALSE 1 2021-02-03 202732260 way "Orbital, Babati, Manyara, Northern Zone, Tanzania" highway unclassified 0.2 Tanzania FALSE
+people's democratic party tz Africa Eastern Africa FALSE 1 2021-02-03 44502629 node "United People's Democratic Party (UPDP), 21, Kagera Street, Kagera, Makurumla, Dar es Salaam, Coastal Zone, P.O.BOX 22304, Tanzania" office political_party 0.401 Tanzania FALSE
+queensland institute of medical research tz Africa Eastern Africa FALSE 1 2021-02-03 52660057 node "Institute of Rural Development Planning, Machinjioni-Bwiru, Kitangiri, Mihama, Ilemela, Mwanza, Lake Zone, +225, Tanzania" office educational_institution 0.201 Tanzania FALSE
+saint joseph university tz Africa Eastern Africa FALSE 1 2021-02-03 225955760 way "St.Joseph University, Morogoro Road, Mbezi, Dar es Salaam, Coastal Zone, 11007, Tanzania" amenity university 0.201 Tanzania FALSE
+sstl tz Africa Eastern Africa FALSE 1 2021-02-03 175656650 way "SSTL Group, Bwawani, Mwananyamala, Dar es Salaam, Coastal Zone, 31537, Tanzania" office company 0.101 Tanzania FALSE
+tanzania national parks tz Africa Eastern Africa FALSE 1 2021-02-03 197453437 way "Simba A public campsite, T17, Kimba, Ngorongoro, Arusha, Northern Zone, Tanzania" tourism camp_site 0.101 Tanzania FALSE
+university of dar es salaam tz Africa Eastern Africa FALSE 1 2021-02-03 889510 node "University of Dar es Salaam, University Road, Chuo Kikuu, Ubungo, Dar es Salaam, Coastal Zone, 131, Tanzania" amenity university 0.896675389924706 Tanzania FALSE
+chiao tung university tw Asia Eastern Asia FALSE 1 2021-02-03 258760261 relation "國立交通大å¸å…‰å¾©æ ¡å<8d>€, 1001, 大å¸è·¯, 光明里, æ<9d>±å<8d>€, 新竹市, 30010, 臺ç<81>£" amenity university 0.438299554906152 臺ç<81>£ FALSE
+ctv tw Asia Eastern Asia FALSE 1 2021-02-03 108045711 way "ä¸åœ‹é›»è¦–å…¬å<8f>¸, 120, é‡<8d>陽路, 基河國宅三期, å<8d>—港å<8d>€, 三é‡<8d>埔, 臺北市, 11573, 臺ç<81>£" amenity studio 0.480565769794864 臺ç<81>£ FALSE
+democratic progressive party tw Asia Eastern Asia FALSE 1 2021-02-03 25178248 node "民主進æ¥é»¨, 30, 北平æ<9d>±è·¯, å…‰è<8f>¯å•†å ´, 梅花里, ä¸æ£å<8d>€, è<8f>¯å±±, 臺北市, 10049, 臺ç<81>£" office political_party 0.513806514981921 臺ç<81>£ FALSE
+executive yuan tw Asia Eastern Asia FALSE 1 2021-02-03 59877038 node "行政院, 1, å¿ å<9d>æ<9d>±è·¯ä¸€æ®µ, 梅花里, ä¸æ£å<8d>€, è<8f>¯å±±, 臺北市, 10058, 臺ç<81>£" office government 0.528630874953084 臺ç<81>£ FALSE
+hsus tw Asia Eastern Asia FALSE 1 2021-02-03 54120623 node "許金å<90>‰å©¦ç”¢ç§‘診所, 155, 繼光街, 繼光里, ä¸å<8d>€, 臺ä¸å¸‚, 40046, 臺ç<81>£" amenity clinic 0.001 臺ç<81>£ FALSE
+ministry of health and welfare tw Asia Eastern Asia FALSE 1 2021-02-03 14219486 node "å<81>¥ä¿<9d>局站, ä¹<9d>如二路, å¾·ä»<81>里, 三民å<8d>€, 高雄市, 807, 臺ç<81>£" highway bus_stop 0.001 臺ç<81>£ FALSE
+national central university tw Asia Eastern Asia FALSE 1 2021-02-03 133790181 way "國立ä¸å¤®å¤§å¸, 300, ä¸å¤§è·¯, 上三座屋, 五權里, ä¸å£¢å<8d>€, 桃園市, 320, 臺ç<81>£" amenity university 0.4530695196617 臺ç<81>£ FALSE
+national taiwan university of science and technology tw Asia Eastern Asia FALSE 1 2021-02-03 258700551 relation "國立臺ç<81>£ç§‘技大å¸, 43, 基隆路四段, å¸åºœé‡Œ, 大安å<8d>€, 公館, 臺北市, 10607, 臺ç<81>£" amenity university 0.403228244753236 臺ç<81>£ FALSE
+national tsing hua university tw Asia Eastern Asia FALSE 1 2021-02-03 258520993 relation "國立清è<8f>¯å¤§å¸, 101, 光復路二段, è»<8d>功里, æ<9d>±å<8d>€, 新竹市, 30013, 臺ç<81>£" amenity university 0.460442945520659 臺ç<81>£ FALSE
+ntust tw Asia Eastern Asia FALSE 1 2021-02-03 297907542 node "臺ç<81>£ç§‘技大å¸æ£é–€, 基隆路四段, å¸åºœé‡Œ, 大安å<8d>€, 公館, 臺北市, 10607, 臺ç<81>£" amenity bicycle_rental 0.001 臺ç<81>£ FALSE
+penghu tw Asia Eastern Asia FALSE 1 2021-02-03 258475315 relation "澎湖縣, 臺ç<81>£" boundary administrative 0.518098074053445 臺ç<81>£ FALSE
+shilin district court tw Asia Eastern Asia FALSE 1 2021-02-03 302352027 relation "ç¦<8f>德里, 士林å<8d>€, 臺北市, 臺ç<81>£" boundary administrative 0.450936419284163 臺ç<81>£ FALSE
+supreme administrative court tw Asia Eastern Asia FALSE 1 2021-02-03 25702443 node "最高行政法院, 1, é‡<8d>æ…¶å<8d>—路一段126å··, 建國里, ä¸æ£å<8d>€, 城內, 臺北市, 10048, 臺ç<81>£" amenity courthouse 0.26358119422997 臺ç<81>£ FALSE
+china computer federation tt Americas Caribbean FALSE 1 2021-02-03 38056389 node "The New China Palace Restaurant and Bar, Rapsey Street, Ellerslie Park, Federation Park, Port of Spain, 190130, Trinidad and Tobago" amenity restaurant 0.201 Trinidad and Tobago FALSE
+trinidad and tobago tt Americas Caribbean FALSE 1 2021-02-03 258485524 relation Trinidad and Tobago boundary administrative 0.975753620834238 Trinidad and Tobago FALSE
+bilkent university tr Asia Western Asia FALSE 1 2021-02-03 96394890 way "Bilkent Üniversitesi, 1598. Cadde, Bilkent, Üniversiteler Mahallesi, Çankaya, Ankara, İç Anadolu Bölgesi, 06800, Türkiye" amenity university 0.101 Türkiye FALSE
+istac tr Asia Western Asia FALSE 1 2021-02-03 103485000 way "ISTAC, Göktürk Merkez Mahallesi, Eyüpsultan, İstanbul, Marmara Bölgesi, 34077, Türkiye" highway unclassified 0.2 Türkiye FALSE
+istanbul technical university tr Asia Western Asia FALSE 1 2021-02-03 299541318 relation "İstanbul Teknik Üniversitesi, Hacı Sokağı, Reşitpaşa Mahallesi, Sarıyer, İstanbul, Marmara Bölgesi, 34467, Türkiye" amenity university 0.478845445337603 Türkiye FALSE
+koç university tr Asia Western Asia FALSE 1 2021-02-03 182910189 way "Koç Ãœniversitesi, Koç Meydanı, Rumeli Feneri Mahallesi, Sarıyer, Ä°stanbul, Marmara Bölgesi, 34450, Türkiye" amenity university 0.507183702790066 Türkiye FALSE
+nike tr Asia Western Asia FALSE 1 2021-02-03 116094096 way "NIKE, Datça, Ege Bölgesi, Türkiye" landuse military 0.445499031753052 Türkiye FALSE
+nişantaşı university tr Asia Western Asia FALSE 1 2021-02-03 76974025 node "NiÅŸantaşı Ãœniversitesi Kampüsü, Ergenekon Caddesi, Bozkurt Mahallesi, Cumhuriyet Mahallesi, ÅžiÅŸli, Ä°stanbul, Marmara Bölgesi, Türkiye" amenity university 0.101 Türkiye FALSE
+okeanos tr Asia Western Asia FALSE 1 2021-02-03 190826338 way "27, Okeanos, Selimiye, Manavgat, Antalya, Akdeniz Bölgesi, Türkiye" landuse residential 0.3 Türkiye FALSE
+onc tr Asia Western Asia FALSE 1 2021-02-03 61860502 node "Onc, Kamil Sokağı, Orhangazi, Orhangazi Mahallesi, Sultanbeyli, İstanbul, Marmara Bölgesi, 34925, Türkiye" shop furniture 0.101 Türkiye FALSE
+sabanci university tr Asia Western Asia FALSE 1 2021-02-03 112700587 way "Sabancı Üniversitesi, Yetkin Sokağı, Orta Mahallesi, Tuzla, İstanbul, Marmara Bölgesi, 34956, Türkiye" amenity university 0.40124284206117 Türkiye FALSE
+sabancı university tr Asia Western Asia FALSE 1 2021-02-03 112700587 way "Sabancı Ãœniversitesi, Yetkin Sokağı, Orta Mahallesi, Tuzla, Ä°stanbul, Marmara Bölgesi, 34956, Türkiye" amenity university 0.50124284206117 Türkiye FALSE
+hpa to Oceania Polynesia FALSE 1 2021-02-03 162568512 way "Mala'e Vakapuna Salote Pilolevu, Hala Holopeka, Niu a Kalo, Pangai, Vahe Lifuka, Haʻapai, Tonga" aeroway aerodrome 0.249182950422608 Tonga FALSE
+cme tn Africa Northern Africa FALSE 1 2021-02-03 248166891 way "CME, الزهروني, معتمدية الØرائرية, ØÙŠ السلامة, ولاية تونس, تونس" landuse commercial 0.3 تونس FALSE
+gfi tn Africa Northern Africa FALSE 1 2021-02-03 259231351 relation "القÙ<81>Ù‰, معتمدية السبيخة, ولاية القيروان, تونس" boundary administrative 0.45 تونس FALSE
+mida tn Africa Northern Africa FALSE 1 2021-02-03 259125031 relation "الميدة, معتمدية الميدة, ولاية نابل, تونس" boundary administrative 0.45 تونس FALSE
+ne syrtis tn Africa Northern Africa FALSE 1 2021-02-03 259313705 relation "خليج قابس, ولاية صÙ<81>اقس, تونس" natural bay 0.410111385609355 تونس FALSE
+sbi tn Africa Northern Africa FALSE 1 2021-02-03 258953939 relation "‫صبيØ‬, معتمدية الصخيرة, ولاية صÙ<81>اقس, 3073, تونس" boundary administrative 0.45 تونس FALSE
+world bank group tl Asia South-Eastern Asia FALSE 1 2021-02-03 191303191 way "World Bank Group, Avenida Marginal, Lecidere, Dili, 10, Timór Lorosa'e" building yes 0.301 Timór Lorosa'e FALSE
+chinese pla general hospital th Asia South-Eastern Asia FALSE 1 2021-02-03 207820505 way "Chinese shrine, ถ้ำปลา ซà¸à¸¢8, บ้านถ้ำสันติสุข, จังหวัดเชียงราย, ประเทศไทย" amenity place_of_worship 0.101 ประเทศไทย FALSE
+chulalongkorn university th Asia South-Eastern Asia FALSE 1 2021-02-03 258312812 relation "จุฬาลงà¸<81>รณ์มหาวิทยาลัย, 254, ถนนพà¸<8d>าไท, วังใหม่, à¹<81>ขวงวังใหม่, เขตปทุมวัน, à¸<81>รุงเทพมหานคร, 10330, ประเทศไทย" amenity university 0.460618187035857 ประเทศไทย FALSE
+cnt th Asia South-Eastern Asia FALSE 1 2021-02-03 258466185 relation "จังหวัดชัยนาท, ประเทศไทย" boundary administrative 0.466806566636269 ประเทศไทย FALSE
+institute of molecular biosciences th Asia South-Eastern Asia FALSE 1 2021-02-03 249564888 way "Institute of Molecular Biosciences, 25/25, ถนนพุทธมณฑล สาย 4, ศาลายา, จังหวัดนครปà¸<90>ม, 73170, ประเทศไทย" building yes 0.401 ประเทศไทย FALSE
+khon kaen university th Asia South-Eastern Asia FALSE 1 2021-02-03 207021071 way "Khon Kaen University, ถนนมิตรภาพ, บ้านหนà¸à¸‡à¹€à¸”ิ่น, จังหวัดหนà¸à¸‡à¸„าย, 43000, ประเทศไทย" amenity school 0.301 ประเทศไทย FALSE
+national research council of thailand th Asia South-Eastern Asia FALSE 1 2021-02-03 45408539 node "สำนัà¸<81>งานà¸<81>ารวิจัยà¹<81>ห่งชาติ (วช.), 196, ถนนพหลโยธิน, เà¸<81>ษตร, à¹<81>ขวงลาดยาว, เขตจตุจัà¸<81>ร, à¸<81>รุงเทพมหานคร, 10900, ประเทศไทย" office government 0.001 ประเทศไทย FALSE
+national science and technology development agency th Asia South-Eastern Asia FALSE 1 2021-02-03 154780568 way "NSTDA, ถนนยูงทà¸à¸‡, à¸à¸³à¹€à¸ à¸à¸„ลà¸à¸‡à¸«à¸¥à¸§à¸‡, จังหวัดปทุมธานี, 12121, ประเทศไทย" office government 0.001 ประเทศไทย FALSE
+pkk th Asia South-Eastern Asia FALSE 1 2021-02-03 298297451 node "สถานีรถไฟประจวบคีรีขันธ์, ถนนมหาราช 1, ประจวบคีรีขันธ์, จังหวัดประจวบคีรีขันธ์, 77000, ประเทศไทย" railway station 0.370639694209592 ประเทศไทย FALSE
+pna th Asia South-Eastern Asia FALSE 1 2021-02-03 258299298 relation "จังหวัดพังงา, ประเทศไทย" boundary administrative 0.473319178124722 ประเทศไทย FALSE
+sri th Asia South-Eastern Asia FALSE 1 2021-02-03 258233401 relation "จังหวัดสระบุรี, ประเทศไทย" boundary administrative 0.478610654960806 ประเทศไทย FALSE
+ubon ratchathani university th Asia South-Eastern Asia FALSE 1 2021-02-03 66929366 node "Ubon Ratchathani University, ถนนสถลมาร์ค, จังหวัดà¸à¸¸à¸šà¸¥à¸£à¸²à¸Šà¸˜à¸²à¸™à¸µ, ประเทศไทย" amenity university 0.301 ประเทศไทย FALSE
+un food and agriculture organization th Asia South-Eastern Asia FALSE 1 2021-02-03 139296121 way "UN Food & Agriculture Organization, ถนนพระà¸à¸²à¸—ิตย์, พระà¸à¸²à¸—ิตย์, à¹<81>ขวงชนะสงคราม, เขตพระนคร, à¸<81>รุงเทพมหานคร, 10200, ประเทศไทย" building office 0.401 ประเทศไทย FALSE
+cad td Africa Middle Africa FALSE 1 2021-02-03 258517069 relation Tchad تشاد boundary administrative 0.662462283081021 Tchad تشاد FALSE
+aafs sy Asia Western Asia FALSE 1 2021-02-03 4535189 node "جوار العÙ<81>ص, ناØية الناصرة, منطقة تلکلخ, Ù…ØاÙ<81>ظة Øمص, سوريا" place village 0.275 سوريا FALSE
+azizi sy Asia Western Asia FALSE 1 2021-02-03 4628756 node "عزيزة, ناØية جبل سمعان, منطقة جبل سمعان, Ù…ØاÙ<81>ظة Øلب, سوريا" place village 0.275 سوريا FALSE
+icarda sy Asia Western Asia FALSE 1 2021-02-03 181236548 way "Icarda, رسم عبود, ناØية رسم الØرمل الإمام, Ù…ØاÙ<81>ظة Øلب, سوريا" landuse farmland 0.3 سوريا FALSE
+iied sy Asia Western Asia FALSE 1 2021-02-03 4676615 node "جب عيد, ناØية السعن, منطقة سلمية, Ù…ØاÙ<81>ظة Øماة, سوريا" place village 0.275 سوريا FALSE
+military hospital sy Asia Western Asia FALSE 1 2021-02-03 166172527 way "Military hospital, طرطوس, Ù…ØاÙ<81>ظة طرطوس, سوريا" landuse military 0.4 سوريا FALSE
+rhdf sy Asia Western Asia FALSE 1 2021-02-03 4617427 node "الغدÙ<81>Ø©, ناØية معرة النعمان, منطقة معرة النعمان, Ù…ØاÙ<81>ظة إدلب, سوريا" place village 0.275 سوريا FALSE
+el salvador sv Americas Central America FALSE 1 2021-02-03 258136452 relation El Salvador boundary administrative 0.886510020381369 El Salvador FALSE
+parliamentary ss FALSE 1 2021-02-03 83093461 node "Parliamentary, Ministries Road, Hai Gonya, Juba, Central Equatoria, PRIVATE BAG, South Sudan" tourism apartment 0.101 South Sudan FALSE
+suriname sr Americas South America FALSE 1 2021-02-03 257419144 relation Suriname boundary administrative 0.761728642556969 Suriname FALSE
+aad so Africa Eastern Africa FALSE 1 2021-02-03 14855897 node "Cad, Taleex تلأ Ø, Sool سول, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال" place hamlet 0.25 Soomaaliya الصومال FALSE
+hamas so Africa Eastern Africa FALSE 1 2021-02-03 14960222 node "Xamaas, Ceerigaabo عيرجابو, سناج Sanaag, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال" place village 0.275 Soomaaliya الصومال FALSE
+jif so Africa Eastern Africa FALSE 1 2021-02-03 14854299 node "Jif, Borama بوراما, عدل Awdal, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال" place village 0.375 Soomaaliya الصومال FALSE
+shire so Africa Eastern Africa FALSE 1 2021-02-03 14757227 node "Shire, Qardho قرضو, Bariباري, Soomaaliya الصومال" place village 0.375 Soomaaliya الصومال FALSE
+san marino sm Europe Southern Europe FALSE 1 2021-02-03 257263712 relation San Marino boundary administrative 0.859326375658518 San Marino FALSE
+democracy and human rights sl Africa Western Africa FALSE 1 2021-02-03 157165773 way "Network Movement for Democracy and Human rights, 78, Kailahun, Kailahun District, Eastern Province, 232, Sierra Leone" amenity office 0.401 Sierra Leone FALSE
+global times sl Africa Western Africa FALSE 1 2021-02-03 52844722 node "global times, 15 Percival Street, Percival Street, GOVERNMENT WHARF, Tower Hill, Freetown, Western Area Urban, Western Area, 232, Sierra Leone" amenity cinema 0.201 Sierra Leone FALSE
+kenema government hospital sl Africa Western Africa FALSE 1 2021-02-03 161047442 way "Kenema Government Hospital, Combema Road, Kpayama, Kenema, Kenema District, Eastern Province, EASTERN, Sierra Leone" amenity hospital 0.301 Sierra Leone FALSE
+university of sierra leone sl Africa Western Africa FALSE 1 2021-02-03 209181703 way "Njala University Plantation Forest, Njala, Moyamba District, Southern Province, Sierra Leone" landuse forest 0.5 Sierra Leone FALSE
+green program sk Europe Eastern Europe FALSE 1 2021-02-03 119578034 way "PROGRAM, Brnianska, Zlatovce, TrenÄ<8d>Ãn, okres TrenÄ<8d>Ãn, TrenÄ<8d>iansky kraj, Západné Slovensko, 911 37, Slovensko" building commercial 0.101 Slovensko FALSE
+hdp sk Europe Eastern Europe FALSE 1 2021-02-03 185886235 way "HDP, Dúbrava, okres Liptovský Mikuláš, Žilinský kraj, Stredné Slovensko, Slovensko" highway path 0.175 Slovensko FALSE
+nepal program sk Europe Eastern Europe FALSE 1 2021-02-03 119578034 way "PROGRAM, Brnianska, Zlatovce, TrenÄ<8d>Ãn, okres TrenÄ<8d>Ãn, TrenÄ<8d>iansky kraj, Západné Slovensko, 911 37, Slovensko" building commercial 0.101 Slovensko FALSE
+nier sk Europe Eastern Europe FALSE 1 2021-02-03 127927 node "Nýrovce, okres Levice, Nitriansky kraj, Západné Slovensko, 935 67, Slovensko" place village 0.446214416898128 Slovensko FALSE
+siemens sk Europe Eastern Europe FALSE 1 2021-02-03 72187045 node "Siemens, Laborecká, Terasa, KoÅ¡ice - mestská Ä<8d>asÅ¥ Západ, okres KoÅ¡ice II, KoÅ¡ice, KoÅ¡ický kraj, Východné Slovensko, 04011, Slovensko" office company 0.685789819176952 Slovensko FALSE
+st helena sh Africa Western Africa FALSE 1 2021-02-03 258726181 relation "Saint Helena, Saint Helena, Ascension and Tristan da Cunha" place island 0.780564296027606 "Saint Helena, Ascension and Tristan da Cunha" FALSE
+asia-pacific economic cooperation sg Asia South-Eastern Asia FALSE 1 2021-02-03 296518551 way "Asia-Pacific Economic Cooperation, Heng Mui Keng Terrace, Queenstown, Southwest, 118654, Singapore" building yes 0.401 Singapore FALSE
+bioengineering institute sg Asia South-Eastern Asia FALSE 1 2021-02-03 50955646 node "Institute of Bioengineering and Nanotechnology, 31, Biopolis Way, Biopolis, Queenstown, Southwest, 138669, Singapore" office research 0.201 Singapore FALSE
+dbs sg Asia South-Eastern Asia FALSE 1 2021-02-03 72442407 node "DBS, 1, Maritime Square, Bukit Merah, Singapore, Central, 099253, Singapore" amenity bank 0.521335061990991 Singapore FALSE
+duke nus medical school sg Asia South-Eastern Asia FALSE 1 2021-02-03 131651364 way "Duke-NUS Medical School, 8, College Road, Bukit Merah, Singapore, Central, 169857, Singapore" building university 0.69350420583069 Singapore FALSE
+earth observatory of singapore sg Asia South-Eastern Asia FALSE 1 2021-02-03 68573497 node "Earth Observatory Singapore, Southwest, 637331, Singapore" natural peak 0.6 Singapore FALSE
+icbn sg Asia South-Eastern Asia FALSE 1 2021-02-03 55620813 node "ICBN, Upper Cross Street, Chinatown, Outram, Singapore, Central, 058353, Singapore" amenity bank 0.101 Singapore FALSE
+in-q-tel sg Asia South-Eastern Asia FALSE 1 2021-02-03 241136298 way "MRT Thomson–East Coast Line, North Woodlands Way, Woodlands, Northwest, 738343, Singapore" railway subway 0.505151681397098 Singapore FALSE
+institute of bioengineering and nanotechnology sg Asia South-Eastern Asia FALSE 1 2021-02-03 50955646 node "Institute of Bioengineering and Nanotechnology, 31, Biopolis Way, Biopolis, Queenstown, Southwest, 138669, Singapore" office research 0.501 Singapore FALSE
+international air transport association sg Asia South-Eastern Asia FALSE 1 2021-02-03 61626173 node "International Air Transport Association, 80, Pasir Panjang Road, Alexandra, Singapore, Southwest, 117372, Singapore" office company 0.401 Singapore FALSE
+iseas yusof ishak institute sg Asia South-Eastern Asia FALSE 1 2021-02-03 258638587 relation "ISEAS-Yusof Ishak Institute, 30, Heng Mui Keng Terrace, Pasir Panjang, Southwest, 119614, Singapore" building university 0.706728041583383 Singapore FALSE
+national action party sg Asia South-Eastern Asia FALSE 1 2021-02-03 174317745 way "People's Action Party Community Foundation, 57B, New Upper Changi Road, Bedok, Singapore, Southeast, 463057, Singapore" building yes 0.201 Singapore FALSE
+schering-plough sg Asia South-Eastern Asia FALSE 1 2021-02-03 3281068 node "Schering-Plough, Tuas West Drive, Tuas, Southwest, 638408, Singapore" highway bus_stop 0.201 Singapore FALSE
+singapore immunology network sg Asia South-Eastern Asia FALSE 1 2021-02-03 54912680 node "Singapore Immunology Network (SIgN), 8A, Biomedical Grove, Biopolis, Queenstown, Singapore, Southwest, 138648, Singapore" office research 0.301 Singapore FALSE
+starbucks sg Asia South-Eastern Asia FALSE 1 2021-02-03 71728372 node "Starbucks, 1, Maritime Square, Bukit Merah, Singapore, Central, 099253, Singapore" amenity cafe 0.665860646943562 Singapore FALSE
+temasek life sciences laboratory sg Asia South-Eastern Asia FALSE 1 2021-02-03 109850096 way "Temasek Life Sciences Laboratory, Prince George's Park, Queenstown, Southwest, 118411, Singapore" building yes 0.401 Singapore FALSE
+bmc se Europe Northern Europe FALSE 1 2021-02-03 134782082 way "Biomedicinskt centrum, 3, Husargatan, Polacksbacken, Uppsala, Uppsala kommun, Uppsala län, 75275, Sverige" amenity university 0.190508362962683 Sverige FALSE
+dalarna university in falun se Europe Northern Europe FALSE 1 2021-02-03 661089 node "Högskolan Dalarna, Högskolegatan, Lugnet, Falun, Falu kommun, Dalarnas län, 791 31, Sverige" amenity university 0.540546922258437 Sverige FALSE
+disease control and prevention se Europe Northern Europe FALSE 1 2021-02-03 95487742 way "Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige" office government 0.550936419284163 Sverige FALSE
+disease prevention and control se Europe Northern Europe FALSE 1 2021-02-03 95487742 way "Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige" office government 0.550936419284163 Sverige FALSE
+dow jones se Europe Northern Europe FALSE 1 2021-02-03 120411788 way "Dow Jones, Nacka, Nacka kommun, Stockholms län, 131 33, Sverige" highway path 0.275 Sverige FALSE
+european spallation source se Europe Northern Europe FALSE 1 2021-02-03 128920092 way "European Spallation Source, Öster, Lund, Lunds kommun, Skåne län, 224 84, Sverige" landuse construction 0.626855406087553 Sverige FALSE
+linköping university se Europe Northern Europe FALSE 1 2021-02-03 105800452 way "Linköpings universitet, Hans Meijers väg, Västra Valla, Linköpings domkyrkodistrikt, Linköping, Linköpings kommun, Östergötlands län, 581 17, Sverige" amenity university 0.551830836555001 Sverige FALSE
+mattias green se Europe Northern Europe FALSE 1 2021-02-03 171383634 way "Mattias, Sundby, Spånga-Tensta stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, Sverige" place city_block 0.225 Sverige FALSE
+oxo se Europe Northern Europe FALSE 1 2021-02-03 85642466 way "Oxö, Mora kommun, Dalarnas län, Sverige" place islet 0.25 Sverige FALSE
+regulus se Europe Northern Europe FALSE 1 2021-02-03 113402174 way "Regulus, Planetstaden, Stampelyckan, Söder, Lund, Lunds kommun, Skåne län, Sverige" place city_block 0.225 Sverige FALSE
+smhi se Europe Northern Europe FALSE 1 2021-02-03 55428577 node "Sveriges meteorologiska och hydrologiska institut, 1, Folkborgsvägen, Klockaretorpet, Norrköping, Norrköpings kommun, Östergötlands län, 60176, Sverige" office government 0.645620487724216 Sverige FALSE
+södertörn university library se Europe Northern Europe FALSE 1 2021-02-03 299483682 relation "Södertörns högskola, Hälsovägen, BRF. Grantorp, Visättra, Flemingsberg, Huddinge kommun, Stockholms län, 141 52, Sverige" amenity university 0.482401781952281 Sverige FALSE
+statoil se Europe Northern Europe FALSE 1 2021-02-03 258653712 relation "Statoil, Rönninge, Salems kommun, Stockholms län, Sverige" highway service 0.175 Sverige FALSE
+swedish academy se Europe Northern Europe FALSE 1 2021-02-03 64577899 node "Sjösportskolan, 22, Talattagatan, Långedrag, Västra Göteborg, Göteborg, Göteborgs Stad, Västra Götalands län, 42676, Sverige" amenity school 0.001 Sverige FALSE
+swedish museum of natural history in stockholm se Europe Northern Europe FALSE 1 2021-02-03 217046 node "Naturhistoriska riksmuseet, Frescativägen, Ekhagen, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 18, Sverige" tourism museum 0.531447409196647 Sverige FALSE
+swedish university of agricultural sciences se Europe Northern Europe FALSE 1 2021-02-03 193939119 way "Sveriges lantbruksuniversitet, Håkan Gullesons Väg, Lilljansberget, Universitets- och sjukhusområdet, Umeå, Umeå kommun, Västerbottens län, 90729, Sverige" amenity university 0.419996629384852 Sverige FALSE
+university of lund se Europe Northern Europe FALSE 1 2021-02-03 258273253 relation "Lunds Tekniska Högskola, Box 118, Professorsgatan, Olshög, Professorsstaden, Centrum, Lund, Lunds kommun, Skåne län, 22100, Sverige" amenity university 0.552959367524706 Sverige FALSE
+university of stockholm se Europe Northern Europe FALSE 1 2021-02-03 299483682 relation "Södertörns högskola, Hälsovägen, BRF. Grantorp, Visättra, Flemingsberg, Huddinge kommun, Stockholms län, 141 52, Sverige" amenity university 0.482401781952281 Sverige FALSE
+lmb sd Africa Northern Africa FALSE 1 2021-02-03 81909309 node "Al Lamab, جبرة جنوب, ولاية الخرطوم, السودان" place hamlet 0.25 السودان FALSE
+nimr sd Africa Northern Africa FALSE 1 2021-02-03 82567336 node "Nimr, Sheikan, ولاية شمال كردÙ<81>ان, السودان" place hamlet 0.35 السودان FALSE
+sese sd Africa Northern Africa FALSE 1 2021-02-03 82590645 node "Sese, دلقو, الولاية الشمالية, السودان" natural peak 0.4 السودان FALSE
+srs sd Africa Northern Africa FALSE 1 2021-02-03 82009778 node "Saras East, الولاية الشمالية, السودان" place hamlet 0.25 السودان FALSE
+rnl sb Oceania Melanesia FALSE 1 2021-02-03 10528826 node "Rennell, Tigoa, Rennell and Bellona, Solomon Islands" aeroway aerodrome 0.244698616841389 Solomon Islands FALSE
+salomon sb Oceania Melanesia FALSE 1 2021-02-03 258291922 relation Solomon Islands boundary administrative 0.648279405728165 Solomon Islands FALSE
+dmd sa Asia Western Asia FALSE 1 2021-02-03 12617190 node "ضمد, منطقة جازان, السعودية" place town 0.3 السعودية FALSE
+faculty of arts and sciences sa Asia Western Asia FALSE 1 2021-02-03 77665187 node "Faculty of Arts and Sciences, شارع الملك Ù<81>هد, الربوة, جدة, منطقة مكة المكرمة, 5305, السعودية" tourism museum 0.501 السعودية FALSE
+kaust sa Asia Western Asia FALSE 1 2021-02-03 259476065 relation "جامعة الملك عبد الله للعلوم و التقنية, King Abdullah Boulevard, منطقة مكة المكرمة, 23955, السعودية" amenity university 0.37358213360648 السعودية FALSE
+king saud university sa Asia Western Asia FALSE 1 2021-02-03 121097551 way "جامعة الملك سعود, 4545, الملك خالد, Al Khuzama District ØÙŠ الخزامى, الدرعية, منطقة الرياض, 145111, السعودية" amenity university 0.454167326792086 السعودية FALSE
+saudi geological survey sa Asia Western Asia FALSE 1 2021-02-03 51112840 node "Saudi Geological Survey, البدر القمني, As Sulaymaniyah District ØÙŠ السليمانية, الرياض, المالز, منطقة الرياض, 11525, السعودية" office government 0.301 السعودية FALSE
+saudia sa Asia Western Asia FALSE 1 2021-02-03 258074051 relation السعودية boundary administrative 0.735262517159872 السعودية FALSE
+scientific university of the south sa Asia Western Asia FALSE 1 2021-02-03 52416329 node "المعهد العلمي Ù<81>ÙŠ الاØساء, شارع الجامعة, الهÙ<81>ÙˆÙ<81>, المنطقة الشرقية, 36361-7365, السعودية" amenity school 0.001 السعودية FALSE
+nstc rw Africa Eastern Africa FALSE 1 2021-02-03 57789831 node "NSTC, KG 13 Avenue, Akarere ka Gasabo, Umujyi wa Kigali, PO BOX 2376 KIGALI-RWANDA, Rwanda" tourism hotel 0.101 Rwanda FALSE
+academy of social sciences ru Europe Eastern Europe FALSE 1 2021-02-03 63385307 node "ИнÑ<81>титут научной информации по общеÑ<81>твенным наукам Ð Ð<90>Ð<9d>, 3, улица ДмитриÑ<8f> УльÑ<8f>нова, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119333, РоÑ<81>Ñ<81>иÑ<8f>" amenity library 0.347505326784089 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+aesa ru Europe Eastern Europe FALSE 1 2021-02-03 99011756 way "Ð<90>ша, Ð<90>шинÑ<81>кое городÑ<81>кое поÑ<81>еление, Ð<90>шинÑ<81>кий район, ЧелÑ<8f>бинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place town 0.49201754214395 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+andra ru Europe Eastern Europe FALSE 1 2021-02-03 258614316 relation "городÑ<81>кое поÑ<81>еление Ð<90>ндра, ОктÑ<8f>брьÑ<81>кий район, Ханты-МанÑ<81>ийÑ<81>кий автономный округ — Югра, УральÑ<81>кий федеральный округ, 628125, РоÑ<81>Ñ<81>иÑ<8f>" boundary administrative 0.467153792339873 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+asa ru Europe Eastern Europe FALSE 1 2021-02-03 99011756 way "Ð<90>ша, Ð<90>шинÑ<81>кое городÑ<81>кое поÑ<81>еление, Ð<90>шинÑ<81>кий район, ЧелÑ<8f>бинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place town 0.49201754214395 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+beatles ru Europe Eastern Europe FALSE 1 2021-02-03 6433570 node "The Beatles, улица Горького, ÐвереÑ<81>Ñ‚, ЛенинÑ<81>кий район, Екатеринбург, городÑ<81>кой округ Екатеринбург, СвердловÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, 620219, РоÑ<81>Ñ<81>иÑ<8f>" historic memorial 0.325794094499978 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+budker institute of nuclear physics ru Europe Eastern Europe FALSE 1 2021-02-03 103148615 way "ИнÑ<81>титут Ñ<8f>дерной физики им. Г.И. Будкера, 11, проÑ<81>пект Ð<90>кадемика Лаврентьева, ВерхнÑ<8f>Ñ<8f> зона, СоветÑ<81>кий район, городÑ<81>кой округ Ð<9d>овоÑ<81>ибирÑ<81>к, Ð<9d>овоÑ<81>ибирÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 630090, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+cagi ru Europe Eastern Europe FALSE 1 2021-02-03 97889566 way "Центральный аÑ<8d>рогидродинамичеÑ<81>кий инÑ<81>титут, 1, улица ЖуковÑ<81>кого, Центр, ЖуковÑ<81>кий, городÑ<81>кой округ ЖуковÑ<81>кий, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 140181, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.399096455305557 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+chara ru Europe Eastern Europe FALSE 1 2021-02-03 25876864 node "Чара, КаларÑ<81>кий район, ЗабайкальÑ<81>кий край, ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" natural peak 0.3 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+csh ru Europe Eastern Europe FALSE 1 2021-02-03 107362163 way "Ð<90>Ñ<8d>ропорт Соловки, улица Ковалёва, Соловецкий, Соловецкое Ñ<81>ельÑ<81>кое поÑ<81>еление, ПриморÑ<81>кий район, Ð<90>рхангельÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Северо-Западный федеральный округ, 164070, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.41890455386909 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+dfo ru Europe Eastern Europe FALSE 1 2021-02-03 258365341 relation "ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" boundary administrative 0.551929848048128 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+educational exchange ru Europe Eastern Europe FALSE 1 2021-02-03 60365051 node "Совет по международным образовательным обменам, 24, набережнаÑ<8f> реки Мойки, Дворцовый округ, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" office ngo 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+french republic ru Europe Eastern Europe FALSE 1 2021-02-03 72441560 node "French Bakery, ФедоÑ<81>еевÑ<81>каÑ<8f> улица, ВахитовÑ<81>кий район, городÑ<81>кой округ Казань, ТатарÑ<81>тан, ПриволжÑ<81>кий федеральный округ, 420014, РоÑ<81>Ñ<81>иÑ<8f>" amenity cafe 0.101 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+fsb ru Europe Eastern Europe FALSE 1 2021-02-03 181819115 way "Управление ФСБ РоÑ<81>Ñ<81>ии по ЧелÑ<8f>бинÑ<81>кой облаÑ<81>ти, улица Коммуны, Центральный район, ЧелÑ<8f>бинÑ<81>к, ЧелÑ<8f>бинÑ<81>кий городÑ<81>кой округ, ЧелÑ<8f>бинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, 454091, РоÑ<81>Ñ<81>иÑ<8f>" amenity police 0.512538467361346 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+general motors ru Europe Eastern Europe FALSE 1 2021-02-03 125839046 way "General Motors, Шушары, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" landuse industrial 0.4 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+geo ru Europe Eastern Europe FALSE 1 2021-02-03 258503432 relation "МоÑ<81>ква, Центральный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place city 0.790819328283346 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+greenpeace russia ru Europe Eastern Europe FALSE 1 2021-02-03 57696006 node "ГринпиÑ<81> РоÑ<81>Ñ<81>ии, 26 к1, ЛенинградÑ<81>кий проÑ<81>пект, район Беговой, МоÑ<81>ква, Центральный федеральный округ, 125040, РоÑ<81>Ñ<81>иÑ<8f>" office ngo 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+gru ru Europe Eastern Europe FALSE 1 2021-02-03 258803084 relation "Главное разведывательное управление, ХодынÑ<81>кое поле, ХорошёвÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" landuse military 0.492353071516346 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+institute for scientific information ru Europe Eastern Europe FALSE 1 2021-02-03 63385307 node "ИнÑ<81>титут научной информации по общеÑ<81>твенным наукам Ð Ð<90>Ð<9d>, 3, улица ДмитриÑ<8f> УльÑ<8f>нова, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119333, РоÑ<81>Ñ<81>иÑ<8f>" amenity library 0.347505326784089 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+institute of biophysics ru Europe Eastern Europe FALSE 1 2021-02-03 115290807 way "ИнÑ<81>титут биофизики СО Ð Ð<90>Ð<9d>, 50/50, Ð<90>кадемгородок, ОктÑ<8f>брьÑ<81>кий район, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>к, городÑ<81>кой округ КраÑ<81>ноÑ<8f>Ñ€Ñ<81>к, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>кий край, СибирÑ<81>кий федеральный округ, 660036, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+institute of cytology and genetics ru Europe Eastern Europe FALSE 1 2021-02-03 103185653 way "ИнÑ<81>титут цитологии и генетики, проÑ<81>пект Ð<90>кадемика Коптюга, Ð<90>кадемгородок, СоветÑ<81>кий район, городÑ<81>кой округ Ð<9d>овоÑ<81>ибирÑ<81>к, Ð<9d>овоÑ<81>ибирÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 630090, РоÑ<81>Ñ<81>иÑ<8f>" amenity research_institute 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+institute of mineralogy ru Europe Eastern Europe FALSE 1 2021-02-03 72874514 node "ИнÑ<81>титут геологии, геофизики и минералогии им. Ð<90>.Ð<90>. Трофимука, 15, ДетÑ<81>кий проезд, ВерхнÑ<8f>Ñ<8f> зона, СоветÑ<81>кий район, городÑ<81>кой округ Ð<9d>овоÑ<81>ибирÑ<81>к, Ð<9d>овоÑ<81>ибирÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 630090, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+itar tass ru Europe Eastern Europe FALSE 1 2021-02-03 259420189 relation "ИТÐ<90>Ð -ТÐ<90>СС, 12 Ñ<81>1, ТверÑ<81>кой бульвар, 48, ПреÑ<81>ненÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119049, РоÑ<81>Ñ<81>иÑ<8f>" office news_agency 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+jinr ru Europe Eastern Europe FALSE 1 2021-02-03 97272121 way "Объединённый инÑ<81>титут Ñ<8f>дерных иÑ<81>Ñ<81>ледований, аллеÑ<8f> имени Ð<9d>. Сондома, ИнÑ<81>титутÑ<81>каÑ<8f> чаÑ<81>Ñ‚ÑŒ, Дубна, городÑ<81>кой округ Дубна, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 141980, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.352354134516624 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+kapitza institute for physical problems ru Europe Eastern Europe FALSE 1 2021-02-03 258586820 relation "ИнÑ<81>титут физичеÑ<81>ких проблем имени П. Л. Капицы Ð Ð<90>Ð<9d>, улица СергеÑ<8f> Капицы, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119334, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+kbo ru Europe Eastern Europe FALSE 1 2021-02-03 169242562 way "КБО, Козулька, городÑ<81>кое поÑ<81>еление Козулька, КозульÑ<81>кий район, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>кий край, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" landuse retail 0.2 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+kremlin ru Europe Eastern Europe FALSE 1 2021-02-03 258512367 relation "МоÑ<81>ковÑ<81>кий Кремль, БоровицкаÑ<8f> улица, 39, ТверÑ<81>кой район, МоÑ<81>ква, Центральный федеральный округ, 121019, РоÑ<81>Ñ<81>иÑ<8f>" tourism attraction 0.557769322264741 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+kurchatov institute ru Europe Eastern Europe FALSE 1 2021-02-03 258452658 relation "Ð<9d>ациональный иÑ<81>Ñ<81>ледовательÑ<81>кий центр «КурчатовÑ<81>кий инÑ<81>титут», район Щукино, МоÑ<81>ква, Центральный федеральный округ, 123098, РоÑ<81>Ñ<81>иÑ<8f>" landuse industrial 0.424370481866688 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lena ru Europe Eastern Europe FALSE 1 2021-02-03 258503631 relation "Лена, ЮбилейнинÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, КиренÑ<81>кий район, ИркутÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" natural water 0.461899716082039 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lmt ru Europe Eastern Europe FALSE 1 2021-02-03 258485345 relation "городÑ<81>кое поÑ<81>еление Ð<90>льметьевÑ<81>к, Ð<90>льметьевÑ<81>кий район, ТатарÑ<81>тан, ПриволжÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" boundary administrative 0.496007033040445 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lomonosov moscow state university ru Europe Eastern Europe FALSE 1 2021-02-03 155606811 way "1, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f>" place neighbourhood 0.589514102962792 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lomonosov state university ru Europe Eastern Europe FALSE 1 2021-02-03 3649340 node "Михаил ВаÑ<81>ильевич ЛомоноÑ<81>ов, улица Колмогорова, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f>" historic memorial 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+mps ru Europe Eastern Europe FALSE 1 2021-02-03 1173456 node "МПС, Малаховка, городÑ<81>кой округ Люберцы, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 140033, РоÑ<81>Ñ<81>иÑ<8f>" place suburb 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+national museum of the palace ru Europe Eastern Europe FALSE 1 2021-02-03 59090230 node "Museum, 14, БольшаÑ<8f> МорÑ<81>каÑ<8f> улица, округ â„– 78, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" shop clothes 0.101 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+nbc ru Europe Eastern Europe FALSE 1 2021-02-03 258202613 relation "Ð<90>Ñ<8d>ропорт Бегишево, 16К-1563, БиклÑ<8f>нÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, ТукаевÑ<81>кий район, ТатарÑ<81>тан, ПриволжÑ<81>кий федеральный округ, 423878, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.443549060892257 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+osf ru Europe Eastern Europe FALSE 1 2021-02-03 258670824 relation "Ð<90>Ñ<8d>ропорт ОÑ<81>тафьево, СветлаÑ<8f> улица, поÑ<81>еление ВоÑ<81>креÑ<81>енÑ<81>кое, МоÑ<81>ква, Центральный федеральный округ, 117041, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.405666002039974 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+prl ru Europe Eastern Europe FALSE 1 2021-02-03 108260455 way "Ð<90>Ñ<8d>ропорт Елизово, Ð<90>-401, Елизово, ЕлизовÑ<81>кое городÑ<81>кое поÑ<81>еление, ЕлизовÑ<81>кий район, КамчатÑ<81>кий край, ДальневоÑ<81>точный федеральный округ, 684005, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.450772394172387 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+ria novosti ru Europe Eastern Europe FALSE 1 2021-02-03 174554396 way "ДетÑ<81>кий Ñ<81>ад â„– 1720 РИÐ<90> “Ð<9d>овоÑ<81>тиâ€<9d>, 50, КраÑ<81>ковÑ<81>кое шоÑ<81>Ñ<81>е, Малаховка, городÑ<81>кой округ Люберцы, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 140050, РоÑ<81>Ñ<81>иÑ<8f>" amenity kindergarten 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+roscosmos ru Europe Eastern Europe FALSE 1 2021-02-03 82532640 node "РоÑ<81>коÑ<81>моÑ<81>, 42 Ñ<81>2, улица Щепкина, Ð<9d>апрудное, МещанÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 129110, РоÑ<81>Ñ<81>иÑ<8f>" office government 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+russian navy ru Europe Eastern Europe FALSE 1 2021-02-03 259456418 relation "Главный штаб ВМФ РоÑ<81>Ñ<81>ии, Ð<90>дмиралтейÑ<81>кий округ, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" landuse military 0.2 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+school for oriental ru Europe Eastern Europe FALSE 1 2021-02-03 244630454 way "school, 08К-66, Ð<9d>овое УÑ<81>тье, Ñ<81>ельÑ<81>кое поÑ<81>еление Ð<9d>овое УÑ<81>тье, ОхотÑ<81>кий район, ХабаровÑ<81>кий край, ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" building yes 0.111 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+sgc ru Europe Eastern Europe FALSE 1 2021-02-03 258656849 relation "Ð<90>Ñ<8d>ропорт Сургут, Ð<90>Ñ<8d>ропорт, городÑ<81>кой округ Сургут, Ханты-МанÑ<81>ийÑ<81>кий автономный округ — Югра, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.445547633625325 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+sidor ru Europe Eastern Europe FALSE 1 2021-02-03 51700182 node "Сидор, ОмÑ<81>укчанÑ<81>кий городÑ<81>кой округ, МагаданÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" natural peak 0.3 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+sternberg astronomical institute at moscow state university ru Europe Eastern Europe FALSE 1 2021-02-03 258891687 relation "ГоÑ<81>ударÑ<81>твенный Ð<90>Ñ<81>трономичеÑ<81>кий ИнÑ<81>титут им. П.К. Штернберга МГУ, 13, УниверÑ<81>итетÑ<81>кий проÑ<81>пект, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119333, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.353757209078785 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+tair ru Europe Eastern Europe FALSE 1 2021-02-03 258375362 relation "Таир, КокшайÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, ЗвениговÑ<81>кий район, Марий Ðл, ПриволжÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place village 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+tomsk state university ru Europe Eastern Europe FALSE 1 2021-02-03 108167321 way "ТомÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет. Центр культуры, 36, проÑ<81>пект Ленина, КировÑ<81>кий район, ТомÑ<81>к, городÑ<81>кой округ ТомÑ<81>к, ТомÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 634050, РоÑ<81>Ñ<81>иÑ<8f>" building university 0.36173885138595 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+ubs ru Europe Eastern Europe FALSE 1 2021-02-03 105310352 way "Ð<90>Ñ<8d>родром СмоленÑ<81>к-Северный, ПолоцкаÑ<8f> улица, Щёткино, СмоленÑ<81>к, ЗаднепровÑ<81>кий район, городÑ<81>кой округ СмоленÑ<81>к, СмоленÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 214006, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.351537799411788 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+uk home office ru Europe Eastern Europe FALSE 1 2021-02-03 259423169 relation "Ук, УковÑ<81>кое городÑ<81>кое поÑ<81>еление, Ð<9d>ижнеудинÑ<81>кий район, ИркутÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place village 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+university of moscow ru Europe Eastern Europe FALSE 1 2021-02-03 155606811 way "1, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f>" place neighbourhood 0.589514102962792 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+uts ru Europe Eastern Europe FALSE 1 2021-02-03 3463674 node "Ust-Tsylma Airport, улица Ð<90>виаторов, Чукчино, УÑ<81>Ñ‚ÑŒ-Цильма, Ñ<81>ельÑ<81>кое поÑ<81>еление Коровий Ручей, УÑ<81>Ñ‚ÑŒ-ЦилемÑ<81>кий район, РеÑ<81>публика Коми, Северо-Западный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.402513658204824 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+vimpelcom ru Europe Eastern Europe FALSE 1 2021-02-03 57284844 node "Vimpelcom, ТаманÑ<81>каÑ<8f> улица, СтароминÑ<81>каÑ<8f>, СтароминÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, СтароминÑ<81>кий район, КраÑ<81>нодарÑ<81>кий край, Южный федеральный округ, 353600, РоÑ<81>Ñ<81>иÑ<8f>" man_made mast 0.101 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+vostochny ru Europe Eastern Europe FALSE 1 2021-02-03 259275506 relation "ВоÑ<81>точный, СоÑ<81>ьвинÑ<81>кий городÑ<81>кой округ, СвердловÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place village 0.465170637979749 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+astronomical observatory of belgrade rs Europe Southern Europe FALSE 1 2021-02-03 135040458 way "Ð<90>Ñ<81>трономÑ<81>ка опÑ<81>ерваторија Београд, 7, Волгина, МЗ Звездара, Београд (Звездара), ГрадÑ<81>ка општина Звездара, Београд, Град Београд, Централна Србија, 11060, Србија" man_made observatory 0.30922699466609 Србија FALSE
+central veterinary institute rs Europe Southern Europe FALSE 1 2021-02-03 244179056 way "ВетеринарÑ<81>ки завод Земун, Београд (Земун), Београд, ГрадÑ<81>ка општина Земун, Град Београд, Централна Србија, Србија" landuse farmyard 0.2 Србија FALSE
+office for students rs Europe Southern Europe FALSE 1 2021-02-03 70834542 node "КомеÑ<81>аријат за избеглице и миграције, 4, Ð<9d>ародних хероја, СтудентÑ<81>ки град, Београд (Ð<9d>ови Београд), ГрадÑ<81>ка општина Ð<9d>ови Београд, Београд, Град Београд, Централна Србија, 11070, Србија" office government 0.001 Србија FALSE
+sinta rs Europe Southern Europe FALSE 1 2021-02-03 2337965 node "Сента, Општина Сента, СевернобанатÑ<81>ки управни округ, Војводина, 24400, Србија" place town 0.464681100859821 Србија FALSE
+university of belgrade rs Europe Southern Europe FALSE 1 2021-02-03 117305850 way "УниверзитетÑ<81>ка библиотека „Светозар Марковић“, 71, Булевар краља Ð<90>лекÑ<81>андра, Београд (Врачар), ГрадÑ<81>ка општина Врачар, Београд, Град Београд, Централна Србија, 11000, Србија" amenity library 0.4584091593896 Србија FALSE
+apa ro Europe Eastern Europe FALSE 1 2021-02-03 108306925 way "Apa, Satu Mare, 447015, România" place village 0.479859879460608 România FALSE
+babeș-bolyai university in cluj-napoca ro Europe Eastern Europe FALSE 1 2021-02-03 258406266 relation "Universitatea BabeÈ™-Bolyai, 1, Strada Mihail Kogălniceanu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400084, România" amenity university 0.893983489561696 România FALSE
+beer institute ro Europe Eastern Europe FALSE 1 2021-02-03 75163060 node "The Beer Institute, 111-113, Calea Floreasca, Floreasca, Sector 1, Municipiul București, 014463, România" amenity pub 0.201 România FALSE
+cerc ro Europe Eastern Europe FALSE 1 2021-02-03 3835281 node "Cerc, Cluj, 407586, România" place village 0.517932851769529 România FALSE
+diversitas ro Europe Eastern Europe FALSE 1 2021-02-03 45653317 node "Diversitas, Strada Timișul Sec, Est-Zizin, Brașov, 500246, România" highway bus_stop 0.101 România FALSE
+ifin-hh ro Europe Eastern Europe FALSE 1 2021-02-03 226902178 way "Institutul NaÈ›ional de Cercetare-Dezvoltare pentru Fizică È™i Inginerie Nucleară „Horia Hulubeiâ€<9d>, 30, Strada Reactorului, Extreme Light Infrastructure - Nuclear Physics (ELI-NP), Măgurele, Ilfov, 77125, România" amenity research_institute 0.001 România FALSE
+intervet ro Europe Eastern Europe FALSE 1 2021-02-03 82488353 node "Intervet, Strada Unirii, Delfinariu, Faleză Nord, Constanța, Zona Metropolitană Constanța, Constanța, 900545, România" shop pet 0.101 România FALSE
+ipp ro Europe Eastern Europe FALSE 1 2021-02-03 108543353 way "Ip, Sălaj, 457210, România" place village 0.393012981942171 România FALSE
+opticon ro Europe Eastern Europe FALSE 1 2021-02-03 58909939 node "Opticon, Strada Amurgului, Primăverii, Turda, Cluj, 401047, România" shop optician 0.101 România FALSE
+spri ro Europe Eastern Europe FALSE 1 2021-02-03 259351384 relation "Baia Sprie, Maramureș, România" boundary administrative 0.551669177709866 România FALSE
+technical university ro Europe Eastern Europe FALSE 1 2021-02-03 886677 node "Universitatea Tehnică, 15, Strada Constantin Daicoviciu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400020, România" amenity university 0.379076406206389 România FALSE
+technical university of ro Europe Eastern Europe FALSE 1 2021-02-03 886677 node "Universitatea Tehnică, 15, Strada Constantin Daicoviciu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400020, România" amenity university 0.379076406206389 România FALSE
+university of bucharest ro Europe Eastern Europe FALSE 1 2021-02-03 119914953 way "Universitatea din București, Piața Universității, Centrul Istoric, Sector 3, Municipiul București, 030018, România" amenity university 0.525450602170038 România FALSE
+university politehnica ro Europe Eastern Europe FALSE 1 2021-02-03 131359796 way "Facultatea de Electronică, Telecomunicații și Tehnologia Informației, 1-3, Bulevardul Iuliu Maniu, Militari, Sector 6, Municipiul București, 060117, România" amenity university 0.001 România FALSE
+voilà ro Europe Eastern Europe FALSE 1 2021-02-03 613559 node "Voila, BraÈ™ov, 507260, România" place village 0.40784642314719 România FALSE
+vulcan ro Europe Eastern Europe FALSE 1 2021-02-03 259305552 relation "Vulcan, Hunedoara, România" boundary administrative 0.557716038389343 România FALSE
+anatolian qa Asia Western Asia FALSE 1 2021-02-03 55991342 node "Anatolian, الطريق الدائري الثاني, الغانم القديم, الدوØØ©, 37109, قطر" amenity restaurant 0.101 قطر FALSE
+east anatolian qa Asia Western Asia FALSE 1 2021-02-03 55991342 node "Anatolian, الطريق الدائري الثاني, الغانم القديم, الدوØØ©, 37109, قطر" amenity restaurant 0.101 قطر FALSE
+ministry of public health qa Asia Western Asia FALSE 1 2021-02-03 126428404 way "Ministry of Public Health, شارع عنيزة, الرميلة, الدوØØ©, 875, قطر" amenity clinic 0.401 قطر FALSE
+world data center qa Asia Western Asia FALSE 1 2021-02-03 55939202 node "Data World, ام الدوم, Muaither North, الريان, 945, قطر" shop mobile_phone 0.201 قطر FALSE
+naoc py Americas South America FALSE 1 2021-02-03 56344922 node "Naoc, Loma Plata, Boquerón, Región Occidental, Paraguay" place village 0.375 Paraguay FALSE
+republic of palau pw Oceania Micronesia FALSE 1 2021-02-03 258530413 relation Belau boundary administrative 0.62710039879367 Belau FALSE
+adcs pt Europe Southern Europe FALSE 1 2021-02-03 16652252 node "ADCS Aldeia de S. Sebastião, CM 1080, Aldeia de São Sebastião, Castelo Bom, Almeida, Guarda, Beira Interior Norte, Centro, Portugal" leisure swimming_pool 0.101 Portugal FALSE
+agn pt Europe Southern Europe FALSE 1 2021-02-03 258957387 relation "Arganil, Coimbra, Pinhal Interior Norte, Centro, Portugal" boundary administrative 0.424872581583534 Portugal FALSE
+airc pt Europe Southern Europe FALSE 1 2021-02-03 196906120 way "AIRC, Lote 15, Avenida Joaquim Teixeira Santos, iParque - Parque Tecnológico de Coimbra, Antanhol, Assafarge e Antanhol, Coimbra, Baixo Mondego, Centro, 3040-540, Portugal" building commercial 0.101 Portugal FALSE
+amr pt Europe Southern Europe FALSE 1 2021-02-03 258828776 relation "Amares, Braga, Cávado, Norte, Portugal" boundary administrative 0.427682870549518 Portugal FALSE
+amr centre pt Europe Southern Europe FALSE 1 2021-02-03 258828776 relation "Amares, Braga, Cávado, Norte, Portugal" boundary administrative 0.427682870549518 Portugal FALSE
+avs pt Europe Southern Europe FALSE 1 2021-02-03 258957864 relation "Avis, Portalegre, Alto Alentejo, Alentejo, Portugal" boundary administrative 0.421268826198079 Portugal FALSE
+bnl pt Europe Southern Europe FALSE 1 2021-02-03 259237087 relation "Base Naval de Lisboa, Laranjeiro e Feijó, Almada, Setúbal, PenÃnsula de Setúbal, Ã<81>rea Metropolitana de Lisboa, 2810-001, Portugal" landuse military 0.357598476917669 Portugal FALSE
+cancer pt Europe Southern Europe FALSE 1 2021-02-03 44962803 node "Cancer, Granja, Mourão, Évora, Alentejo Central, Alentejo, Portugal" place farm 0.3 Portugal FALSE
+cbc pt Europe Southern Europe FALSE 1 2021-02-03 258695815 relation "Cabeceiras de Basto, Braga, Ave, Norte, Portugal" boundary administrative 0.426598401525427 Portugal FALSE
+chaves pt Europe Southern Europe FALSE 1 2021-02-03 258597847 relation "Chaves, Vila Real, Alto Tâmega, Norte, Portugal" boundary administrative 0.57494931380879 Portugal FALSE
+cml pt Europe Southern Europe FALSE 1 2021-02-03 259567502 relation "Câmara de Lobos, Madeira, Portugal" boundary administrative 0.42505981939652 Portugal FALSE
+cvd pt Europe Southern Europe FALSE 1 2021-02-03 258792832 relation "Castelo de Vide, Portalegre, Alto Alentejo, Alentejo, 7320-154, Portugal" boundary administrative 0.427443521124928 Portugal FALSE
+eu lisbon pt Europe Southern Europe FALSE 1 2021-02-03 60162212 node "FortÃssimos consórcios eu desejo, Rua Professor Santos Lucas, Benfica, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1500-613, Portugal" tourism artwork 0.101 Portugal FALSE
+european monitoring centre for drugs and drug addiction pt Europe Southern Europe FALSE 1 2021-02-03 258842269 relation "EMCDDA, 1, Praça Europa, Cais do Sodré, São Bento, Misericórdia, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1249-289, Portugal" office government 0.480889254526519 Portugal FALSE
+gödel pt Europe Southern Europe FALSE 1 2021-02-03 62622005 node "Godel, Turcifal, Torres Vedras, Lisboa, Oeste, Centro, 2565-814 TURCIFAL, Portugal" natural peak 0.3 Portugal FALSE
+iamb pt Europe Southern Europe FALSE 1 2021-02-03 259381515 relation "EMSA, 4, Praça Europa, Cais do Sodré, São Bento, Misericórdia, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1249-206, Portugal" office government 0.410586091930766 Portugal FALSE
+lisbon university institute pt Europe Southern Europe FALSE 1 2021-02-03 149301566 way "ISCTE - Instituto Universitário de Lisboa, Rua Branca Edmée Marques, Alvalade, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1649-026, Portugal" amenity university 0.303230229325644 Portugal FALSE
+mpower pt Europe Southern Europe FALSE 1 2021-02-03 50692696 node "MPower, EN 204, Monte de Fralães, Viatodos, Grimancelos, Minhotães e Monte de Fralães, Barcelos, Braga, Cávado, Norte, 4775-050, Portugal" shop car 0.101 Portugal FALSE
+mtl pt Europe Southern Europe FALSE 1 2021-02-03 258706967 relation "Mértola, Beja, Baixo Alentejo, Alentejo, Portugal" boundary administrative 0.446961485431396 Portugal FALSE
+new university of lisbon pt Europe Southern Europe FALSE 1 2021-02-03 194436086 way "Universidade de Lisboa - Cidade Universitária, Avenida das Forças Armadas, Sete Rios, Avenidas Novas, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1600-121, Portugal" amenity university 0.503005124858326 Portugal FALSE
+nova university of lisbon pt Europe Southern Europe FALSE 1 2021-02-03 126784870 way "Universidade Nova de Lisboa - Campus de Campolide, Rua de Campolide, Campolide, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1099-032 LISBOA, Portugal" amenity university 0.520803171748129 Portugal FALSE
+safina center pt Europe Southern Europe FALSE 1 2021-02-03 219483414 way "65, Safina, Cortegaça, Ovar, Aveiro, Baixo Vouga, Centro, 3886-908, Portugal" landuse industrial 0.3 Portugal FALSE
+tcs pt Europe Southern Europe FALSE 1 2021-02-03 258808501 relation "Trancoso, Guarda, Beira Interior Norte, Centro, Portugal" boundary administrative 0.437387966234636 Portugal FALSE
+university of aveiro pt Europe Southern Europe FALSE 1 2021-02-03 149748981 way "Universidade de Aveiro - Campus de Santiago, Rua do Sport Clube Beira-Mar, Glória, Glória e Vera Cruz, Aveiro, Baixo Vouga, Centro, 3810-193, Portugal" amenity university 0.101 Portugal FALSE
+university of porto pt Europe Southern Europe FALSE 1 2021-02-03 100343362 way "Faculdade de Engenharia da Universidade do Porto, s/n, Rua Doutor Roberto Frias, Lamas, Paranhos, Porto, Ã<81>rea Metropolitana do Porto, Norte, 4200-465, Portugal" amenity university 0.418669334531229 Portugal FALSE
+unl pt Europe Southern Europe FALSE 1 2021-02-03 126784870 way "Universidade Nova de Lisboa - Campus de Campolide, Rua de Campolide, Campolide, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1099-032 LISBOA, Portugal" amenity university 0.420803171748129 Portugal FALSE
+vbp pt Europe Southern Europe FALSE 1 2021-02-03 258706958 relation "Vila do Bispo, Faro, Algarve, Portugal" boundary administrative 0.425432597142074 Portugal FALSE
+ariel ps Asia Western Asia FALSE 1 2021-02-03 259276497 relation "×<90>רי×<90>ל, שטח C, الضÙ<81>Ø© الغربية, 4075419, Palestinian Territory" boundary administrative 0.452871408274879 Palestinian Territory FALSE
+basel university ps Asia Western Asia FALSE 1 2021-02-03 44957374 node "Basel Hadidoun, University Street, أبو ديس, منطقة ب, الضÙ<81>Ø© الغربية, Palestinian Territory" building house 0.201 Palestinian Territory FALSE
+beresheet ps Asia Western Asia FALSE 1 2021-02-03 235094607 way "× ×•×£ בר×<90>שית, כפר ×<90>דומי×<9d>, שטח C, יהודה ושומרון, Palestinian Territory" highway residential 0.1 Palestinian Territory FALSE
+clalit health services ps Asia Western Asia FALSE 1 2021-02-03 69773696 node "שירותי ברי×<90>ות כללית, ×”×‘× ×<90>×™, ×<90>רי×<90>ל, שטח C, יהודה ושומרון, 12345, Palestinian Territory" amenity clinic 0.001 Palestinian Territory FALSE
+health ministry ps Asia Western Asia FALSE 1 2021-02-03 3709061 node "Health Ministry, شارع جمال عبد الناصر / المØاÙ<81>ظة, نابلس, منطقة Ø£, יהודה ושומרון, 35214, Palestinian Territory" amenity public_building 0.201 Palestinian Territory FALSE
+ministry of antiquities ps Asia Western Asia FALSE 1 2021-02-03 134576075 way "Ministry of Tourism & Antiquities, شارع جمال عبد الناصر, Øارة الÙ<81>رØية, بيت Ù„ØÙ…, منطقة Ø£, الضÙ<81>Ø© الغربية, 9045634, Palestinian Territory" office government 0.301 Palestinian Territory FALSE
+national security ps Asia Western Asia FALSE 1 2021-02-03 3554333 node "National Security, As-Salam, Qalqilya, قلقيلية, منطقة أ, יהודה ושומרון, 342, Palestinian Territory" amenity police 0.201 Palestinian Territory FALSE
+united nations educational scientific and cultural organization ps Asia Western Asia FALSE 1 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 1.40816286930485 Palestinian Territory FALSE
+united nations' educational ps Asia Western Asia FALSE 1 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 1.00816286930485 Palestinian Territory FALSE
+bc partners pl Europe Eastern Europe FALSE 1 2021-02-03 176794441 way "Partners, Czajki, Å<81>owicz, powiat Å‚owicki, województwo łódzkie, Polska" landuse commercial 0.3 Polska FALSE
+cipla pl Europe Eastern Europe FALSE 1 2021-02-03 258623051 relation "Ciepła, gmina Orońsko, powiat szydłowiecki, województwo mazowieckie, Polska" boundary administrative 0.286834742964615 Polska FALSE
+citi pl Europe Eastern Europe FALSE 1 2021-02-03 258863589 relation "Citibank, 16, Senatorska, Za Żelazną Bramą, Śródmieście Północne, Śródmieście, Warszawa, województwo mazowieckie, 00-082, Polska" amenity bank 0.386834742964615 Polska FALSE
+comex pl Europe Eastern Europe FALSE 1 2021-02-03 236397540 way "Comex, Osiedle Żerniki, Wrocław, województwo dolnośląskie, 54-516, Polska" landuse industrial 0.3 Polska FALSE
+euroimmun pl Europe Eastern Europe FALSE 1 2021-02-03 59855021 node "Euroimmun, 2a, Widna, Osiedle Huby, Wrocław, województwo dolnośląskie, 50-543, Polska" place house 0.101 Polska FALSE
+hcp pl Europe Eastern Europe FALSE 1 2021-02-03 169771922 way "HCP, Wilda, Poznań, województwo wielkopolskie, 61-485, Polska" highway platform 0.2 Polska FALSE
+icar pl Europe Eastern Europe FALSE 1 2021-02-03 80088131 node "ICAR, Droga G, Dzielnica Suchodół, Krosno, województwo podkarpackie, 38-400, Polska" office company 0.101 Polska FALSE
+nafta pl Europe Eastern Europe FALSE 1 2021-02-03 174307 node "Nafta, Wołomin, gmina Wołomin, powiat wołomiński, województwo mazowieckie, 05-200, Polska" place neighbourhood 0.35 Polska FALSE
+net power pl Europe Eastern Europe FALSE 1 2021-02-03 82888359 node "NET MARINE - Marine Power Service, 232D, Pułkownika Stanisława Dąbka, Stare Obłuże, Obłuże, Gdynia, województwo pomorskie, 81-167, Polska" office company 0.201 Polska FALSE
+nicolaus copernicus pl Europe Eastern Europe FALSE 1 2021-02-03 62194300 node "Mikolaj Kopernik, Rynek, Osiedle Słoneczne, Frombork, gmina Frombork, powiat braniewski, województwo warmińsko-mazurskie, 14-530, Polska" historic memorial 0.001 Polska FALSE
+radiometer pl Europe Eastern Europe FALSE 1 2021-02-03 137057564 way "Radiometer, 3, Podmiejska, Osiedle Mikołaja Kopernika, Przedmieście Szczecińskie, Stargard, powiat stargardzki, województwo zachodniopomorskie, 73-110, Polska" building yes 0.101 Polska FALSE
+socé fall pl Europe Eastern Europe FALSE 1 2021-02-03 258917009 relation "Soce, gmina Narew, powiat hajnowski, województwo podlaskie, Polska" boundary administrative 0.331005307834616 Polska FALSE
+stargardt pl Europe Eastern Europe FALSE 1 2021-02-03 14889255 node "Stargard Gubiński, gmina Gubin, powiat krośnieński, województwo lubuskie, 66-633, Polska" place village 0.258218474293395 Polska FALSE
+university of bialystok pl Europe Eastern Europe FALSE 1 2021-02-03 258648531 relation "Politechnika Białostocka - Wydział Mechaniczny, Prosta, Osiedle Tysiąclecia, Piaski, Białystok, województwo podlaskie, 15-351, Polska" building university 0.001 Polska FALSE
+warsaw university pl Europe Eastern Europe FALSE 1 2021-02-03 98622568 way "Uniwersytet Warszawski, Stawki, Osiedle Stawki, Muranów, Śródmieście, Warszawa, województwo mazowieckie, 00-183, Polska" amenity university 0.299521898980972 Polska FALSE
+abdullah gül university pk Asia Southern Asia FALSE 1 2021-02-03 97874378 way "Gul Mohar Road, Danish Abad, University Town, خیبر پښتونخوا, 2500, پاکستان" highway residential 0.2 پاکستان FALSE
+cecos university pk Asia Southern Asia FALSE 1 2021-02-03 157527902 way "Cecos University, اسٹریٹ 1, Hayatabad, خیبر پښتونخوا, پاکستان" amenity university 0.201 پاکستان FALSE
+council and commission pk Asia Southern Asia FALSE 1 2021-02-03 59604170 node "British Council Library, British Council, Shahrah-e-Iran, Five Star Complex, Ú©Ù„Ù<81>ٹن, کراچی, سنڌ, 75600, پاکستان" amenity library 0.101 پاکستان FALSE
+educational foundation pk Asia Southern Asia FALSE 1 2021-02-03 58387964 node "Family Educational Services Foundation, Johar Road, Block 13 Gulistan-e-Johar, Gulistan e Johar, Gulistan-e-Johar, کراچی, سنڌ, 75300, پاکستان" office educational_institution 0.201 پاکستان FALSE
+faisal islam pk Asia Southern Asia FALSE 1 2021-02-03 64354761 node "SADIQUE-E- AQBAR MOSQUE KNOW AS FAISAL MASJID, سڑک منڈی بÛ<81>اؤالدین, گوجرÛ<81>‬‎ قینچی, Khai, پنجاب, 50400, پاکستان" amenity place_of_worship 0.101 پاکستان FALSE
+forman christian college pk Asia Southern Asia FALSE 1 2021-02-03 43029428 node "Forman Christian College University, East Canal Bank Road, Zaildar Park, Muslim Town, Ichhra, پنجاب, 57760, پاکستان" amenity university 0.301 پاکستان FALSE
+government college university pk Asia Southern Asia FALSE 1 2021-02-03 167220711 way "Government College University, Chatterjee Road, Government Printing Press, Old Anarkali, لاÛ<81>ور, پنجاب, 531, پاکستان" amenity university 0.301 پاکستان FALSE
+mach pk Asia Southern Asia FALSE 1 2021-02-03 169738285 way "Mach, Railway Station RD, Mach, بلوچستان, پاکستان" railway station 0.535994792823483 پاکستان FALSE
+medical advancement pk Asia Southern Asia FALSE 1 2021-02-03 59158684 node "Pakistan Institute of Medical Advancement, Shahrah-e-Pakistan, FB Area Block 10, FB Area, Gulberg, کراچی, سنڌ, 75950, پاکستان" amenity hospital 0.201 پاکستان FALSE
+national institute of oceanography pk Asia Southern Asia FALSE 1 2021-02-03 234104875 way "National Institute of Oceanography, Sikandarabad, Keamari, کراچی, سنڌ, پاکستان" landuse commercial 0.6 پاکستان FALSE
+office of higher education commission pk Asia Southern Asia FALSE 1 2021-02-03 57649548 node "Higher Education Commission, Maqboolabad Road 11, Dawood Society, بÛ<81>ادر آباد, کراچی, سنڌ, 75460, پاکستان" office government 0.301 پاکستان FALSE
+optical society pk Asia Southern Asia FALSE 1 2021-02-03 58951925 node "Eastern Optical, Alamgir Road, Bahadurabad Commercial Area, Pakistan Employee Co-operative Housing Society, کراچی, سنڌ, 75460, پاکستان" shop optician 0.201 پاکستان FALSE
+pakistan institute of engineering and applied sciences pk Asia Southern Asia FALSE 1 2021-02-03 126357678 way "Pakistan Institute of Engineering and Applied Sciences (PIEAS), Market Road, ÙˆÙ<81>اقی دارالØکومت اسلام آباد, 44000, پاکستان" amenity university 0.701 پاکستان FALSE
+pakistan irrigation and power department pk Asia Southern Asia FALSE 1 2021-02-03 59500801 node "Irrigation & Power Department, سرکلر روڈ, Ù<81>یصل آباد, پنجاب, 041, پاکستان" office government 0.301 پاکستان FALSE
+people royal society pk Asia Southern Asia FALSE 1 2021-02-03 56507289 node "Sharmila Farooqi People Party Parliament, Shahzad Khalil Road, Dawood Society, بÛ<81>ادر آباد, کراچی, سنڌ, 75460, پاکستان" tourism motel 0.201 پاکستان FALSE
+quaid-i-azam university pk Asia Southern Asia FALSE 1 2021-02-03 173086495 way "Quaid e azam Commerce College, Electrical Lawn, Danish Abad, University Town, خیبر پښتونخوا, پاکستان" office educational_institution 0.401 پاکستان FALSE
+research satellite pk Asia Southern Asia FALSE 1 2021-02-03 57603280 node "Poultry Research Institute, Murree Road, Gulistan-e-Jinnah, Gulshan Dadan Khan, Asghar Mall Scheme, راولپنڈی سٹی, ضلع راولپنڈی, پنجاب, 46300, پاکستان" office research 0.101 پاکستان FALSE
+technology and society pk Asia Southern Asia FALSE 1 2021-02-03 224764336 way "Usman Institute of Technology, ST-13, Abul Hassan Isphani Road, Metroville 3, Memon Nagar, کراچی, سنڌ, 75300, پاکستان" amenity university 0.43855055665356 پاکستان FALSE
+university of engineering & technology pk Asia Southern Asia FALSE 1 2021-02-03 161352903 way "University of Engineering and Technology, Kot Khwaja Saeed Rd, Kot Khwaja Saeed, لاÛ<81>ور, پنجاب, 54010, پاکستان" amenity university 0.401 پاکستان FALSE
+university of engineering and technology pk Asia Southern Asia FALSE 1 2021-02-03 161352903 way "University of Engineering and Technology, Kot Khwaja Saeed Rd, Kot Khwaja Saeed, لاÛ<81>ور, پنجاب, 54010, پاکستان" amenity university 0.501 پاکستان FALSE
+university of guanajuato pk Asia Southern Asia FALSE 1 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان FALSE
+university of istanbul pk Asia Southern Asia FALSE 1 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان FALSE
+university of karachi pk Asia Southern Asia FALSE 1 2021-02-03 228965756 way "University of Karachi, Abul Hassan Isphani Road, Metroville 3, Memon Nagar, کراچی, سنڌ, 75300, پاکستان" amenity university 0.301 پاکستان FALSE
+wns pk Asia Southern Asia FALSE 1 2021-02-03 2678292 node "Nawabshah Airport, ایئرپورٹ روڈ, Haqqani Town, نوابشاÛ<81>‎, سنڌ, پاکستان" aeroway aerodrome 0.325302870611459 پاکستان FALSE
+aav ph Asia South-Eastern Asia FALSE 1 2021-02-03 240979680 way "Allah Valley Airport, Surallah - T'boli Road, Veterans, South Cotabato, Soccsksargen, 9512, Luzon" aeroway aerodrome 0.328965278593994 Luzon FALSE
+academy of science ph Asia South-Eastern Asia FALSE 1 2021-02-03 224316912 way "National Academy of Science and Technology Philippines, Saliksik, Department of Science and Technology, Taguig, Fourth District, Metro Manila, 1631, Luzon" building yes 0.301 Luzon FALSE
+air and energy ph Asia South-Eastern Asia FALSE 1 2021-02-03 158638457 way "Concepcion Carrier Air-Conditioning Co., Energy, Light Industry and Science Park I, Cabuyao, Laguna, Calabarzon, 4025, Luzon" building industrial 0.301 Luzon FALSE
+alibaba ph Asia South-Eastern Asia FALSE 1 2021-02-03 300971258 node "Alibaba, Calbayog, Samar, Eastern Visayas, 6710, Luzon" place village 0.375 Luzon FALSE
+application of technology ph Asia South-Eastern Asia FALSE 1 2021-02-03 160457126 way "Technology Application and Promotion Institute, Upao, Pendatum Village, Central Bicutan, Taguig, Fourth District, Metro Manila, 1631, Luzon" building yes 0.201 Luzon FALSE
+asian development bank ph Asia South-Eastern Asia FALSE 1 2021-02-03 96144607 way "6, Asian Development Bank, Mandaluyong, Metro Manila, 1550, Luzon" landuse commercial 0.818276858334084 Luzon FALSE
+bloomberg l.p. ph Asia South-Eastern Asia FALSE 1 2021-02-03 113997147 way "Bloom Burg, Muntindilaw, Antipolo, Rizal, Calabarzon, 1870, Luzon" highway residential 0.3 Luzon FALSE
+bmc infectious diseases ph Asia South-Eastern Asia FALSE 1 2021-02-03 123804219 way "Infectious Diseases, BGH Driveway, Montinola Subdivision, Phil-Am, Benguet, Cordillera Administrative Region, 30101, Luzon" building hospital 0.201 Luzon FALSE
+cleantech ph Asia South-Eastern Asia FALSE 1 2021-02-03 256929799 way "Cleantech, Jose Abad Santos Avenue, Zone 4, Arayat, Pampanga, Central Luzon, 2012, Luzon" amenity fuel 0.101 Luzon FALSE
+court of appeals ph Asia South-Eastern Asia FALSE 1 2021-02-03 258754444 relation "Court of Appeals, Maria Orosa Street, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" office government 0.301 Luzon FALSE
+department of science technology ph Asia South-Eastern Asia FALSE 1 2021-02-03 99532466 way "Department of Science and Technology, Taguig, Fourth District, Metro Manila, Luzon" landuse commercial 0.762603275084388 Luzon FALSE
+doj ph Asia South-Eastern Asia FALSE 1 2021-02-03 53180869 node "DOJ, Lino Chatto Drive, Tagbilaran, Bohol, Central Visayas, 6300, Luzon" office government 0.101 Luzon FALSE
+el rosario university ph Asia South-Eastern Asia FALSE 1 2021-02-03 14118625 node "Sto Rosario Montessori, Road 3, San Miguel Heights, Valenzuela, Third District, Metro Manila, 1476, Luzon" amenity school 0.201 Luzon FALSE
+freedom of information ph Asia South-Eastern Asia FALSE 1 2021-02-03 66528974 node "Freedom of Information, 1575, Room 3, Jose P. Laurel Street, San Miguel, Sixth District, Manila, First District, Metro Manila, 1005, Luzon" office government 0.301 Luzon FALSE
+georgia college ph Asia South-Eastern Asia FALSE 1 2021-02-03 254844845 way "Georgia College, Psalms Street, Phase 6a, San Jose del Monte, Bulacan, Central Luzon, 3023, Luzon" amenity school 0.201 Luzon FALSE
+greenpeace east asia ph Asia South-Eastern Asia FALSE 1 2021-02-03 27258345 node "Greenpeace Southeast Asia, 30, Dr. Lazcano Street, Laging Handa, Sacred Heart, Scout Area, 4th District, Quezon City, Metro Manila, 1103, Luzon" office ngo 0.301 Luzon FALSE
+healing foundation ph Asia South-Eastern Asia FALSE 1 2021-02-03 12798005 node "Healing Hand Center Foundation, Don Julian Rodriguez Avenue, Purok 7, Datu Loho Village, Metroville Subdivision, Davao City, Davao Region, 8000, Luzon" amenity community_centre 0.201 Luzon FALSE
+heritage ph Asia South-Eastern Asia FALSE 1 2021-02-03 196554341 way "The Heritage, Cebu, Central Visayas, 6001, Luzon" place village 0.375 Luzon FALSE
+institute of biology ph Asia South-Eastern Asia FALSE 1 2021-02-03 259072446 relation "Institute of Biology, Ma. Regidor, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" building yes 0.301 Luzon FALSE
+institute of technology ph Asia South-Eastern Asia FALSE 1 2021-02-03 238492689 way "institute of technology, Marcos Highway, Cabading, Antipolo, Rizal, Calabarzon, 1870, Luzon" amenity college 0.301 Luzon FALSE
+international coalition ph Asia South-Eastern Asia FALSE 1 2021-02-03 164385165 way "Yamato International School, Coalition Street, Lambunao, Iloilo, Western Visayas, 6108, Luzon" amenity school 0.201 Luzon FALSE
+international science and technology center ph Asia South-Eastern Asia FALSE 1 2021-02-03 83192846 node "Eastwood International Institute of Science and Technology, Calle Rizal, Santo Niño, Guagua, Pampanga, Central Luzon, 2003, Luzon" amenity college 0.401 Luzon FALSE
+iqc ph Asia South-Eastern Asia FALSE 1 2021-02-03 301753277 node "IQC TRADING, Pennsylvania Avenue, San Agustin, San Fernando, La Union, Ilocos, 2500, Luzon" shop hardware 0.101 Luzon FALSE
+macarthur ph Asia South-Eastern Asia FALSE 1 2021-02-03 258711621 relation "MacArthur, Leyte 2nd District, Leyte, Eastern Visayas, 6509, Luzon" boundary administrative 0.464463378933884 Luzon FALSE
+manhattan project ph Asia South-Eastern Asia FALSE 1 2021-02-03 113359528 way "Manhattan Townhomes, Project 4, 3rd District, Quezon City, Metro Manila, Luzon" landuse residential 0.4 Luzon FALSE
+marina biotech ph Asia South-Eastern Asia FALSE 1 2021-02-03 55241914 node "Biotech, Narra Road, San Antonio, San Antonio Zone 3, San Pedro, Laguna, Calabarzon, 4023, Luzon" highway bus_stop 0.101 Luzon FALSE
+national journal ph Asia South-Eastern Asia FALSE 1 2021-02-03 57508627 node "Journal, Cuta, Poblacion, Batangas City, Batangas, Calabarzon, 4200, Luzon" place neighbourhood 0.35 Luzon FALSE
+national school of statistics ph Asia South-Eastern Asia FALSE 1 2021-02-03 199594389 way "School of Statistics, Pardo de Tavera Street, Village B, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" building yes 0.301 Luzon FALSE
+national science ph Asia South-Eastern Asia FALSE 1 2021-02-03 151393273 way "Science, Teachers' Village Balong Bato, Balintawak, 6th District, Quezon City, Metro Manila, 1476, Luzon" highway residential 0.2 Luzon FALSE
+national university of general san martín ph Asia South-Eastern Asia FALSE 1 2021-02-03 127228015 way "National University, 551, Mansanas, Sampaloc, 4th District, Manila, First District, Metro Manila, 1008, Luzon" amenity university 0.70242374951 Luzon FALSE
+nccp ph Asia South-Eastern Asia FALSE 1 2021-02-03 132164413 way "National Council of Churches of the Philippines, EDSA, West Triangle, 1st District, Quezon City, Metro Manila, 1104, Luzon" office religion 0.001 Luzon FALSE
+ninoy aquino parks and wildlife center ph Asia South-Eastern Asia FALSE 1 2021-02-03 100214475 way "Ninoy Aquino Parks & Wildlife Center, 1st District, Quezon City, Metro Manila, 1100, Luzon" leisure park 0.65 Luzon FALSE
+odysseus ph Asia South-Eastern Asia FALSE 1 2021-02-03 94252118 way "Odysseus, North Olympus 3, 5th District, Quezon City, Metro Manila, 1124, Luzon" highway residential 0.2 Luzon FALSE
+office of resource development ph Asia South-Eastern Asia FALSE 1 2021-02-03 187766554 way "Cagayan Valley Research, Resource and Development, Maharlika Highway, Apanay, Isabela, Cagayan Valley, 3309, Luzon" office research 0.201 Luzon FALSE
+office of the president ph Asia South-Eastern Asia FALSE 1 2021-02-03 657592 node "Office of the President, Jose P. Laurel Street, San Miguel, Sixth District, Manila, First District, Metro Manila, 1005, Luzon" office government 0.66851441835616 Luzon FALSE
+office of the united nations ph Asia South-Eastern Asia FALSE 1 2021-02-03 159967172 way "United Nations, Taft Avenue, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" railway station 0.529847857867275 Luzon FALSE
+pallas ph Asia South-Eastern Asia FALSE 1 2021-02-03 52259714 node "Pallas, Nueva Vizcaya, Cagayan Valley, Luzon" place village 0.375 Luzon FALSE
+philippine institute of volcanology ph Asia South-Eastern Asia FALSE 1 2021-02-03 112883420 way "Philippine Institute of Volcanology and Seismology, Carlos P. Garcia Avenue, Village B, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" office government 0.74030088440925 Luzon FALSE
+phivolcs ph Asia South-Eastern Asia FALSE 1 2021-02-03 112883420 way "Philippine Institute of Volcanology and Seismology, Carlos P. Garcia Avenue, Village B, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" office government 0.34030088440925 Luzon FALSE
+research center ph Asia South-Eastern Asia FALSE 1 2021-02-03 226223945 way "Research Center, R. Jeciel, Kaytapos, Indang, Cavite, Calabarzon, 4122, Luzon" building university 0.201 Luzon FALSE
+san francisco department of health ph Asia South-Eastern Asia FALSE 1 2021-02-03 674851 node "Department Of Health, Rizal Avenue, Barangay 335, Santa Cruz, Third District, Manila, First District, Metro Manila, 1003, Luzon" amenity public_building 0.401 Luzon FALSE
+securities and exchange commission ph Asia South-Eastern Asia FALSE 1 2021-02-03 165198298 way "Securities and Exchange Commission, Gen Hughes Street, City Proper, Iloilo City, Iloilo, Western Visayas, 5000, Luzon" office government 0.401 Luzon FALSE
+stm association ph Asia South-Eastern Asia FALSE 1 2021-02-03 116275447 way "STM Avenue, Santiago Villas, San Pedro, Davao City, Davao Region, 8023, Luzon" highway residential 0.2 Luzon FALSE
+uk cabinet office ph Asia South-Eastern Asia FALSE 1 2021-02-03 76783411 node "PRU Life UK, Session Road, Court of Appeals Compound, Session Road Area, Benguet, Cordillera Administrative Region, 2600, Luzon" office insurance 0.101 Luzon FALSE
+un world food programme ph Asia South-Eastern Asia FALSE 1 2021-02-03 71056715 node "UN World Food Programme, Sheridan Street, Buayang Bato, Mandaluyong, Metro Manila, 1605, Luzon" office ngo 0.401 Luzon FALSE
+university of el rosario ph Asia South-Eastern Asia FALSE 1 2021-02-03 136114820 way "University of the Philippines Baguio, Governor Pack Road, Montinola Subdivision, Prieto Compound, Baguio, Benguet, Cordillera Administrative Region, 2600, Luzon" amenity university 0.531005307834616 Luzon FALSE
+university of la laguna ph Asia South-Eastern Asia FALSE 1 2021-02-03 203735425 way "University of the Philippines Los Baños, Valentin Sajor, Makiling Heights Housing, Batong Malake, Los Baños, Laguna, Calabarzon, 4031, Luzon" amenity university 0.77788219964298 Luzon FALSE
+university of the philippines diliman ph Asia South-Eastern Asia FALSE 1 2021-02-03 176421389 way "University of the Philippines Diliman, Maginoo, Pinyahan, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" amenity university 0.933110254645355 Luzon FALSE
+us department of education ph Asia South-Eastern Asia FALSE 1 2021-02-03 97691861 way "Department of Education, Meralco Avenue, Oranbo, Pasig, Metro Manila, 1604, Luzon" office government 0.708010995739962 Luzon FALSE
+us treasury ph Asia South-Eastern Asia FALSE 1 2021-02-03 97459657 way "Treasury, SSS Employees Housing Project, North Fairview, 5th District, Quezon City, Metro Manila, 1118, Luzon" highway residential 0.3 Luzon FALSE
+namura pg Oceania Melanesia FALSE 1 2021-02-03 83853387 node "Namura, Eastern Highlands, Highlands Region, Papua Niugini" place village 0.375 Papua Niugini FALSE
+us mineral management service pg Oceania Melanesia FALSE 1 2021-02-03 34369968 node "Department of Mineral Policy and Geohazards Management & Dept. Of Mineral and Energy, Elanese Street, Konedobu, Port Moresby, National Capital District, Papua Region, 111, Papua Niugini" building office 0.201 Papua Niugini FALSE
+atto pe Americas South America FALSE 1 2021-02-03 45780652 node "Atto, Paras, Cangallo, Ayacucho, Perú" place hamlet 0.35 Perú FALSE
+bio farma pe Americas South America FALSE 1 2021-02-03 188369775 way "Bio Farma, Avenida Gaston Garcia Rada, Punta Hermosa, Lima, 15846, Perú" amenity pharmacy 0.201 Perú FALSE
+conida pe Americas South America FALSE 1 2021-02-03 81730105 node "Agencia Espacial del Perú - CONIDA, 1069, Luis Felipe Villaran, San Isidro, Lima, 15046, Perú" office government 0.101 Perú FALSE
+department of interior pe Americas South America FALSE 1 2021-02-03 182000790 way "Ministerio del Interior, Calle 21, Corpac, San Isidro, Lima, AN ISIDRO 15036, Perú" office government 0.33461374284578 Perú FALSE
+etac pe Americas South America FALSE 1 2021-02-03 193236562 way "Etac Perú, Villa El Salvador, Lima, Perú" landuse industrial 0.3 Perú FALSE
+farvet pe Americas South America FALSE 1 2021-02-03 202442899 way "Farvet, Antigua Carretera Panamericana Sur, Antarica, Cruz de La Molina, Chincha Alta, Chincha, Ica, Perú" shop yes 0.101 Perú FALSE
+ica pe Americas South America FALSE 1 2021-02-03 12549210 node "Ica, Perú" place province 0.65 Perú FALSE
+lal pe Americas South America FALSE 1 2021-02-03 258444597 relation "La Libertad, Perú" boundary administrative 0.489309406949894 Perú FALSE
+lam pe Americas South America FALSE 1 2021-02-03 258687618 relation "Lambayeque, Perú" boundary administrative 0.572574193515447 Perú FALSE
+madre de dios pe Americas South America FALSE 1 2021-02-03 258281731 relation "Madre de Dios, Perú" boundary administrative 0.762716953241034 Perú FALSE
+posco pe Americas South America FALSE 1 2021-02-03 44735208 node "Posco, Mariano Nicolás Valcárcel, Camaná, Arequipa, Perú" place village 0.375 Perú FALSE
+spbc pe Americas South America FALSE 1 2021-02-03 10555244 node "Caballococha Airport, Caballococha, Ramón Castilla, Mariscal Ramón Castilla, Loreto, Perú" aeroway aerodrome 0.110430435186894 Perú FALSE
+tnt pe Americas South America FALSE 1 2021-02-03 53869877 node "TNT, Calle Lizardo Alzamora Oeste, San Isidro, Lima, 15073, Perú" amenity post_office 0.495377817800873 Perú FALSE
+unap pe Americas South America FALSE 1 2021-02-03 105022664 way "Unap, Pueblo Libre, Lima, L32, Perú" highway residential 0.2 Perú FALSE
+unas pe Americas South America FALSE 1 2021-02-03 77540241 node "Uñas, Huancayo, JunÃn, 12002, Perú" place suburb 0.275 Perú FALSE
+cte pa Americas Central America FALSE 1 2021-02-03 65786091 node "Aeropuerto de CartÃ, VÃa Nusagandi, CartÃ, Narganá, Distrito Gaigirgordub, Comarca Guna Yala, Panamá" aeroway aerodrome 0.235968355602442 Panamá FALSE
+oma om Asia Western Asia FALSE 1 2021-02-03 258236468 relation عمان boundary administrative 0.680326025870515 عمان FALSE
+agresearch nz Oceania Australia and New Zealand FALSE 1 2021-02-03 134392218 way "Agresearch, Gerald Street, Lincoln, Selwyn District, Canterbury, 7608, New Zealand / Aotearoa" building yes 0.101 New Zealand / Aotearoa FALSE
+antarctic program nz Oceania Australia and New Zealand FALSE 1 2021-02-03 299195494 relation "United States Antarctic Program, Harewood, Christchurch, Christchurch City, Canterbury, New Zealand / Aotearoa" landuse military 0.4 New Zealand / Aotearoa FALSE
+daily telegraph nz Oceania Australia and New Zealand FALSE 1 2021-02-03 68991583 node "The Daily Telegraph building, 49, Tennyson Street, Bluff Hill, Napier City, Hawke's Bay, 4110, New Zealand / Aotearoa" tourism attraction 0.201 New Zealand / Aotearoa FALSE
+defence technology agency nz Oceania Australia and New Zealand FALSE 1 2021-02-03 298049383 way "Defence Technology Agency Naval Field Station, Aotea Great Barrier, Auckland, New Zealand / Aotearoa" landuse military 0.5 New Zealand / Aotearoa FALSE
+gns science in lower hutt nz Oceania Australia and New Zealand FALSE 1 2021-02-03 156362879 way "GNS Science, 1, Fairway Drive, Avalon, Lower Hutt City, Wellington, 5040, New Zealand / Aotearoa" office research 0.821073131097349 New Zealand / Aotearoa FALSE
+institute of environmental science and research nz Oceania Australia and New Zealand FALSE 1 2021-02-03 246653320 way "Institute of Environmental Science and Research, Ambulance Drive, Kenepuru, Porirua City, Wellington, 5022, New Zealand / Aotearoa" amenity research_institute 0.601 New Zealand / Aotearoa FALSE
+landcare research nz Oceania Australia and New Zealand FALSE 1 2021-02-03 144804093 way "Landcare Research - Manaaki Whenua, Riddet Road, Fitzherbert, Palmerston North City, Manawatū-Whanganui, 4118, New Zealand / Aotearoa" building yes 0.201 New Zealand / Aotearoa FALSE
+le maho nz Oceania Australia and New Zealand FALSE 1 2021-02-03 64971060 node "Mahoe, Tararua District, Manawatū-Whanganui, New Zealand / Aotearoa" natural peak 0.4 New Zealand / Aotearoa FALSE
+national institute of water and atmospheric research nz Oceania Australia and New Zealand FALSE 1 2021-02-03 157336573 way "National Institute of Water and Atmospheric Research, Evans Bay Parade, Hataitai, Wellington, Wellington City, Wellington, 6011, New Zealand / Aotearoa" amenity research_institute 0.701 New Zealand / Aotearoa FALSE
+otago museum nz Oceania Australia and New Zealand FALSE 1 2021-02-03 128177149 way "Otago Museum, Great King Street, North Dunedin, Dunedin, Dunedin City, Otago, 9016, New Zealand / Aotearoa" tourism museum 0.501865618613023 New Zealand / Aotearoa FALSE
+pacific islanders nz Oceania Australia and New Zealand FALSE 1 2021-02-03 209280117 way "Pacific Islanders' Presbyterian Church, Corner, Daniell Street, Newtown, Wellington, Wellington City, Wellington, 6021, New Zealand / Aotearoa" amenity place_of_worship 0.201 New Zealand / Aotearoa FALSE
+toi ohomai institute of technology nz Oceania Australia and New Zealand FALSE 1 2021-02-03 172831289 way "Toi Ohomai Institute of Technology, Ashworth Street, Tokoroa Central, Tokoroa, South Waikato District, Waikato, 3444, New Zealand / Aotearoa" amenity university 0.501 New Zealand / Aotearoa FALSE
+university of canterbury nz Oceania Australia and New Zealand FALSE 1 2021-02-03 120801912 way "University of Canterbury, Balgay Street, Halswell-Hornby-Riccarton Community, Christchurch, Christchurch City, Canterbury, 8041, New Zealand / Aotearoa" amenity university 0.77064161791144 New Zealand / Aotearoa FALSE
+university of waikato nz Oceania Australia and New Zealand FALSE 1 2021-02-03 98803266 way "University of Waikato, Greensboro Street, Hamilton East, Hamilton City, Waikato, 3216, New Zealand / Aotearoa" amenity university 0.719453010430519 New Zealand / Aotearoa FALSE
+ccrc np Asia Southern Asia FALSE 1 2021-02-03 143860199 way "CCRC, Kot Devi Marg, ठà¥<81>लोधारा, Jadibuti, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, WARD TBD, नेपाल" amenity college 0.101 नेपाल FALSE
+department of hydrology and meteorology np Asia Southern Asia FALSE 1 2021-02-03 67792541 node "Department of Hydrology and Meteorology, Bhagwati marg, Kamalpokhari, Narayan Chaur, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 1201, नेपाल" office government 0.501 नेपाल FALSE
+forum pharmaceuticals np Asia Southern Asia FALSE 1 2021-02-03 18726884 node "Pharmaceuticals, New Plaza Marg, Bansh Ghari, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, KATHMANDU - 32, नेपाल" amenity pharmacy 0.101 नेपाल FALSE
+gene drive research np Asia Southern Asia FALSE 1 2021-02-03 45860468 node "Gene Bank, F102, Tutepani, Satdobato, Patan, Lalitpur, वागà¥<8d>मती पà¥<8d>रदेश, 44702, नेपाल" office government 0.101 नेपाल FALSE
+national academy np Asia Southern Asia FALSE 1 2021-02-03 143931274 way "National Academy, Pancha Buddha Galli, Shankhamul Chok, Buddha Nagar, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 44617, नेपाल" amenity school 0.201 नेपाल FALSE
+national academy of science and technology np Asia Southern Asia FALSE 1 2021-02-03 187375163 way "National Academy Of Science And Technology(NAST), Main Road, Chauraha, Dhangadi, Dhangadi Sub Metropolitan, Dhanhadhi, सà¥<81>दà¥<81>र पशà¥<8d>चिमाञà¥<8d>चल विकास कà¥<8d>षेतà¥<8d>र, 091, नेपाल" amenity school 0.601 नेपाल FALSE
+national society for earthquake technology np Asia Southern Asia FALSE 1 2021-02-03 135924284 way "National Society for Earthquake Technology (NSET), F103, Bhaisepati, Sainbu, Lalitpur, ललितपà¥<81>र, वागà¥<8d>मती पà¥<8d>रदेश, 13775, नेपाल" building office 0.501 नेपाल FALSE
+ndrc np Asia Southern Asia FALSE 1 2021-02-03 140439984 way "NDRC Nepal, Radha Mohan Marga, सिरà¥<8d>जना टोल, Naya Baneshwar, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 34, नेपाल" building yes 0.101 नेपाल FALSE
+taliban np Asia Southern Asia FALSE 1 2021-02-03 14527782 node "Taliban, Bhadaure Tamagi, Annapurna, कासà¥<8d>की, गणà¥<8d>डकी पà¥<8d>रदेश, 009755, नेपाल" place village 0.375 नेपाल FALSE
+'black hole sun NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+2013 association for molecular pathology v. myriad genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+21st century cures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+60-strong association of american universities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+68th world health assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+8th global summit of national bioethics advisory bodies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+a. e. lalonde accelerator mass spectrometry laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+a. n. belozersky institute of physico-chemical biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aaas center for science diplomacy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aaas council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aaas science policy fellow NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aajc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aas committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aas data NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aas open research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aaup NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+abdus salam international centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aboriginal heritage project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+abpi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+abraxis bioscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academia sinica's genomics research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of experiments NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of military science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of military sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of motion picture arts and sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of sciences leopoldina NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy's research institute for soils science and agricultural chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+accountability in research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aclu first amendment working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acorda therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"acquisition, technology and logistics agency" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acs chemical biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acs publications division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acta crystallographica section e NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acta genetica sinica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acta zoologica sinica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ada lovelace institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+adam mickiewicz university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+adaptive biotechnologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+addex therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+administration for community living NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced immunization technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced international joint stock company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced maui optical and space surveillance technologies conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced research projects agency—energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced science institute in saitama NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advaxis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advisory committee on human radiation experiments and the national institutes of health's human embryo research panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advisory committee on pesticides NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advisory council on underwater archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advocacy center for democratic culture NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aedes genome working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aerial photography field office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aeronautical research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aerosol robotic network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+affordable clean energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+affordable energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+affymetrix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+afghan taliban NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+africa carbon forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+africa labs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+africa regional certification commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african biotechnology stakeholders forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african center of excellence for genomics of infectious diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african centres for disease control and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african elephant coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african health research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african network for drugs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african network for drugs and diagnostics innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african physical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african population and health research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african science academy development initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african studies university of london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african union commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency for evaluation of research and higher education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency for science technology and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"agency for science, technology and research" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency of quality assurance in education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agricultural research cooperation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agu board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agu council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agu ethics committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ahrq NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aids program of research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+air resources laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+air university's china aerospace studies institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+airborne snow observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+airfinity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+airlines for america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ajol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+akershus university college of applied sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+akin gump NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alain aspect NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alamogordo primate facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alaska public radio on 13 march NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alaska regional research vessel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alaska supreme court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+albert einstein college of medicine of yeshiva university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alberta energy regulator NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alberta environment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alberta newsprint company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alberta wilderness association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alder hey children's nhs foundation trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aleph farms NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alexander von humboldt biological resources research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred p. sloan foundation and foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred wegener institute helmholtz centre for polar and marine research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alistair reid venom research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alkahest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+all india institutes of medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+all india people's science network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+all-russian scientific research institute of experimental physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allen brain observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allen coral atlas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allen institute and cold spring harbor laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance for accelerating excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance for climate education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance of democratic forces NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allied democratic forces NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allsky meteor surveillance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+altacorp capital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alternative energies and atomic energy commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+altius institute for biomedical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+altona diagnostics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amarakaeri indigenous reserve NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazon conservation association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazon tree diversity network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazonian tall tower observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american academy of forensic sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american academy of pediatrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association for public opinion research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association for the advancement of science and fens NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association for the advancement of science and the association of american universities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association for the study of liver diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association of physical anthropology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association of variable star observers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american astronautical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american astronomical society and american geophysical union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american astronomical society's committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american astronomical society's division for planetary science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american beverage institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american bird conservancy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american cancer society cancer action network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american chemical council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american climber science program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of cardiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of medical genetics and genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of obstetrics and gynecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of rheumatology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of veterinary internal medicine forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american counterinsurgency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american economic review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american federation for aging research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american federation of government employees NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american fisheries society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american geophysical union fall meeting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american geosciences institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american immigration reform NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american institute of aeronautics and astronautics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american institutes for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of botany NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of clinical nutrition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of human genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of kidney diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of primatology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american mathematical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american medical association's council on science and public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american meterological society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american physical society division of plasma physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american physiological society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american school of oriental research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american schools of oriental research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for clinical investigation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for human genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for virology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of clinical oncologists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of gene and cell therapy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of microbiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of plant biologists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of tropical medicine & hygiene NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american sociological association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american sociological review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american spinal injury association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american wind energy association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+americans for medical advancement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amflora NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amoy diagnostics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amsterdam university of applied sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anatomy and genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ancora pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+andrés bello university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+andrew fire of stanford university school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anglo-american press association of paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal advocacy group humane society international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal behaviour NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal biotechnology innovation action plan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal defenders international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal physiological ecology department NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+antarctic climate and ecosystem cooperative research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+antarctic ocean alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+antarctic support contract NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anthropological society of paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anti-vivisection league NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+antioquia school of engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anvur NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aosis publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+apco worldwide NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aplu NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+appec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+appropriate energy laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aptimmune biologics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aptl NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aquabounty technologies of maynard NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arab gulf states institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arab union of astronomy and space sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arabidopsis information resource NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aratana therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arch coal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+archaeology museum of cantabria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+archives of internal medicine and annals of internal medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arctic monitoring and assessment programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arctic oscillation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arden ahnell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arecibo observatory as the world NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argentine museum of natural sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argentinian institute of snow NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argentinian national university of la plata NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argentinian physical association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argos therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arid regions environmental and engineering research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arizona board of regents NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"arizona state university's consortium for science, policy and outcomes" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+art world congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aruna biomedical NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arxiv.org NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ashvin vishwanath NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asia pacific movement on debt & development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asian cancer research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asian cities climate change resilience network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aspen global change institute in basalt NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aspen pharmacare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asset owners disclosure project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for american universities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for assessment and accreditation of laboratory animal care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for computing machinery NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for molecular pathology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for research in vision NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for the accreditation of human research protection programs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for women in science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association international conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of clinical trials organizations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of imaging producers and equipment suppliers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of internet researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of universities and colleges of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of university councils NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of university export control officers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of women in science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of zoos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asthma health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrogenetix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astronomical journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astronomical observatory of padua NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astronomy allies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astroparticle physics european consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrophysical multimessenger observatory network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrophysical observatory of turin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrophysics journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrosat NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+athena dinar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+athena swan charter NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+atlantic plaza towers tenants association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+atmospheric dynamic mission aeolus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+atomic energy of canada limited NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+attestation commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+attosecond science lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+attosecond science laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+auriane egal of the paris observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australasian neuroscience society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australasian virology society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australia institute think-tank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian academy of the humanities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian centre for space engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian criminal intelligence commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian department of agriculture and water resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian greens NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian greens party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian institute of marine sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian mountain research facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian nuclear science and technology organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian parliament NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian renewable energy agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian research centre for urban ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+austrian academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autism research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autobio diagnostics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autonomous university of campeche NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autonomous university of madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autonomous university of of yucatán NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autonomous university of zacatecas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+avandia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+avogadro project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+axiom international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+axion dark matter experiment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+axios review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+azure hermes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+baby biome study NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ball aerospace and technologies corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+balseiro institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+baltimore ecosystem study NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bangabandhu sheikh mujib medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bangladesh rural advancement committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barcelona institute for global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barcelona institute of global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barcelona institute of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barcode of life NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+baring private equity asia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barnett shale NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barrick gold corporation of toronto NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basel action network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basel declaration society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basic income earth network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basque centre for climate change in bilbao NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basque nationalist party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bates linear accelerator center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+batthyány society of professors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+baylor university's institute of archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bbc news sound NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bcse NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beam therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bear specialist group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beckman research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+behavioral pharmacology research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing institute of biological products NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing institute of biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing institute of transfusion medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing national laboratory for condensed matter physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing national laboratory for molecular sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing normal university's school of systems science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing proteome research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing wuzi university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+belgian maritime company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bell burnell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+belmont report NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+belozersky institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+benefit people and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bentz whaley flessner NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berkeley geochronology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berkeley global science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berkeley open infrastructure for network computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berkeley's museum of vertebrate zoology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bernhard nocht institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bernhard nocht institute for tropical medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bernhard nocht institute for tropical medicine in hamburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berry consultants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beth strain of the university of melbourne NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bgi americas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bhartiya janata party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bhartiya kisan union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bibsam consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bilbao crystallographic server NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bilgi university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+binney street project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioacademy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biobricks foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biodesign institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biodiversity and ecosystem services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioeconomy capital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioethics international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biofab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioglobe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioindustry association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioinformatics and systems engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"bioinformatics institute of the agency for science, technology and research" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biologics consulting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomarkers consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomed research international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomedical and environmental research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomedical basis of elite performance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bionano interactions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biooncology consultants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biophysical chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biophysical journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioprocess capital ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biosafety council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biosimilar medicinal products NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biospecimen governance committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biospheric sciences laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotech news NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology center of the technical university of dresden NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bipartisan policy center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bittorrent NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bjarke ingels group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+black justice league NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blackpak of san francisco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blaise pascal university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blood systems research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg europe pharmaceutical index NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg nef NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blue plains advanced wastewater treatment plant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blue ribbon commission on america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bluebird bio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bnef NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+board for investigation of misconduct in research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boeing aerospace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boldly go institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bologna astronomical observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bonanza creek long term ecological research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+borlaug global rust initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+borneo futures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+borneo nature foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+borneo orangutan survival foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bosch research and technology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston biopharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston chemical data corp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston company life biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston health care for the homeless program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bowie medal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian agricultural research corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian development bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian federal agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian institute of museums NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian renewable energy company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian science academy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian social democracy party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian society of genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian society of zoology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian synchrotron light laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+breakthrough prize foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+breakthrough starshot NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+breast cancer laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british association for psychopharmacology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british atmospheric data centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british columbia centre for aquatic health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british columbia society for the prevention of cruelty to animals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british ecological society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british go association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british journal of psychiatry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british medical association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british navy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british science association media NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british science association media fellow NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brooklyn criminal court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brotman baty institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brotman baty institute for precision medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brown university school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bruno kessler foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bryan cave llp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+buck institute for age research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bureau of investigative journalism NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bureau of ocean energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bureau of ocean energy management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+burke medical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+burnham institute for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+business council for sustainable energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bvdv NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+caddo nation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cadi ayyad university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+caixin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california blueprint for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california climate science and solutions institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california cooperative oceanic fisheries investigations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california department of corrections and rehabilitation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california department of pesticide regulation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california digital library NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california geological survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california health care facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california initiative for advancing precision medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california institute for biomedical research (calibr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california institute for regenerative medicine in oakland NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california national primate research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california strategic growth council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+calnex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+calorimetric electron telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+caltech msw NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+camagüey meteorological center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambodia vulture conservation project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge analytica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge antibody technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge healthtech institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge institute for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge university hospitals nhs foundation trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+campaign against torture NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+campaign for access to essential medicines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+campaign for social science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada excellence research chairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada first research excellence fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada research chair NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada research chair in interfacial phenomena NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada research chairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian association of postdoctoral scholars NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian astronomical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian carbon program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian centre for alternatives to animal methods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian centre for climate modelling and analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian council of research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian council on animal care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian environmental assessment agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian institute for advanced research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian institute for theoretical astrophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian institute for theoretical astrophysics in toronto NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian journal of zoology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canberra deep space communication complex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cancer genome atlas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cancer research uk cambridge institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cancer voices australia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cape wind associates NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+care quality commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carelife medical NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+caribou biosciences of berkeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carlos iii health institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carlos iii institute of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie climate geoengineering governance initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie institution for science in stanford university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie institution for science's department of global ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie institution for science's department of global ecology in stanford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie institution in stanford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie mellon's robotics institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas research centre for eco-environmental sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas) institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas) institute of zoology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+casa sollievo della sofferenza research hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catalan institute of palaeontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catalina sky survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic climate covenant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of brasilia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of dom bosco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cavu biotherapies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cayman trough NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cb insights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cbc news NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cbrain NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdiac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdm watch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdmsii NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdsco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdu/spd coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ceew NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+celator pharmaceuticals of ewing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cell biology of infectious pathogens NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cell signaling technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cell therapy group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+celldex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+celldex therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cellular dynamics international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+census of marine life NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for a new american security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for amazonian science and innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for amazonian scientific innovation at wake forest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for american progress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for astrophysics and space science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for axion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for biodefense NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for biomedical informatics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for biosecurity of upmc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for cancer genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for carbon removal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for chemical toxicology research and pharmacokinetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate and security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate change and energy solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate change impacts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for clinical precision medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for conservation biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for desert agriculture NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for development of advanced medicine for dementia in obu NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for devices and radiological health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for disease control's division of tuberculosis elimination NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for disease dynamics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"center for disease dynamics, economics & policy" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for drug development science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for economic and social research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for ethics in health care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for genetic engineering and biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for global health science and security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for global tobacco control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for health equity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for health security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for high impact philanthropy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for human reproduction NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for infection and immunity at columbia university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for infectious disease research and policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for intelligent systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international climate and energy policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international earth science information network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international environmental law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for life science technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for macroecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for marine biodiversity and conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for marine research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for mass spectrometry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for medical education and clinical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for medical progress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for mexican american studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for negative emissions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for neuroregeneration research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for prevention of preterm birth NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for public integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for responsible research and innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for responsive politics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for science and environment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for science communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for science diplomacy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for science in the public interest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for shark research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for stem cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for systems science and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for technology innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for the management of medical technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for underground physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for vaccine development and global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for vulnerable populations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for worklife law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central caribbean marine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central committee of sudan doctors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central comprehensively deepening reforms commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central design bureau for machine building NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central drug research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central drugs standard control organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central european institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central european standard time NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central pacific fisheries commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central zagros archaeological project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for agricultural research basile caramia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for agriculture and bioscience international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for antimicrobial resistance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for arctic gas hydrate NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for climate modelling and analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for climate risk and opportunity management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for climate services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for earth observation and digital earth NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for evidence-based medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for eye research australia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for genetics and society in berkeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for genomic regulation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for geographic medicine research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for integrated quantum science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for interdisciplinary computational and dynamical analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for longitudinal studies at university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for microbial ecology and genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for minerals research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for non-timber resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for observation and modelling of earthquakes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for proteomic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for quantum computation and communication technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for reproduction and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for research on adaptive nanostructures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for research on energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for the aids program of research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre of excellence for climate system science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre of excellence for invasion biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre of study for the promotion of peace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ceshe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cgiar consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cgpm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+charité university hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+charity equality challenge unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chemical & engineering news NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chemical forensics international technical working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chemical sciences division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chemistry and metallurgy research replacement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chengdu medgencell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cherenkov array telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chesapeake bay program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chesapeake energy corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chicago bears nfl NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chicago community trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chico mendes institute for biodiversity conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+children's cancer institute australia for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+children's cause for cancer advocacy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+children's choir of île-de-france NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chilean navy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chilean society for cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chimerix of durham NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china american psychoanalytic alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china animal health and epidemiology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china biodiversity conservation and green development foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china building materials academy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china cdc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china clean energy research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china manned space agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china mobile laboratory testing team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china national accreditation service for conformity assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china national nuclear corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china national renewable energy centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china olympic committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china tribunal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinabio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of science's institute of geology and geophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences institute of biophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences institute of neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences key laboratory of mental health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences key laboratory of pathogenic microbiology and immunology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences national astronomical observatories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences national astronomical observatory of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences wuhan institute of virology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences xishuangbanna tropical botanical garden NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of policy management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' key laboratory of aerosol chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' national space science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' shanghai institute of plant physiology and ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' shanghai institutes for biological sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' strategic priority program on space science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences's institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of social science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese association for science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese association of traditional chinese medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese cdc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese groundwater science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese institute for brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese journal citation report NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese ministry of education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese national astronomical observatories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese national health commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese neuroscience society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese olympic committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese science publishing and media NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese state forestry administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chintan environmental research and action group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+christian abee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+christian democrat and social democrat NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chronic fatigue and immune dysfunction syndrome association of america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chuv university hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cicero center for international climate research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ciencia en el parlamento NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cihr institute of health services and policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cihr's institute of gender health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cinergi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+circuit court of appeals for the district of columbia circuit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cities climate leadership group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+citizens' council for health freedom in st paul NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+citizens' nuclear information center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+civic alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+civil movement for support of bulgarian science and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+civil protection agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clack paper NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clalit research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clarke & esposito NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean air action group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean air safety advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean energy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean water institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clemson university restoration institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clermont-ferrand physics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate absolute radiance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate and atmosphere department of the norwegian institute for air research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate and clean energy program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate change and atmospheric research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate change and coffee forest forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate change authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate justice programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate outreach NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate protection partnerships division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate science centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climateworks foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clinical trials cooperative group program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr institute for neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr institute for protein biochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr's institute of genetic and biomedical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr's institute of geosciences and earth resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs centre for cognitive neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs institute of nuclear physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs laboratory for archaeomaterials NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs theoretical physics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs unit of neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition against childhood cancer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for epidemic preparedness innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for gm free india NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for national science funding NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition of epidemic preparedness NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coastal protection and restoration authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coastal research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cochrane collaboration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cochrane database syst NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cognitive neuroscience society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cognitive science society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coin sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cold atom laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+collaboration for research excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+collaborative network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+college of medicine and veterinary medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+college of oceanic and atmospheric sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+collider detector NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombia agricultural institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombian academy of exact NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombian academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombian association of scientific journalism NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombian supreme court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colorado scientific society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colorado state university libraries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia cancer agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia center for children's environmental health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia centre for excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia dogfish hook and line industry association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university vagelos college of physicians NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's earth institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's international research institute for climate and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's kreitchman pet center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's mailman school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commercial aircraft corporation of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commercial lunar payload services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commission for the conservation of antarctic marine living resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commission for the geological map of the world NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee for ethics in science and higher education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee for medicinal products for human use NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee for the universities of palestine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on carcinogenicity of chemicals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on energy and commerce NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on environment and public works NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on human rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on human rights of the us national academies of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commonwealth fusion systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commonwealth scientific and industrial research organisation's health and biosecurity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commonwealth scientific and industrial research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commonweath scientific and industrial research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+community association for psychosocial services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+comparative medicine and animal resources centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+complexity science hub NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+complexity science hub vienna NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+computational life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+concytec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+confederation of british industry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+conference of italian university rectors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+congo research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+congolese national biomedical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"congress, press" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+congress's house of representatives NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+congressional asian pacific american caucus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+conhecimento sem cortes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortia advancing standards in research administration information NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortium for higher education and research performance assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortium of universities for global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+constellation observing system for meteorology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consultative committee for units NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consumer healthcare products association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consumer watchdog in santa monica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+convergent science physical oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cooperative institute for meteorological satellite studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coordinated universal time NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+copernicus atmospheric monitoring service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+copernicus climate change service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coral reef airborne laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coral reef laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+corgenix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cornell university center for advanced computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cornell university college of veterinary medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+corrupt public health research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cortical networks NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+corvelva NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cosmochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+costa rica institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cotec foundation for innovation in madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coulston foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for british archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for higher education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for mainland affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for science and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"council for science, technology and innovation" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of canadian academies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of science editors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of scientific societies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council on animal care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council on bioethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council on energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council on government relations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+court of appeals for the district of columbia circuit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covax NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid-19 clinical research coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid-19 genomics uk consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid-19 prevention trials network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid-19 research coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cpc analytics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+crbn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cretaceous research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+crick worldwide influenza centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+criminal justice information services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+critical assessment of genome interpretation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+crop engineering consortium workshop NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cross river gorilla landscape project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cross-strait policy association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+crowell & moring NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cryogenic laser interferometer observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+csic institute of public goods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ctnbio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cubist pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cwts leiden ranking NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cyberspace administration of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+d.e. shaw research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dalla lana school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dama/libra NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+danish ministry of energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+danish society for nature conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+darwin biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+darwin tree of life project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+data environnement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+data for health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+data science journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dc circuit court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dcsd NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+debasis sengupta NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+debye institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+decadal survey implementation advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+decision resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep fault drilling project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep space network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep-sea research and earth systems science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepmind health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepsea challenger NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepstack NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepwater horizon unified command NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deeu NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+defense meteorological satellite program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+defense threat reduction agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+delhi dialogue commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+delhi pollution control committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+democratic unionist party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dendreon corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+denka seiken NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"department for business, innovation & skills" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department for energy and climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"department for environment, food & rural affairs" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of bioethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of civil rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of commerce.over NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of economic development and commerce NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of energy and climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of energy's high energy physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of environment and resource management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of food safety NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of global ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of health studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of higher education and training NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of immunization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of marketing and consumer studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of neurodegenerative disease at university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of quantum matter at hiroshima university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of science and technology and department of biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deployable tower assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+desmog canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deutsch williams brooks derensis & holland NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+devore & demarco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dewpoint therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dhs domestic nuclear detection office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+diaprep systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+digital curation centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+digital life summit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+digital reconstruction of axonal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dinama NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dinosaur institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+directorate general for nature conservation and national parks NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+disaster prevention research institute of kyoto university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+disciplinary board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+discrete analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+disease foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+disruptive technologies program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+distilled spirits council of the united states NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ditsong national museum of cultural history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+division of molecular and cellular biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+division of public health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dna doe project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe's office of nuclear physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe's pacific northwest national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe) office of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dokuz eylül university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+donald w. reynolds foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dornsife college of letters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dr. lucy jones center for science and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drc health research and training program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drexlin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drosophila board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drosophila genetic reference panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drosophila species stock center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dryden research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dscovr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke canine cognition center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke center for applied genomics and precision medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke global health innovation center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke institute for brain sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke institute for genome sciences & policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dundee drug discovery unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+durrell institute of conservation and ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch association of innovative medicines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch general intelligence and security service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch institute for public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch ministry of education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch petroleum society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dylan morris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+e. s. grant mental health hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+e.on global commodities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth biogenome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth microbiome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth science women's network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth system physics section NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth system science data NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earthcube NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earthrise alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earthwatch institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ebola diagnostics for partners in health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ebola research and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ebrs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eclamc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecohealth alliance malaysia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecole nationale supérieure de chimie de montpellier NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecological research network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecological society of australia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecology and island conservation group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecosystem services for poverty alleviation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+edcarn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+editas biotechnologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+edition diffusion press sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+education analytics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+education policy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+egidio feruglio palaeontological museum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eighth framework programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eighth framework programme of research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+einstein college of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eisai pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+el niño/southern oscillation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+elea phoenix laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+electric reliability coordinating council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+electron microscopy data bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+electronic medical records and genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+electronics takeback coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eli consortium's international scientific and technical advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eli eric NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eli-eric NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eliminate dengue program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+elon musk of spacex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+embl european bioinformatics institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emile cartailhac prehistoric art research and study center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emirates lunar mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emissions database for global atmospheric research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emory centre for ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emory universitycompeting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+encyclopaedia britannica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+endocrine society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and climate change committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and commerce committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and sustainable development analysis centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy biosciences institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy department's carbon dioxide information analysis center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy frontier research centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy policy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+engine biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+engineering fracture mechanics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+engines and energy conversion laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+entasis therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+entomological society of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environment agency austria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environment at imperial college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environment research agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental dynamics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental grantmakers association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental health committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental influences on child health outcomes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental molecular sciences laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental observation and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental risk management authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eötvös loránd research network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epa science advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epa science advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epa's office of air NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epa's office of air and radiation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epidiolex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epiphany biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+equality challenge unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+equity advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+equity task force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+erc science council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+erc scientific council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+erwin schrödinger institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa coordination office for the scientific programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa ecological monographs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's clean space NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's european space astronomy centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's rosetta NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's science programme committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's space situational awareness programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's xmm-newton NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+escro NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esrc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+essential medicines campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eswi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eta car NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eta carinae NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eth bioenergia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ethics commission on automated NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eu erasmus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eu general affairs council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eunice kennedy shriver national institute of child health and human development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eurasia group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eurogroup for animals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european academies' science advisory council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european academy bozen/bolzano NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european association of archaeologists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european association of research and technology organisations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european biological rhythms society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european biomedical research association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european brain council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european centre for geoscience research and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european citizens NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european commission joint research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european competitiveness council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european congress on tropical medicine and international health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european consortium of taxonomic facilities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european cooperation in science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european defence fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european economic area NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european education area NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european federation of academies of sciences and humanities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european food information council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european green deal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european grid infrastructure federated cloud NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european human brain project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european infravec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european journal of human genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european mathematical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european mobile laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european molecular biology organization installation grant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european parliament and council of ministers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european parliament intergroup NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"european parliament's industry, research and energy" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european patent forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european people's party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european project for ice coring NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european public health alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european repository development organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european research and innovation at university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european scientific working group on influenza NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european sentinel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european society for medical oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european society of human genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european strategy for particle physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european strategy for particle physics update NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european strategy forum on research infrastructures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european telecommunications standards institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european timber regulation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european union clinical trials register NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european union's copernicus climate change service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european university institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european very long baseline interferometry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eutr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ev-k2-cnr association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+evaluation of graduate education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+event horizon telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+evidence for democracy in ottawa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+evidence-based medicine datalab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+excellence commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exelon corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exoanalytic solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exoplanet characterization observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exoplanet exploration program analysis group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+extremes sustainability research network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exxon valdez oil spill trustee council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+f1000 research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+face2gene NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fahlgren NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fall meeting of the american geophysical union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fao conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+farallon institute for advanced ecosystem research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fausto llerena breeding center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fbi houston NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fbi houston division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fda's office of device evaluation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+february us department of energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal bureau of investigation's bioterrorism protection team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal emergency management agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal energy regulatory commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal environment agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal institute for risk assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal institute of physical and technical affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal interagency solutions group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal ministry of labour and social affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal pell grant program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal polytechnic school of lausanne NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of archaeological managers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of young scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+femto-st institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fermilab center for particle astrophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fermilab's physics advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fifth ministerial conference on environment and health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+financial oversight and management board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+finlay institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+finless foods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+first affiliated hospital of nanchang university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+first conference of ministers responsible for meteorology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+first institute of oceanography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fisheries and aquaculture policy and resources division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fisheries research and development corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fisheries trade programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+flanders institute of biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+flanders marine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+flatiron institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+flexible solutions international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+florida atlantic university's harbor branch oceanographic institute in fort pierce NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+florida institute for conservation science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+florida state university's coastal and marine laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+focac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foldrx NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fondazione telethon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+food and drug adminstration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foping nature reserve NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forest products association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forest products association of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forth biomedical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forum for biotechnology and food security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forum for responsible research metrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forum of european neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for aids research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for biotechnology awareness and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for polish science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for strategic research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for the national institutes of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frank & delaney NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frankfurt kurnit klein & selz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fraunhofer institute for wind energy and energy system technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french academy of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"french agency for food, environmental and occupational health & safety" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french alternative energies and atomic energy commision NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french association of academics for the respect of international law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french atomic energy commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french committee for research and independent information on genetic engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french institute for development research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french institute for research in computer science and automation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french institute of health and medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french institute of oriental archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french labour force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french league for the protection of birds NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"french ministry of higher education, research and innovation" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national higher institute of aeronautics and space NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national institute for agricultural research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national radioactive waste management agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french office of research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french polar institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french society of developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+friedrich schiller university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fritz haber institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers and of nature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers in psychology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers media NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontline research excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fsc development services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fudan university's institute of science and technology for brain-inspired intelligence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fundación ciencia & vida NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+funding authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+future meat technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+future of humanity institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gamaleya national research centre for epidemiology and microbiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gamaleya research institute of epidemiology and microbiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gcrf NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ge free new zealand NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ge free nz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ge healthcare of chalfont st giles NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ge hitachi nuclear energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geel electron linear accelerator NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geisinger health system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gene biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gene campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gene editing technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gene therapy catapult NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+general administration of press and publications NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+general automation lab technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+general public license NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+general secretariat for research and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+generic pharmaceutical association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genes & development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genes genomes genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic biocontrol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic immunity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geneticist george church of harvard medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geneticist george church of harvard university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetics and public policy center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genexpert ebola assay NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genome research limited NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genome sequencing center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genomic data commons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genomics and bioinformatics research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genomics institute of the novartis research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gensight biologics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geohazards international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geological institute of hungary NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geometric intelligence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geooptics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+george church of harvard university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+george institute for international health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+george mason center for climate communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+george mason university's mercatus center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+georgetown university's climate center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+georgia public health association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geos institute in ashland NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german animal welfare federation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german association of research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german cancer research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german centre for cardiovascular research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german federal criminal police office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german federal institute for geosciences and natural resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german federal institute for risk assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german federal office of radiation protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german press agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german research funding council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+germany max planck digital library NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+giraffe conservation foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gitwilgyoots first nations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+given google NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gladstone institute of cardiovascular disease NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+glaxosmithkline NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+glioblastoma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global academy of young scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global alliance for vaccines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global biodiversity outlook NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global campaign for microbicides NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global change & ecosystem services at conservation international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global change biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global change research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global conference on agricultural research for development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global coral reef monitoring network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global environmental model NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global forest resources assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global gas flaring reduction partnership NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global genome initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global green growth institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global health group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global health security agenda NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global human development program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global influenza surveillance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global lake temperature collaboration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global lunar conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global malaria eradication programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global malaria programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global oceanographic data archaeology and rescue project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global open data for agriculture and nutrition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global partnership for sustainable development data NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global policy research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global polio eradication initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global positioning system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global positioning systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global preparedness monitoring board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global relay of observatories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global research report africa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global sea mineral resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global security at los alamos national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global telecommunications system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global wildlife conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global wind energy council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gloucester resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+glxp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+glyphosate task force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gmo laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+goddard spaceflight center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+golden state killer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gondwana research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+good food institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+goodwin procter NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google earth engine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google images NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google mail NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google news lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gordon life science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+government revitalization unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gpmb NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+graduate institute of international and development studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+graduate research fellowship program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+graduate school of science and technology policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grain for green program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gran sasso science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+granite capital international group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grantham foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grantham institute for climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gravitational-wave observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+great lakes bioenergy research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+great lakes fishery commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+great ormond street hospital institute of child health at university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greater atlantic regional fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greek foundation for research and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+green algal tree of life NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+green bank hydrogen telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+green ecologist party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greenhouse gas management institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greenpeace china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greens party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grfp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+griffiths university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grinnell resurvey project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gritstone oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grl board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+group sunspot number NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gruber foundation cosmology prize NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gryphon investors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gryphon scientific NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gsa today NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guam department of public health and social services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangdong academy of medical sciences and guangdong general hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangdong institute of applied biological resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guanghua school of management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangzhou general pharmaceutical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangzhou institute of geochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guilin pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulbenkian science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf coast research lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf coast research laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf cooperation countries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf ecology division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf of lions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf of mexico studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf's flower garden banks national marine sanctuary NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gundersen medical foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guttmacher institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gw pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gwg energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hadassah-hebrew university medical center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hadley centre for climate prediction and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hadley centre for climate science and services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+haereticus environmental laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+haitian mines and energy bureau NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hambantota port to china merchants port holdings NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hamburg university of applied sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harrogate autumn flower show NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harte institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hartebeeshoek radio astronomy observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard injury control research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard medical school's infectious disease institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard medical school's joslin diabetes center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard pilgrim NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard pilgrim health care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard stem cell institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard stem cell institute for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university center for the environment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university herbaria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university on cambridge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university's wyss institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard's edmond j. safra center for ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard's office for scholarly communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harwell science and innovation campus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+has alfred renyi institute for mathematics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+has biological research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+has institute for literary studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+has institute of experimental medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hawaiʻi institute of marine biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hawaii institute of marine biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hawaii unity and liberation institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hawaiian supreme court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hbcu excellence in research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hbp board of directors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hdp assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health and environment alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health and human services alex azar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health and human services tom price NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health effects institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health protection agency of pavia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health research council of new zealand NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+healthpartners institute for education and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+healthtell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+healthy lifespan institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hebei association of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hefei national laboratory for physical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heffter research institute in santa fe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heinrich heine university of d NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heinrich pette institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+helicos biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heliophysics division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heliospheric observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hellenic foundation for research and innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz association of german research centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz association of german research centres NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hematology research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hennepin healthcare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+henrietta lacks foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hepap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+herald shoal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hercules chemical company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heritage action for america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heritage innovation preservation institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hertie institute for clinical brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+herzberg astronomy and astrophysics research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hess deep NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hfri NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hfsp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hhs office for human research protections NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+higgs hunting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+high court of eastern denmark NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+high energy physics advisory panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+high-altitude water cherenkov observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+high-consequence pathogens and pathology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education and science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher institute of industrial physics and chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+highwire press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hinxton group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hitachi advanced research laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hiv vaccine trials network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hmgc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hodge jones & allen solicitors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+holtzbrinck group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+honeywell quantum solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hong kong university's school of chinese medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hongmao liquor NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hongmao pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+honolulu civil beat newspaper NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+horia hulubei national institute for physics and nuclear engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+horizon quantum computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+host genetics initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house appropriations subcommittee on energy and water development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house armed services committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on energy and commerce NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house energy and commerce committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of commons inquiry committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of commons science and technology select committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of representatives newt gingrich NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of representatives' energy & commerce committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of representatives' judiciary committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house science and technology committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"house science, space and technology committee" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+howard florey institute for brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+howard hughes medical institute's janelia farm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hubble space telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hubert curien multidisciplinary institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hubrecht organoid technology of utrecht NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hudson institute for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hudsonalpha institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hudsonalpha institute for biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human betterment foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human cell atlas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human connectome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human embryology and fertilisation authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human frontier science program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genetic diversity project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genetics advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genetics commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genome diversity project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genomics program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human intestinal tract NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"human longevity, inc." NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human microbiome jumpstart reference strains consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human microbiome program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human mortality database NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human proteome organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human rights campaign foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human rights foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human subject research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human wildlife solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+humanitas research hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hungarian academy of science's institute of materials and environmental chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hungarian academy of sciences's institute for nuclear research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hungarian brain research programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hunter college of the city university of new york NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+huntsman cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hust-suzhou institute for brainsmatics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hvri NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hyasynth bio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hyung chun of yale university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iaea research reactor section NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iaph NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iatap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iau general assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibcm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iberoamerican network of science and technology indicators NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibm watson health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibs center for quantum nanoscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibs center for rna research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icahn institute for genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icar central potato research station NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icelandic meteorological office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icemag NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ices journal of marine science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iceye NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iclr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icrp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ifo center for the economics of education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+igm biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ihu institute of image-guided surgery of strasbourg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iltoo pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imaging platform NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imazon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imbb NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"immunochemistry, pharmacology and emergency response institute" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+immunotherapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imperial college covid-19 response team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imperial college london's grantham institute for climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+impossible foods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imr international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+independent advisory committee on applied climate assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian central civil services rules NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institute for science education and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institute of horticultural research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institute of rice research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institutes of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian network for climate change assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian science congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian science congress association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian society for clinical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian space research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indiana university lilly school of philanthropy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indiana university school of informatics and computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indiana university-purdue university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indiebio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesia endowment fund for education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian democratic party of struggle NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian institute of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian research institute for biotechnology and bioindustry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian science fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian young academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious disease genomics and global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious disease society of america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious disease surveillance center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious diseases data observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious diseases' vaccine research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+influenza virus research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infn frascati national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+informetrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inge lehmann medal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iniciativa amotocodie NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+initiative for science and technology in parliament NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inivata NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+innocentive NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+innovation and industry fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+innovative genomics institute at berkeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+innsbruck medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inra's scientific advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+insect research and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+instex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institut polytechnique de paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for applied ethology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for bioengineering of catalonia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for catastrophic loss reduction NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for cetacean research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for climate and global change research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for computational health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for critical infrastructure technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for defence studies and analyses NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for digital archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for economics and peace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for environmental protection and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for evidence-based healthcare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for global health & infectious diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for health and unification studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for health technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for higher education law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for human evolution NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for innovation law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for integrated cell-material sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for marine-earth exploration and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for microelectronics and microsystems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for molecular biology and biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for new economic thinking NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for nuclear physics in milan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for nuclear research of the russian academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for oneworld health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for quantum computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for quantum optics and quantum information NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for safe medication practices in horsham NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for science policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"institute for science, innovation and society" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for sea fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for space astrophysics and planetology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for space sciences-csic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for statistics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for sustainable energy policies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for the research and history of texts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for translational medicine and therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for war documentation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute laue-langevin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of aboriginal peoples' health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of american prehistory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of archaeology and ethnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of artificial intelligence and robotics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of biology paris-seine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of catalysis and petroleochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of earth physics of paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of emerging infections NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of endemic diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of functional genomics of lyon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of genetics and molecular and cellular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of genomics & integrative biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of geological and nuclear science in lower hutt NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of health carlos iii NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of history of the academy of sciences of moldova NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of infection and immunity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of infectious disease and molecular medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of materials science of madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of medical research and studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of microelectronics and microsystems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of molecular and cellular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of molecular and clinical ophthalmology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of molecular biology & biophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of neuroinformatics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of nuclear and energy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of occupational and environmental medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of primate translational medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of psychiatry at king's college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of public and environmental affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of quantum computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of science technology and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of sustainability and technology policy at murdoch university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of technology bandung NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of water resources and hydropower research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute pierre-simon laplace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institutional animal care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institutional review board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institutional revolutionary party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+instrument context camera NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+insulin mitigation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integral molecular NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated carbon observation system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated disease surveillance programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated ocean drilling program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated quantum science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated vessel tracking decision support tool NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrating data for analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrative and comparative biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrative biodiversity research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intellectual property scholars conference in stanford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intellia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intelligence advanced research projects agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inter-academy panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inter-american development bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inter-university center for terrorism studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interacademy panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interacademy partnership NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interagency alternative technology assessment program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interagency coordinating committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interagency working group on harmful algal blooms NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interamerican network of academies of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intercultural center for the study of deserts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interferometry centre of excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intergovernmental group on earth observations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intergovernmental oceanographic commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intermediate palomar transient factory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international alliance for cancer early detection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international arctic research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association for chronic fatigue syndrome/myalgic encephalomyelitis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association for cryptologic research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"international association for scientific, technical and medical publishers" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of animal behavior consultants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of egyptologists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"international association of scientific, technical and medical" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of volcanology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of wood anatomists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international behavioral neuroscience society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international brain observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cancer gene consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international center for agricultural research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international center for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international center for technology assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for primate brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for trade and sustainable development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission for the certification of dracunculiasis eradication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on missing persons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on non-ionizing radiation protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on radiological protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on zoological nomenclature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international conference on quantum communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international congress for conservation biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international congress of mathematics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international congress on drug therapy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international congress on peer review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international consortium of investigative journalists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cotton advisory council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international council for harmonisation of technical requirements for pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international crime science conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international crisis group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international dark-sky association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international data rescue NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international development cooperation agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international federation of pharmaceutical manufacturers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international federation of pharmaceutical manufacturers and associations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international fertilizer development centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international finance facility for immunisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international gamma-ray astrophysics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international geological congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international gerontology research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international health management associates NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international human epigenome consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international initiative for impact evaluation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international institute of molecular and cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of cancer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of epidemiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of surgery NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international lter network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international lunar network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international maize and wheat improvement centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international meeting for autism research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international meteor organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international mouse phenotyping consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international network for government science advice NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international ocean discovery program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international oceanographic commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international plant molecular biology congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international primate research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international research institute for climate and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international research on permanent authentic records in electronic systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international scientific committee for tuna NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for biological and environmental repositories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for cellular therapy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for scientometrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for the psychology of science & technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for transgenic technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international soil moisture network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international solar alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international space exploration coordination group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international standard archival description NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international stem cell corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international student and scholar services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international sunspot number NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international symposium on biomolecular archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international system of units NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international trade in endangered species NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union for conservation of nature red list NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union for conservation of nature water programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union for conservation of nature's species survival commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union for conservation of nature's world conservation congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union of geodesy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union of geological sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international wheat genome sequencing consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interplanetary observation network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+investigation panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+invizyne technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ioffe physico-technical institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ion pgm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ionis pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iop publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iop publishing of bristol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ipcc working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ireg observatory on academic rankings and excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+irena's innovation and technology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+irish centre for vascular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+isi foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+islam for dummies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+island conservation in santa cruz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+island digital ecosystem avatars NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+islas marías federal penal colony NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+israel defence forces NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+israel innovation authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+israel science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iss) research & development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+istanbul seismic risk mitigation and emergency preparedness project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+isterre institute of earth sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian association for huntington NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian association of cancer research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian association of scientific societies in agriculture NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian data protection authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian health authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian research council cnr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iter council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iter council working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iter organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+itmat NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+itzhak fried of the university of california NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iucn shark specialist group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iucn species survival commission cetacean specialist group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ivy kupec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+izmir biomedicine & genome center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+izmir biomedicine and genome center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+j. craig venter institute's global ocean sampling expedition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jackson laboratory for genomic medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jaids NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jama network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+james madison program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+james martin 21st century school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jamestown rediscovery foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+janssen pharmaceutical companies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+janssen vaccines & prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+janssen vaccines and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan aerospace exploration agency institute of space NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan aerospace exploration agency's institute for space and aeronautical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan aerospace exploration agency's institute of space and astronautical science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan association of high energy physicists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan geosciences union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan international research center for agricultural sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan renewable energy foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japanese cancer association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japanese high energy accelerator research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japanese national institute of infectious diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japanese nuclear safety commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jaxa) institute of space NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jcap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jcbfm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jcvi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jean frézal centre of medical genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jefferson national laboratory in newport news NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jeffries international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jetzon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jezero crater NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jiangnan graphene research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jiangsu provincial center for disease control and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jilin agricultural university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jinggangshan university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jinggangshang university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jinko solar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johann wolfgang goethe university hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johannes gutenberg university of mainz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+john muir institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+john wesley powell center for analysis and synthesis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins berman institute of bioethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins center for health security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins lyme disease clinical research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins university kimmel cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johnson & johnson pharmaceutical research & development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint bioenergy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint center for artificial photosynthesis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint center for research and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint institute for laboratory astrophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint institute for very long baseline interferometry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint institute for very long baseline interferometry european research infrastructure consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint investigation group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint medical command NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint prevention and control mechanism NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint research centres NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint space operations center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jonsson comprehensive cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jordan water project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jordanian scientific research fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal citation reports NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal impact factor NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of agricultural and food chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of agriculture and food chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of archaeological science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of genetics and genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of informetrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of medicinal chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of modern physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of morphology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of neurochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of ovarian research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of psychopharmacology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of urban ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of urology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of vertebrate palaeontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of zhejiang university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal publishing practices NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jrc's institute for health and consumer protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+julius kühn institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+junjiu huang at sun yat-sen university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jx nippon oil NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaelin groom NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaiser wilhelm institute for physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaist graduate school of science and technology policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kalahari minerals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kandilli observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+karisma foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+karlsruhe tritium neutrino NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+karolinska staff disciplinary board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+katrina brandon of conservation international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"katz, marshall & banks" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli foundation of los angeles NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli institute for particle astrophysics and cosmology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kbrwyle NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+keck school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+keeling center for comparative medicine and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kemri-wellcome trust research programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kentucky geological survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kenya medical research institute–wellcome trust research programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kepler cheuvreux NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ketamine treatment centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+keygene NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kichwa community of doce de octubre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kids research institute of the children's hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kimmel center for archaeological science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kinetx aerospace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kingston general health research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kintama research corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kite pharma of santa monica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+klemens störtkuhl of ruhr university in bochum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+knome NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+knowledge ecology international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+koala ai technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kolka glacier NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kommersant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea centers for disease control and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea environment corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea food and drug administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea ocean research & development institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korean advanced institute of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korean baduk association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korean federation for environmental movements NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korean institute of ocean science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kosciuszko science accord NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kosovo education center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kreitchman center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kreitchman pet center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kristianstad university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ksar akil NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kuban state medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kuiper airborne observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kulakov national medical research center for obstetrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kumamoto sanctuary NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kumasi centre for collaborative research in tropical medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kunming institute of botany NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kunming institute of botany of the chinese academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kurdistan workers' party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kustom group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kwazulu-natal research institute for tuberculosis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kwr water research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kyoto university's primate research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kyung-sik choi of seoul national university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+l'oréal's research & innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+la molina national agrarian university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratorio elea phoenix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory for climate sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory for dynamic meteorology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory for molecular medicine at partners healthcare personalized medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory of cellular and molecular neurobiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+labour and conservative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lakeview campus medical facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laser interferometer gravitational wave observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laser interferometer gravitational-wave observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laser interferometer gravitational-wave observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laser interferometer space antenna NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+latin american and caribbean society of medical oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+latin american collaborative study of congenital malformations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+latin american council of social sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+latin american school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lawrence berkeley national laboratory's joint bioenergy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lawrence livermore national laboratory's forensic science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lawson & weitzen NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lcross NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ldeo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+league of conservation voters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leatherback trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lebedev physical institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leerink partners NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leerink swann & company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+left party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+legacy heritage fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lehman brothers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute for neuro-biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute for primate research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute for solid state NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute for the social sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute of agricultural development in transition economies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute of freshwater ecology and inland fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute of marine science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute on ageing-fritz lipmann institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz-institute of freshwater ecology and inland fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leiden ranking NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leigh marine laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leloir institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leloir institute foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leonids NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leuphana university of lüneburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leverhulme centre for the future of intelligence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+levin institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lgbq NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lhaaso NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+libel reform campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+liberal democrat party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+libertarian party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+liberty korea party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+libgen NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lieber institute for brain development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+life science steering group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+life sciences of branford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lifecare innovations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lilly asia ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lilly asian ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+linear collider board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+linear collider collaboration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lineberger comprehensive cancer center of the university of north carolina NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lingacom NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lion biotechnologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lisbon treaty NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+livingston ripley waterfowl conservancy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lockheed martin's space systems advanced technology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london institute of space policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london mathematical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london school of economics' grantham research institute on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london universities purchasing consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london's royal society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+long range research aircraft NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+long term ecological research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+long term educational reform and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+long-baseline neutrino facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+louis malardé institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+louisiana sea grant college program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+louisiana state university museum of natural science in baton rouge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+louisiana state university school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+low carbon economy trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+low carbon fuel standard NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lowy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+loxo oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ltern NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lucella biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ludwig maximilians university of munich NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ludwig maximillian university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ludwig-maximilians university of munich NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lulucf NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+luminosity lhc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+luna incognita NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunar exploration analysis group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunar flashlight NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunar palace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunar science forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunenfeld–tanenbaum research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lurie children's hospital and northwestern university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lusara foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+luxembourg agency for research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lyncean technologies of fremont NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lynkeos technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ma'arra mosaic museum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+macrauchenia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+macrolide pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+madmax NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+magellan telescopes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+magenta therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+magiq technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maharashtra hybrid seed company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maharashtra hybrid seeds NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mahyco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mail & guardian NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maine medical center research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mainland affairs council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+major research instrumentation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+major risks committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+malaysian society of parasitology and tropical medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+manchester institute of innovation research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+manila trench NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mapk NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marcell experimental forest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+march for science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+march of dimes foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+margaret torn of california's lawrence berkeley national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marie curie university - paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marina cavazzana-calvo of university paris-descartes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine environmental research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine fisheries review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine mammal commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine mammal institute of oregon state university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine sciences institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maritime studies program of williams college NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marjan centre for the study of conflict & conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mars exploration program assessment group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mars society australia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marseille observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+martian surface NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maryland psychiatric research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maryland trump NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts biotechnology council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institute of technology and boston university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institute of technology's haystack observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institute of technology's plasma science and fusion center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institute of technology's sloan school of management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institution of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachussetts institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+matrix chambers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max born institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck digital library NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for cell biology and genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for evolutionary biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for experimental medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for marine microbiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for neurobiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for radioastronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for social anthropology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for solid state research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for the science of light NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of animal behaviour NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of experimental medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of molecular plant physiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institutes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck society's fritz haber institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max plank institute for infection biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max telford of university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maxar technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maxwell biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mayo clinic college of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"mayo collaborative services v. prometheus laboratories, inc." NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcdermott international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcgill centre of genomics and policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mclaughlin-rotman center for global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+md anderson's keeling center for comparative medicine and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mdi biological laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mds nordion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mectizan donation program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+med biotech laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medan institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical academic staff committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical products agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical publishers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council biostatistics unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council centre for regenerative medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council laboratory for molecular cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council of zimbabwe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research future fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical technology & practice patterns institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical university of lublin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medicines control council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medrec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mega rice project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meiji institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mekentosj NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+melbourne energy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mellon foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+memphis meats NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+menafrivac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mendeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meningitis vaccine project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mental health center of west china hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+menzies school of health research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+merck institute for therapeutic research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mersana therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mesoamerican society for biology and conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+met office hadley centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+met office hadley centre for climate science and services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+met office's facility for airborne atmospheric measurements NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+met office's london volcanic ash advisory centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meta-research innovation center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+metabolic syndrome and related disorders NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meteor network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meteorological applications for development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+metrics of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mexican national academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mexican society for stem cell research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+michael diamond at washington university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+michalski hüttermann & partner NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+michigan memorial phoenix energy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+michoacan university of san nicolás de hidalgo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+micius foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+microbiological diagnostic unit public health laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+microscale NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+middle east studies association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+migration advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+milbank quarterly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+milken institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+millennium institute of oceanography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+million veteran program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mimar sinan university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mimetas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mind research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+minecraft NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry for innovation and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of civil affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of environment and forestry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of health of the russian federation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of higher education, research and innovation" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of human resource development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of industry and information technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of land and resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of marine affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of new and renewable energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of research, technology and higher education" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of science,technology" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of trade, industry and energy" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+minor planet center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+missouri breaks industries research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mit alliance for research and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mit energy conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mithril capital management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mitogenome therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mitsubishi h-iia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mitsubishi tanabe pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mixed research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mizuho securities usa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mmwr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moderna therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+molecular genetics and cardiac regeneration laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+molecular libraries program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+molr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+momenta pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monash energy materials and systems institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monash institute of medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monash obesity and diabetes institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monash university's biomedicine discovery institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monrepos archaeological research centre and museum for human behavioural evolution NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monterrey institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monterrey institute of technology and higher education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+montreal neurological institute and hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+montreal protocol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+montreal protocol's technical and economic assessment panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moon express of cape canaveral NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moonshot task force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moorea biocode project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moral machine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+morningside group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+morphotrak NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+morris kahn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mosa meat NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+motojima NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+motu economic and public policy research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+movement for the university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mozilla corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mozilla online NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mozilla science lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mpi-biocyb NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc centre for inflammation research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc functional genomics unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc harwell institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc harwell institute's mammalian genetics unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc national institute for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc national institute of medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mstn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mtb/rif NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mtc forensics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+multiscale biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+murchison radio-astronomy observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+musashi-murayama NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+museum for natural history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+museum of eastern carpathians NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+museum of natural history victor-brun NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+museum of paleontology egidio feruglio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mycetoma research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mygn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nalco energy services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanjing institute of geology and paleontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanjing medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nankai trough NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanometrics inc. NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanosolar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nansen initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa advisory council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa astrobiology research fellow NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa deep space network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa global hawk NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa goddard space center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa marshall space flight center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa solar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa swift NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa-operated fermi gamma-ray space telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasawatch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasonia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasonia genome working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasu institute of molecular biology and genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasu's institute of mathematics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academies of science usa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academies press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academies' human embryonic stem cell research advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national advisory council on innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agency for new technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agricultural imagery program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agricultural research laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agriculture and food research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national aids research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national alliance for life and health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national amazonian university of madre de dios NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national archaeological museum in cagliari NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of ebola survivors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of people NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of ramón y cajal researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of student financial aid administrators NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of student personnel administrators NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national autonomous university of nicaragua NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national banana research programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national bio-safety laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national bioethics advisory commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national biotechnology development strategy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national board of wildlife NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national cancer institute of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national cancer institute's neuro oncology branch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national cancer moonshot NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national carp control plan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for injury prevention and control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for lesbian rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for monitoring NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for professional and research ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for research resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center of scientific research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for atmospheric sciences in reading NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for biotechnology in madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for cell science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for diabetes research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for monitoring NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national climate assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national climatological databank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national coalition against censorship NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national collaborative on gun violence research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national commission for aerospace research and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national coral reef institute at nova southeastern university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"national council for science, technology and technological innovation" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council of foundations supporting institutions of higher education and scientific and technological research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council of universities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national deep submergence facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national department of mineral production NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national earthquake information center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national electronic injury surveillance system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national energy guarantee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national engineering research center for the emergence drugs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national geographic channel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national geoheritage authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national graduate research institute for policy studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national health and family planning commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national health and nutrition examination survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national high magnetic field laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national highway traffic safety administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national human rights commission of korea NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national incident command NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national independent scientific research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for agricultural research in jouy en josas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for agricultural research in nancy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for agricultural research in rennes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for allergy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for basic biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for biomedical research in kinshasa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for communicable diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for environmental health sciences in research triangle park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for geophysics and volcanology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for geophysics and vulcanology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for health and clinical excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for laser NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for nuclear NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for physics and nuclear engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for research on glaciers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for respiratory diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for undersea science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of anthropology and history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of astrophysics in bologna NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of bioethanol science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of child health and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of child health and human development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of disability NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of ecology and climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of environmental research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of human rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of metrological research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of metrology research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of optics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of perinatology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of plant genome research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of science and technology policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of statistical sciences in research triangle park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of statistics and information NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of traumatology and orthopedics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on aging NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on aging's laboratory of neurosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institutes of health guidelines for human stem cell research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institution for transforming india NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national key laboratory of medical immunology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national knowledge network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national laboratory of genomics for biodiversity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national malaria control programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national marine mammal foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national marine mammal laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national medical products administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national microbiome initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national mission for clean ganga NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national mission on interdisciplinary cyber-physical systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national nagpra NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national nanotechnology initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national natural science foundation and china geological survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national new generation of artificial intelligence governance committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national non-human primate breeding and research facility board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national nurses united NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national observatory on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national oceanic and atmospheric administration's national marine fisheries service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national oceanic and atmospheric administration's space environment center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national oceanographic and atmospheric administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national oceanographic and atmospheric agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national organization of gay and lesbian scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national organization on fetal alcohol syndrome NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national parks agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national primate research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national public health institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national quantum technologies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national radio astronomy observatory green bank telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national renewable energy action plan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research and development institute in forestry marin dracea NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research center for human evolution NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research centre for plant biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research council of the swiss national science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research council's institute of cognitive sciences and technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research council's institute of molecular genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research ethics service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research funds NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research institute for science policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research institute of far seas fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research mentoring network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science and technology council committee on science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science and technology foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science foundation of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science foundation rapid response research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science technology and innovation policy office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national seismological service of mexico NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national snow and ice data center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national society of black physicists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national space development program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national stem cell bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national toxicology program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national trade union of scientific researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national treasury employees union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of cuyo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of distance learning NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of quilmes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national veterinary school of alfort NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural history museum schloss bertholdsburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural history museum's department of palaeontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural machines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural resource analysis center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural resources institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural science foundation of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural sciences and engineering research council of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature and science translational medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature and scientific american NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature biomedical engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature commun NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature geosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature immunology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature mater NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature structural & molecular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature's scientific reports NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+naurex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nautilus minerals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nautilus minerals of toronto NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+navajo nation council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+navdeep bains NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+navigation technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncats NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncipc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncle NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncrr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncvc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+near space corporation of tillamook NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+near-earth object camera NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nebular gas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neil gehrels swift observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nejm group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nektar therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nelson mandela african institute for science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nemours/alfred i. dupont hospital for children NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neo sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neowise NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nepal climate observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nepal climate observatory at pyramid station NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nepal climate observatory-pyramid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands institute for radio astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands institute for space research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands interdisciplinary demographic institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands national institute for public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands organization of scientific research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+network of spanish researchers abroad NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+network-forum for biodiversity research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neural correlate society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neural enhancement laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neural-processing research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neurodegenerative diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neurologix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neuronano research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neurotech network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neurotechnology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new dynamics of ageing programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new energy and industrial technology development organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new england anti-vivisection society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new enterprise associates NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new frontiers program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new haven as mirror worlds technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new iberia research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new jersey legislature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new phytologist NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new south wales department of primary industries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new south wales land and environment court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york city department of health and mental hygiene NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york medical college NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university institute for the study of the ancient world NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university stern school of business NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university's courant institute of mathematical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university's winthrop hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new zealand institute for plant & food research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+newcastle fertility centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+newlink genetics of ames NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+news feature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+news of philae NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ngee tropics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ngo iran human rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nhlbi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nhmrc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nia-sponsored interventions testing program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+niaid-supported nicaraguan pediatric influenza cohort study NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nicaraguan academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nichd NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nicholas institute for environmental policy solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nicolaus copernicus astronomical center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nigeria cdc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nigerian academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nigms NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih fogarty international center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih human embryo research panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih human microbiome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih national institute of general medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih office of portfolio analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih office of strategic coordination NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's office for portfolio analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's office of management assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's office of science policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's office of strategic coordination NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's scientific management review board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's tribal health research office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nik-zainal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+niprd NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nips twitter NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nitinol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+niust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nixon peabody NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nmnh NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+noaa arctic research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel commitee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel committee for chemistry 2018 NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel committee for physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nordic institute for theoretical physics in stockholm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norris comprehensive cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+north atlantic treaty organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+north hessian society of prehistory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+north-east pacific time-series NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+northeast structural genomics consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+northern and southern hemisphere NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+northern hemisphere NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+northshore research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian institute for nature research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian institute for water research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian veterinary institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novartis institutes for developing world medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novartis's institutes for biomedical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novavax NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novo nordisk foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novocell of san diego NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+noxxon pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nrda NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsduh NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsf budget division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsf division of biological infrastructure NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsf office of diversity and inclusion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsf's office of inspector general NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsidc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear energy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear energy steering committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear posture review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear regulatory commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear research and consultancy group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear science and technology organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear sciences institute of the national autonomous university of mexico NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+numonyx of rolle NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nustart energy development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuziveedu seeds NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nyu) cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obama executive order NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obi pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obokata NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+observer research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obstetrics and gynecology hospital of fudan university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obvious ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocata therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean biogeographic information system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean conservancy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean exploration trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean giants program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean observing and modeling group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean preservation society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean research & conservation association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean salinity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean salinity mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean therapy solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos environ-mental solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos environmental solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos environmental solutions of vancouver NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos marine research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceanic preservation society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceanographic institute of the university of são paulo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oecd science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office for cancer genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office for human research protections NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office for research integrity at northwestern university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of children's health protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of energy efficiency and renewable energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of extramural research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of foreign assets control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of hawaiian affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of health economics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of human research protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of inspector general for the department of health and human services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of international science and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of laboratory animal welfare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of mauna kea management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of national marine sanctuaries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of ocean exploration and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of population genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of research integrity at the national institutes of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of science for orela NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of science policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of the gene technology regulator NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of the legislative auditor NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of the principal scientific adviser NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ogtr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ohio sleep medicine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ohsu knight cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oie reference laboratory for rabies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oil change international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oil spill recovery institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+okazaki institute for integrative biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+okeanos explorer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+okinawa institute for science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+okjökull NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oklahoma geological survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+olympic winter games bid committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+omega supplies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+omics group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+omics international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+omrf NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oncolytics biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ondřejov observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+onex corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ontario cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+open access scholarly publishers association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+open-access publishing equity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+operation warp speed NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+operational environmental satellites NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ophirex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+optical infrared coordination network for astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+optical institute graduate school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+optical society of america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orangutan foundation international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orangutan tropical peatland project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oraquick NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orbit beyond of edison NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orbital sciences atk NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oregon health & science university knight cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oregon health and sciences university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orexigen therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organ preservation alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organ solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organ-on-a-chip world congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organigram NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organisation of islamic cooperation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organization for economic co-operation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organization for economic cooperation and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organovo of san diego NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+origen power NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osaka university graduate school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oscillation project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osdd NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osf preprints NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osi pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oskar klein centre for cosmoparticle physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oslo university hospital institute for cancer research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osnap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+otago palaeogenetics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+our children's trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+outbreak science rapid prereview NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+outer planets assessment group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+outsell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford institute of population ageing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford nanopore of oxford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford uehiro centre for practical ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford university herbaria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford university press and nature publishing group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford vaccine group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford's mathematical institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific bluefin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific centre for environmental law and litigation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific fishery management council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific institute for climate solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific salmon commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+padua astronomical observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pak-austria institute of applied sciences and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palaeoanthropologist bernard wood of george washington university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palaeobiologist simon conway morris of cambridge university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palaeogeography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palaeontological association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palatino linotype NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paleoresearch institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palomar transient factory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pamphilos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pan american games NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+panchromatic hubble andromeda treasury NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paracelsus medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paradoxopoda NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parco genos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paris institute of geophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paris-saclay institute of neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliament for oxford west NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliament's committee on science and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliament's house of commons science and technology select committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliamentary and scientific committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliamentary assembly of the council of europe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+particles for justice NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+partners healthcare personalized medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+partnership for biomedical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+partnership group for science and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pasteur institute of iran NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+patagonian institute of social sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+patent public advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pathmark genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pathway genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pathway genomics of san diego NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+patient-centered outcomes research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+patricia gruber foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paul drude institute for solid state electronics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paulson institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pavement coatings technology council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pawsey supercomputing centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pbmr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pebble bed modular reactor NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pedro kourí tropical medicine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peerj NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peking university health science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peking university health science center school of basic medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peking university institute of mental health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peking university's school of life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+penn vet working dog centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pennington biomedical research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pennsylvania NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+people yale NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+people's court of nanshan district of shenzhen NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+people's solidarity for participatory democracy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+percy fitzpatrick institute of african ornithology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+perlan project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+permanent court of arbitration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+perseverance airlines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+persian wildlife heritage foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peruvian academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peruvian amazon research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peruvian ministry of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+petrie-flom center for health law policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew center for global climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew charitable trusts' global penguin conservation campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew environment group's arctic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew environment group's international boreal conservation campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pfizer/biontech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pharmaceutical association committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pharmaventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pharming nv NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+phd doctors' association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+phg foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philippine negritos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philippine space agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philipps university of marburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philosophical magazine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philosophical transactions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philosophical transactions of the royal society b NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+phoenix cardinals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+physical review physics education research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+phytoceutica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pierre simon laplace institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pink bollworm rearing facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+piramal healthcare solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pirogov russian national research medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pla air force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plague of justinian NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plan s. cell press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary defense coordination office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary protection coordination office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary response network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary science decadal survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary sciences division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planktos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planning and strategic initiatives NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plant & animal genome NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plant genome research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plate boundary observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plga NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plymouth university peninsula schools of medicine and dentistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pohang accelerator laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pohang egs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polar continental shelf program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polaris partners NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy bandwidth NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy nuclear NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy sciences center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polish academy of sciences institute of geophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polish academy of sciences' institute of physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polytechnic university of catalonia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polytechnic university of marche NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polytechnic university of turin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polytechnic university of valencia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pontifical academy for life NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pontifical catholic university of paraná NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pontifical xavierian university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+potsdam institute for climate impact NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+power development authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ppco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pprv NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+predpol of santa cruz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+preventive medicine & diagnosis innovation program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+preventive medicine and public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+primate research ( kyoto university primate research institute disease control committee primate res NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+primatological society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+princess sumaya university for technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+princeton policy school demands NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+princeton university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+principal investigators association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+prodigy biosystems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+program for promotion of research integrity at academia sinica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+program on energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+prometheus laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+prometheus labs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+promotion of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+proskauer rose NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+prostate cancer foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+protein data bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+protein sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+psl research university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+psychencode consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+psychiatric genomics consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+psychological science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ptwc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public health and prevention fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public health foundation of india NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public health preparedness and response program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public knowledge project's preservation network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public's health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+publons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pubmed central and google NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pubmed commons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pubmed health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+puerto rican electric power authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+puerto rico institute of statistics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pujol university hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+purna sulastya putra NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+qikiqtani inuit association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+qs world university rankings NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum circuits NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum encryption and science satellite NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum europe conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum internet alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum moves NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum photovoltaics group at imperial college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum technologies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum technology flagship NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quark pharmaceuticals of fremont NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quaternary international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quaternary science reviews NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quebec research fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+queen mary university london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+queensland alliance for environmental health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+queensland health forensic and scientific services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+questrom school of business at boston university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quirin schiermeier trying NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+r. c. patel institute of pharmaceutical education and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+r. poplin preprint NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radarsat constellation mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radiation budget instrument NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radiation studies board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radioactive drug research committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radiowave transmission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ragon institute for hiv NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ragon institute of massachusetts general hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rand corporation for the wellcome trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rapid assistance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rapid climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rapid response research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rapid support forces NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+raptorex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute for information transmission problems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute for nuclear research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute of cytology and genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute of molecular genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute of world history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+raven aerostar of sioux falls NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+razavi neuroscience research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rbc capital markets NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+real time system for detection of deforestation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+recolzika NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+recombinant dna research advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reddie & grose NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+redfield consulting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reducing intake of energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reduction of animals in research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+redwood coast watersheds alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+regenerative sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+regional development agencies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+regional research center for scientific investigation and technology transfer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+regulatory authority for tissue and embryos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rencontres de moriond NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+renewable fuels association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+renmin ribao NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reproducibility project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reprogenetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+republican national convention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rescue global NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rescuing biomedical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research center borstel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research center for molecular medicine of the austrian academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research center for quantum information of the slovak academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research centre for natural sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research centre on animal cognition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research ethics and integrity program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research fortnight NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research frontiers programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research infrastructures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research institute and natural history museum of senckenberg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research institute for development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research integrity committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research libraries uk NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research misconduct board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research policy institute at lund university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research roaming gm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research support program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research tax credit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research-doctorate programs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research!america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+researchkit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+respondent NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+retina society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+retrosense therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+retrovirology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rfbr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rigel pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken centre for developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken interdisciplinary theoretical and mathematical sciences program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ringling brothers and barnum & bailey circus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rna biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rnl bio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rnl life science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rnl sunrise regenerative medical center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+roadmap epigenomics program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+roadmap epigenomics project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rock art institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rockefeller university press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rockland immunochemicals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rocky mountain tree-ring research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rollins school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rome international center for materials science superstripes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rooibos council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+roque de los muchachos observatory on la palma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rosetta orbiter spectrometer for ion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rosetta orbiter spectrometer for ion and neutral analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ross island wind farm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ross mpa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ross sea mpa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rotem sorek NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rowland kao NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal astronomical society letters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal astronomical society of canada edmonton centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal college of obstetricians NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal commission on environmental pollution NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal danish academy of fine arts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal danish academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal free london nhs foundation trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal new zealand air force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal observatory of belgium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal photographic society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society journals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society of south africa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society open science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society's biological science awards committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society's rapid assistance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rubin observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russia direct investment fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian academy of science's institute of bioorganic chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian academy of science's institutes of molecular genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian academy of sciences institute of archeology and ethnography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian academy of sciences space research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian foundation for basic research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian space agency roscosmos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian venture company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rutgers aaup-american federation of teachers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rutgers cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rutgers cancer institute of new jersey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rxi pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sabin vaccine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+saclay research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sae consulting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"safer chemicals, healthy families" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+safety of medicines and health products NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+saga investments NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salk board of trustees NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salk institute for biological sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salmonella paratyphi c NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salton sea authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salvador zubirán national institute of medical sciences and nutrition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+samsung advanced institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san council of south africa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san diego school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san diego zoo global NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san diego zoo institute for conservation research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san ignacio de loyola university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san raffaele telethon institute for gene therapy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sanford c. bernstein & co. NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sanford-burnham medical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+são paulo state university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sarang jeil church NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sars international centre for marine molecular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sassan saatchi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sativex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+save the elephants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+schistosomiasis control initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scholar rescue fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scholarly publishing roundtable NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school for advanced studies in social sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of civil and construction engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of earth and atmospheric sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of history and sociology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of informatics and computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of medicine at washington university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science & policy exchange NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science advances NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and environmental health network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and public policy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and technology argentina NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and technology commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and technology innovation program at the woodrow wilson international center for scholars NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and technology policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science bulletin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science china press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science for technological innovation national science challenge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science in australia gender equity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science-metrix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sciencedebate.org NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific advisory council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific centre of monaco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific method (cambridge univ NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific publication information retrieval and evaluation system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific research journal psychology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific research publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific research's journal of biophysical chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientists for global responsibility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientists for labour NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientists for palestine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scripps glaciology group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scripps institute of oceanography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sea mammal research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sea shepherd conservation society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sea turtle restoration project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sean n. parker centre for allergy & asthma research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seattle biomedical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seattle coronavirus assessment network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seattle flu study NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+second institute of oceanography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"secretary's advisory committee on genetics, health" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seismological research letters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seita emori NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate appropriations committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate environment and public works committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate judiciary committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senckenberg biodiversity and climate research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senckenberg research station of quaternary palaeontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senckenberg world of biodiversity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sens research foundation mountain view NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senseable city lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+serbian progressive party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+serrapilheira institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sesame scientific advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seven sons university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seventh framework programme for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+severo ochoa centre for molecular biology in madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sex differences and implications for translational neuroscience research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sg biofuels of encinitas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shaanxi provincial engineering and technology research center for shaanbei cashmere goats NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shahid beheshti university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai institute of applied physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai institute of materia medica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai mental health center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanshui conservation center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shardna life science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shark specialist group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shark spotters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sharonann lynch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shaw prize foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shaw prize in astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shefa neuroscience research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shenzhen hepalink pharmaceutical company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shenzhen international biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shenzhen international biotech leaders summit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sheppard mullin richter & hampton NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sherlock bioscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sherlock biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sherry marts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shinji toda of tohoku university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shiraz university of medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shonan maru NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sibley heart center cardiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sidley austin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sidney centre for plant health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+siem offshore NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sigma pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+similarity check NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+simons center for geometry and physics at stony brook university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sinergium biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+singapore' national research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sinovac biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sirna therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sisters of immaculate health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skagit county public health in mount vernon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skeenawild conservation trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skin sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skolkovo institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skoltech center for translational biomedicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sloan digital sky survey at apache point observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sloan school of management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+slow food international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+small research grant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smithsonian institute's national museum of natural history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smithsonian institution's museum conservation institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smithsonian institution's sackler gallery NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smoke model evaluation experiment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smoke-free alternatives trade association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+snakebite healing and education society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+soas china institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social media and democracy research grants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social psychological and personality science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social science citation index NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social science electronic publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social science research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social sciences and humanities research council of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for arab neuroscientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for immunotherapy of cancer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for research in child development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for scholarly publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for scholarly publishing in wheat ridge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for the history of astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for the study of inborn errors of metabolism NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for the study of reproduction NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of biological psychiatry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of chinese bioscientists in america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of earth scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of entrepreneurs and ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of primatology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of spanish researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+socio-environmental institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+software carpentry foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+software sustainability institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+soko tierschutz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solar orbiter NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solar system exploration research virtual institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solazyme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+soleil securities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solenopsis invicta NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solidarity vaccine trial NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solstice mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solyndra NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sony pictures entertainment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sooam biotech research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south africa radio astronomy observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south africa's kwazulu-natal research institute for tuberculosis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south african department of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south china sea institute of oceanology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south korean navy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern african human genome programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern african science service centre for climate and land management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern astrophysical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern california seismic network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern ocean carbon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern ocean carbon and climate observations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern owl nebula NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space application services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space carbon observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space development fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space interferometry mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space radiation health project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space studies board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spanish royal academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spark therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spero therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spherical tokamak for energy production NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spirit cave mummy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sprenke NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+springer india NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+springer nature and taylor & francis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+springer science+business media NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+springernature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sputnik planitia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+square kilometre array organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+st lawrence river institute of environmental sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+st petersburg university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+st. jude children's NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+staff disciplinary board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+standard biological parts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+standing committee on plants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford eugenics history project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford university school of medicine in stanford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford university's program on energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanley price NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanley qi of stanford university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+star collaboration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+starlight initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state council for nature conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state council of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state key laboratory of agrobiotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state key laboratory of molecular oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state key laboratory of pathogen and biosecurity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state university of campinas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state university of new jersey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+statens serum insitut NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+statistics collaborative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+status of women in astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+steac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stem cell network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stencila desktop NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stern review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sternberg museum in hays NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stockholm environment institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stockholm environmental institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stony brook cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+strategic planning committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stratospheric particle injection for climate engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stuart henrys NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stuttgart state museum of natural history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+suborbital research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+subpolar north atlantic program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sudanese national academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+suffolk university law school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sughrue mion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sukachev institute of forest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+supercomputing centre of galicia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+superior high arbitration court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+superior technical institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+support research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+supreme arbitration court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+supreme leader ayatollah NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+supreme people's court of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+surface heat budget NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+surgisphere corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+suzuka university of medical science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sw/niger delta forest project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish association of university teachers and researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish institute of space physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish medical products agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish meteorological and hydrological institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish national council on medical ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swift observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss federal institute of technology of lausanne NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss institute for experimental cancer research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss mummy project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss ornithological institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss state secretariat for education and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swog cancer research network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+symyx NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+symyx technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+synaptic leap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+synthesis philosophica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+synthetic biology standards consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+syros pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+system for publication and evaluation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+systematic entomology lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+t.h. chan school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+taconic biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tahija foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tanzania academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+target malaria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+targeted proteins research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tarveda therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tasmanian seed conservation centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tass russian news agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tata institute for genetics and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tata trusts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tauri group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tdcs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+teamindus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tech inquiry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical institute of physics and chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical review panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of braunschweig NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of chemnitz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of darmstadt NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of dortmund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of kaiserslautern NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technological university of el chocó NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology & education advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology and economic assessment panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology and innovation committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology and innovation endowment fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+teconomy partners NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tectonophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tehran university to ayatollah khamenei NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+telecommunication standardization bureau NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+terravision exploration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+terry fox laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tetralogic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+teva pharmaceuticals industries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+texas a&m university's harte research institute in corpus christi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+texas tech university health science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+texas water development board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thai academy of science and technology foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thai young scientists academy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thailand research fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the american psychiatric association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the association of american medical colleges NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the chicago community trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the five star movement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the foundation fighting blindness NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the george institute for international health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the research department of moët & chandon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the south china sea institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the university of north carolina school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+themis bioscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+theoretical astrophysics center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+theoretical physics of condensed matter laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+therapeutics accelerator NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thermo fisher scientific of waltham NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+third rock ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thirty meter telescope international observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+three-north shelter forest program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thünen institute of wood research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thuringian state observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thwaites glacier offshore research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tianjin university of traditional chinese medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tibotec pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+time-space reference systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tissue culture core facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tiziana life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tokamak energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tor vergata university of rome NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+toronto science policy network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trait biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+transatlantic trade and investment partnership NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+transgenic technology meeting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+transition military council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+translational medicine division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+translational research informatics center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+transplantation of human organs and tissues NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+treatment action campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trichanalytics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trinity partners NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+troitsk institute of innovative and thermonuclear research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropic biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical fisheries research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical forest and climate initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical melhoramento & genética NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical trump NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropospheric monitoring instrument NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trump the world health organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trust for america's health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tsinghua university's institute of low carbon economy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tsinghua university's school of life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tsingua university's institute of climate change and sustainable development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ttip NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tuba city regional health care corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tucson gem NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tumor biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+turkish aerospace industries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+turkish higher education board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+turku centre for quantum physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+turning technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+twilight zone ocean network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+twist bioscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tychonic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+u r rao satellite centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+u.s. foundation response NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+u.s. national academies of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+u.s.-china economic and security review commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uae space agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucl centre for biodiversity and environment research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucl council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucl great ormond street institute of child health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucl's institute of child health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucs center for science and democracy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucsd health system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uct institutional reconciliation and transformation commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uct's black academic caucus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ufrj institute of medical biochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ufrj's laboratory of elementary particles NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uganda national academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk association of medical research charities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk bioindustry association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk biotechnology and biological sciences research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk civil service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk clinical research collaboration tissue directory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk court of appeal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk dementia research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk food and environment research agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk independence party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk institute for public policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk labour force survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk labour member of parliament NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk national institute for health and care excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk national institute for health and clinical excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk national quantum technologies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk natural environment research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk nuclear industry association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk office of national statistics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk strategic defence and security review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk universities purchasing consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukcmri NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukraine international airlines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukrainian association of reproductive medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukrainian science club NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukrio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+umeå centre for microbial research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un environment assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un framework convention on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un intergovernmental panel on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un mission for ebola emergency response NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un population fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unclos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unfcc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unicode consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unión de nativos ayoreos de paraguay NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+union of concern scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uniqorn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unistellar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united campus workers of georgia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united kingdom atomic energy authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations climate summit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations environment assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations human rights committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations international civil aviation organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations office for disaster risk reduction NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations office for outer space affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations sustainable development solutions network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations university institute of advanced studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations world heritage NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations world meteorological organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' general assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' green climate fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' world meteorological organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+universal quantum and alpine quantum technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+universities allied for essential medicines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university college london's institute for sustainable resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university college london's institute of cognitive neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university hospital for psychiatry zurich NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university museum of zoology, university of cambridge" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of 'roma tre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of a coruña NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of aix-marseille NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of arizona's lunar and planetary laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of arkansas for medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of british columbia fisheries centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of british columbia okanagan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of british columbia's fisheries centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california and nature publishing group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california board of regents NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california curation center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california irvine school of medicine and school of law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california museum of paleontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california observatories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california to cambridge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california union of postdocs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of california, berkeley if trump" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california's berkeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california's lick observatory on mount hamilton NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of cambridge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of cambridge, imperial college london" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of cambridge, university college london" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of cambridge's institute of astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of catanzaro magna graecia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of chile school of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of colorado boulder's natural history museum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of colorado's center for bioethics and humanities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of colorado's laboratory for atmospheric and space physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of cote d'azur in nice NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of delaware's school of marine science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of delhi's centre for genetic manipulation of crop plants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of duisburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of east anglia's climatic research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of edinburgh's roslin institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of erlangen-nuremberg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of geneva medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of halle-wittenberg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of hawaii's institute for astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of hawaii's institute for astronomy in manoa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of indonesia in depok NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of ioannina school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of malawi's college of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of manchester's national graphene institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of marburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland center for environmental science in solomons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland in college park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland's chesapeake biological laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland's horn point laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland's joint global change research institute in college park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of massachusetts, amherst" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of melbourne's school of botany NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of michigan geriatrics center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of michigan law school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of michigan medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of michigan museum of anthropology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of minnesota in saint paul NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of minnesota stem cell institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of minnesota, twin cities" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of minnesota's center for infectious diseases research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of nairobi's kenya aids vaccine initiative institute for clinical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of naples federico ii NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of new caledonia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of new south wales' climate-change research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of nice sophia antipolis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of north carolina chapel hill center for aids research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of north carolina school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of nottingham medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of nottingham's school of biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of oxford's wildlife conservation research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of paraíba valley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of paris dauphine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of paris-south NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pennsylvania medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pennsylvania's institute for translational medicine and therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pittsburgh cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pittsburgh center for vaccine research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pretoria's genomics research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of puerto rico humacao NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of quebec trois-rivières NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of roma tre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of rome tre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of são paulo school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of são paulo's museum of archaeology and ethnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of sciences and technology of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of south florida college of marine science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southampton's institute of maritime law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southern california dornsife/ los angeles times NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southern california's longevity institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southern mississippi's gulf coast research laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southern texas medical center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of sydney michael spence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of texas at austin marine science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of texas at austin school of law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of texas m. d. anderson cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of texas southwestern NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of the ryukyus, niigata university" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of toronto mississauga NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of toronto scarborough NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of toulouse-jean jaurès NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of toulouse-paul sabatier NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of utah college of law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of utah health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of versailles saint quentin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of veterinary medicine hannover NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of virginia school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington school of law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington's friday harbor laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington's national primate research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of wisconsin's cooperative institute for meteorological satellite studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university-national oceanographic laboratory system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university-of-hawaii-built NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unmanned aircraft systems program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unols) council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unoosa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unpaywall NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unsilo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unsilo of aarhus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unsw centre for quantum computation and communication technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unum therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uppsala astronomical observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+urban dynamics institute at oak ridge national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+urban emissions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+urban wildlands group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+urologic oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us advanced research projects agency-energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us air force's national security space institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us antarctic research programmes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us arctic research commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us army training and doctrine command NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us association for women in science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us association of research integrity officers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us bureau of labor statistics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us bureau of labour statistics and wikipedia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us bureau of ocean energy management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us centers for disease control and prevention and national institutes of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us centers for disease prevention and control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us centers for diseases control and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us chemical safety board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us chimpanzee health improvement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us court of appeals for the district of columbia circuit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us deep space climate observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department for health and human services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of defense's defense advanced research projects agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of energy and national science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of energy's joint genome institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of health and human services's office of research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us district court for the district of columbia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us district court for the southern district of new york NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us district court of the district of columbia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us eastern standard time NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us energy department's office of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us equal opportunity commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us federal emergency management agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us food and drug association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us forest service's forest inventory and analysis program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us forest service's national genomics center for wildlife NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us geological survey's alaska science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us geological survey's national wildlife health center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us house committee on science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us human microbiome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us ice drilling program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us institute of medicine's forum on neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us intelligence advanced research projects agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us joint space operations center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academics of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academy of sciences and national academy of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academy of sciences decadal survey of astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national cancer institute at the national institutes of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national center on advancing translational sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national climatic data center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national cmv foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national health and nutrition examination NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national high magnetic field laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national incident command's flow rate technical group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national insitute of allergies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of allergies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of diabetes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of environmental health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of environmental health sciences in research triangle park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of health's human microbiome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of neurological disorders NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of neurological disorders and stroke NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of nursing research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute on aging NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute on drug abuse NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institutes of health and national science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national lgbt cancer network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national longitudinal study of adolescent health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national medal of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national nanotechnology initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national nuclear security administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration's cooperative institute for climate and satellites NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration's coral reef watch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration's national climatic data center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration's pacific marine environmental laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national optical-infrared astronomy research laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national plant genome initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national renewable energy laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national science foundation gulfstream NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national science foundation survey of graduate students NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national toxicology program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us naval war college NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us nuclear posture review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us office for human research protections NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us office of naval research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us precision medicine initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us right to know NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us small business innovation research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us society for neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us treasury department's office of foreign assets control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us-ireland research and development partnership NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us–china energy cooperation program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+usda-ars bee biology and systematics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+usgs earthquake hazards program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+usgs interagency grizzly bear study team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+usgs volcano hazards program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+utility solutions group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vaccine research initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+valeant pharmaceuticals of laval NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+validation of alternative methods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vaquita express NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vatican secret archives NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vavilov research institute of plant industry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+veneto institute of molecular medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+venezuelan amazon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+venice time machine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+venter group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+venus exploration analysis group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+verenium corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+verification research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+verily life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+veterinary medicine advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vexag international workshop NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vibrant clean energy llc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+victims of communism memorial foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vienna science and technology fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vietnam academy of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+viiv healthcare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+violence prevention research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+virgin galactic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+virtual physiological human network of excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+virus identification laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+visiopharm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vital strategies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vmac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+voilà foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+voinnet NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+voit & mayer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+volcano disaster assistance program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+volkswagen foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wageningen agricultural university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wake county superior court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+walt de heer of georgia institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+walther schücking institute of international law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+warren p. knowles professor of law & bioethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+warsaw university observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+washington state hospital association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+water task team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+watson health cloud NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+waymo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wayne state university's institute of environmental health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+weill cornell brain tumor center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+weill cornell medicine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+welfare and conservation of animals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome centre for infectious diseases research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome trust centre for mitochondrial research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wenchang space launch center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wentworth group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wentworth group of concerned scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+were santa cruz biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+western kenya network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wharton risk center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+whereas labour NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white coat waste project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house council on environmental quality NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house office of energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house office of science and technology policy's joint committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house office of trade and manufacturing policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who collaborating center on public health law and human rights at georgetown university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who collaborating centre for reference and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who global malaria programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who stop tb department NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who strategic advisory group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who world mental health survey consortium j. am NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who-affiliated centers for law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who's executive board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who's health emergencies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who's strategic advisory group of experts on immunization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who) health emergencies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wikipedia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wikipedia science conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wild nature institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wildlife conservation research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wilkinson microwave anisotropy probe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+william alanson white institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+william and flora hewlett foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+william davidson institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wilson international center for scholars NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wimar witoelar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+windpower monthly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wohlers associates NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+women's hospital heart and vascular center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+woods canyon archaeological consultants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+woods hole oceanographic institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+woranso-mille NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+working group of indigenous minorities in southern africa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+working group on himalayan glaciology of the international commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+working party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world conference of science journalists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world energy congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world energy outlook NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world glacier monitoring service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world health organization global plan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world health organization's international agency for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world heritage committee of the united nations educational NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world medical association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world meteorological organization's integrated global observing system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world ocean atlas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world organization for animal health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world premier international research centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world privacy forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world register of marine species NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world science forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world society for the protection of animals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world surf league NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world university rankings NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world wide lightning location network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuhan municipal health commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuhan national laboratory of electronics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuhan university of bioengineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuhan university of technology's international school of materials science and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuzhen institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wwf international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wyle laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wyss center for bio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+xechem international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+xl catlin seaview survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yaguará panama NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale center for astronomy and astrophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale program on climate change communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale project on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale project on climate change communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yalu aboriginal corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yanan sun NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yangyang underground laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ybco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yellowstone grizzlies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yerevan physics institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yizhi liu of sun yat-sen university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yokohama science frontier high school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+young academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+young scientists exchange program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yunnan agricultural university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zaira resource management area NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zapata swamp captive breeding farm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zayed university of artificial intelligence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zeta ophiuchi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zewail city of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zhejiang university institute for social medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zhejiang university-university of edinburgh institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zimbabwe academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zimbabwe academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zurich observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zwicky transient facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zymo research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bi norwegian business school no Europe Northern Europe FALSE 1 2021-02-03 125421139 way "Norwegian Air Shuttle, 3, Oksenøyveien, Fornebu, Bærum, Viken, 1366, Norge" office company 0.59515363245564 Norge FALSE
+eit no Europe Northern Europe FALSE 1 2021-02-03 23054719 node "Eiet, Flesberg, Viken, Norge" place farm 0.2 Norge FALSE
+oslo metropolitan university no Europe Northern Europe FALSE 1 2021-02-03 257701514 way "OsloMet – storbyuniversitetet, Falbes gate, Pilestredet park, St. Hanshaugen, Oslo, 0170, Norge" amenity university 0.451332014915526 Norge FALSE
+oslo university hospital no Europe Northern Europe FALSE 1 2021-02-03 182954962 way "Oslo universitetssykehus (Rikshospitalet), Sognsvannsveien, Gaustad, Nordre Aker, Oslo, 0372, Norge" amenity hospital 0.599096455305557 Norge FALSE
+sputnik v no Europe Northern Europe FALSE 1 2021-02-03 126372392 way "Sputnikveien, Kjellberg, Sandefjord, Vestfold og Telemark, 3224, Norge" highway residential 0.3 Norge FALSE
+university of oslo's natural history museum no Europe Northern Europe FALSE 1 2021-02-03 84983285 way "Botanisk hage, 1, Sars' gate, Sofienberg, Grünerløkka, Oslo, 0562, Norge" tourism attraction 0.628069876897978 Norge FALSE
+university of tromsø no Europe Northern Europe FALSE 1 2021-02-03 95993572 way "Universitetet i Tromsø - Norges arktiske universitet, Gimlevegen, Breivika, Tromsø, Troms og Finnmark, 9019, Norge" amenity university 0.534301779265404 Norge FALSE
+vae no Europe Northern Europe FALSE 1 2021-02-03 258997285 relation "Vae, Gamvik, Troms og Finnmark, Norge" natural water 0.3 Norge FALSE
+acta nl Europe Western Europe FALSE 1 2021-02-03 96616441 way "ACTA, 3004, Gustav Mahlerlaan, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland, 1081LA, Nederland" amenity college 0.290508362962683 Nederland FALSE
+aeolus nl Europe Western Europe FALSE 1 2021-02-03 144931633 way "Aeolus, Westlandseweg, Vlaardingen, Zuid-Holland, Nederland, 3134JC, Nederland" man_made windmill 0.26265143530573 Nederland FALSE
+ambix nl Europe Western Europe FALSE 1 2021-02-03 54117879 node "BENU Apotheek Ambix, 1a, Chopinstraat, Bunschoten-Spakenburg, Bunschoten, Utrecht, Nederland, 3752HR, Nederland" amenity pharmacy 0.101 Nederland FALSE
+ams nl Europe Western Europe FALSE 1 2021-02-03 95519693 way "Luchthaven Schiphol, Badhoevedorp, Haarlemmermeer, Noord-Holland, Nederland" aeroway aerodrome 0.53820282267208 Nederland FALSE
+best nl Europe Western Europe FALSE 1 2021-02-03 258000671 relation "Best, Oirschot, Noord-Brabant, Nederland" boundary administrative 0.556605514662107 Nederland FALSE
+bosch nl Europe Western Europe FALSE 1 2021-02-03 258171058 relation "'s-Hertogenbosch, Noord-Brabant, Nederland" boundary administrative 0.667476382537589 Nederland FALSE
+centocor nl Europe Western Europe FALSE 1 2021-02-03 158634721 way "Centocor, Einsteinweg, Leiden Bio Science Park, Leiden, Zuid-Holland, Nederland, 2333CD, Nederland" building commercial 0.101 Nederland FALSE
+cosine nl Europe Western Europe FALSE 1 2021-02-03 46849085 node "Cosine, 36, Oosteinde, Warmond, Teylingen, Zuid-Holland, Nederland, 2361HE, Nederland" office company 0.101 Nederland FALSE
+dunkin' donuts nl Europe Western Europe FALSE 1 2021-02-03 186353233 way "Dunkin' Donuts, Amstelpassage, Centrum, Amsterdam, Noord-Holland, Nederland, 1012AB, Nederland" amenity fast_food 0.660723093272883 Nederland FALSE
+estec nl Europe Western Europe FALSE 1 2021-02-03 296384894 way "European Space Research and Technology Centre, Noordwijk, Zuid-Holland, Nederland, 2201AZ, Nederland" landuse commercial 0.415797566639606 Nederland FALSE
+greenpeace international nl Europe Western Europe FALSE 1 2021-02-03 27171707 node "Greenpeace International, 5, Ottho Heldringstraat, Westlandgracht, Nieuw-West, Amsterdam, Noord-Holland, Nederland, 1066AZ, Nederland" office ngo 0.722713711460203 Nederland FALSE
+hague university of applied sciences nl Europe Western Europe FALSE 1 2021-02-03 172073582 way "Haagse Hogeschool, 75, Johanna Westerdijkplein, Schipperskwartier, Laak, Den Haag, Zuid-Holland, Nederland, 2521EN, Nederland" amenity college 0.325616522175778 Nederland FALSE
+international bar association nl Europe Western Europe FALSE 1 2021-02-03 300605690 node "International Bar Association, Nassaulaan, Willemspark, Centrum, Den Haag, Zuid-Holland, Nederland, 2514JT, Nederland" office association 0.301 Nederland FALSE
+international red cross and red crescent movement nl Europe Western Europe FALSE 1 2021-02-03 30304696 node "Rode Kruis Ede, 30C, Klinkenbergerweg, Ede, Gelderland, Nederland, 6711MK, Nederland" office ngo 0.688190127552538 Nederland FALSE
+joint institute for vlbi nl Europe Western Europe FALSE 1 2021-02-03 53796048 node "Joint Institute for VLBI ERIC, Oude Hoogeveensedijk, Lhee, Dwingeloo, Westerveld, Drenthe, Nederland, 7991, Nederland" office research 0.401 Nederland FALSE
+kws nl Europe Western Europe FALSE 1 2021-02-03 124014428 way "KWS, Botlek Rotterdam, Rotterdam, Zuid-Holland, Nederland" landuse industrial 0.3 Nederland FALSE
+leiden university medical centre nl Europe Western Europe FALSE 1 2021-02-03 257776634 relation "Leiden, Zuid-Holland, Nederland" boundary administrative 0.719246276766776 Nederland FALSE
+medicines agency nl Europe Western Europe FALSE 1 2021-02-03 302037271 node "European Medicines Agency, 6, Domenico Scarlattilaan, Drentepark, Zuid, Amsterdam, Noord-Holland, Nederland, 1083HS, Nederland" office government 0.69651736792561 Nederland FALSE
+nederland nl Europe Western Europe FALSE 1 2021-02-03 258635389 relation Nederland boundary administrative 0.929416895369094 Nederland FALSE
+nib nl Europe Western Europe FALSE 1 2021-02-03 28452921 node "NIBC Bank, 4, Carnegieplein, Zeeheldenkwartier, Centrum, Den Haag, Zuid-Holland, Nederland, 2517KJ, Nederland" amenity bank 0.422734482343971 Nederland FALSE
+smos nl Europe Western Europe FALSE 1 2021-02-03 86360011 way "Derk Smoeslaan, Sluitersveld, Almelo, Overijssel, Nederland, 7603SX, Nederland" highway residential 0.1 Nederland FALSE
+synlogic nl Europe Western Europe FALSE 1 2021-02-03 52272358 node "Synlogic, 1H, Branderweg, Westenholte, Zwolle, Overijssel, Nederland, 8042PD, Nederland" office it 0.101 Nederland FALSE
+tno nl Europe Western Europe FALSE 1 2021-02-03 95537231 way "TNO, Rijswijk, Zuid-Holland, Nederland, 2288GJ, Nederland" landuse industrial 0.3 Nederland FALSE
+twente nl Europe Western Europe FALSE 1 2021-02-03 46292871 node "Twente, Saasveld, Dinkelland, Overijssel, Nederland, 7597KL, Nederland" place region 0.546214416898128 Nederland FALSE
+university of delft nl Europe Western Europe FALSE 1 2021-02-03 138201041 way "Technische Universiteit Delft, Mijnbouwstraat, Wippolder, Delft, Zuid-Holland, Nederland, 2628, Nederland" amenity university 0.604534284533579 Nederland FALSE
+university of leiden nl Europe Western Europe FALSE 1 2021-02-03 259157980 relation "Universiteit Leiden, Einsteinweg, Leiden Bio Science Park, Leiden, Zuid-Holland, Nederland, 2333CE, Nederland" amenity university 0.688163620893378 Nederland FALSE
+university of maastricht nl Europe Western Europe FALSE 1 2021-02-03 31891847 node "University College Maastricht, De Bosquetplein, Maastricht-Centrum, Maastricht, Limburg, Nederland, 6211, Nederland" amenity university 0.494548847777872 Nederland FALSE
+university of utrecht nl Europe Western Europe FALSE 1 2021-02-03 103062889 way "University College Utrecht 'Babel', 7, Campusplein, Rijnsweerd, Utrecht, Nederland, 3584ED, Nederland" amenity university 0.471596680569804 Nederland FALSE
+utrecht nl Europe Western Europe FALSE 1 2021-02-03 258519257 relation "Utrecht, Nederland" boundary administrative 0.729439910682055 Nederland FALSE
+vrij nederland nl Europe Western Europe FALSE 1 2021-02-03 212385 node "Vrij, Siebengewald, Bergen, Limburg, Nederland, 5853, Nederland" place hamlet 0.45 Nederland FALSE
+vrije universiteit amsterdam nl Europe Western Europe FALSE 1 2021-02-03 258889678 relation "VU Hoofdgebouw, 1105, De Boelelaan, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland, 1081 HV, Nederland" amenity university 0.101 Nederland FALSE
+vrije university nl Europe Western Europe FALSE 1 2021-02-03 94052906 way "Vrije Universiteit, Campusplein, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland" amenity university 0.576914729576358 Nederland FALSE
+vu university amsterdam nl Europe Western Europe FALSE 1 2021-02-03 94052906 way "Vrije Universiteit, Campusplein, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland" amenity university 0.576914729576358 Nederland FALSE
+wageningen university and research nl Europe Western Europe FALSE 1 2021-02-03 235168671 way "Wageningen University & Research, Bornsesteeg, Wageningen, Gelderland, Nederland, 6708PE, Nederland" amenity university 0.485440647712364 Nederland FALSE
+wageningen university and research centre nl Europe Western Europe FALSE 1 2021-02-03 235168671 way "Wageningen University & Research, Bornsesteeg, Wageningen, Gelderland, Nederland, 6708PE, Nederland" amenity university 0.485440647712364 Nederland FALSE
+x-tek systems nl Europe Western Europe FALSE 1 2021-02-03 153550698 way "Aerotek / Tek Systems, Maria Montessorilaan, Rokkeveen, Zoetermeer, Zuid-Holland, Nederland, 2719DB, Nederland" building yes 0.201 Nederland FALSE
+international center for tropical agriculture ni Americas Central America FALSE 1 2021-02-03 23992977 node "CIAT - Centro Internacional de Agricultura Tropical, Calle La Extramadura, Los Robles, Distrito I, Managua (Municipio), Departamento de Managua, 14002, Nicaragua" office ngo 0.101 Nicaragua FALSE
+nih vrc ni Americas Central America FALSE 1 2021-02-03 68159851 node "Motoshop VRC, Pista Pedro JoaquÃn Chamorro, Barrio Santa Rosa, Santa Rosa, Distrito IV, Managua (Municipio), Departamento de Managua, 11095, Nicaragua" shop motorcycle 0.101 Nicaragua FALSE
+unan ni Americas Central America FALSE 1 2021-02-03 258777799 relation "Universidad Nacional Autónoma de Nicaragua (UNAN), Sector UNAN Managua, Distrito I, Managua (Municipio), Departamento de Managua, 14172, Nicaragua" boundary administrative 0.405003945962319 Nicaragua FALSE
+united nation's food and agriculture organization ni Americas Central America FALSE 1 2021-02-03 147031638 way "FAO Representation, Via al Mirador, Mirador Norte, Mirador Norte Santo Domingo, Distrito I, Managua (Municipio), Departamento de Managua, 14236, Nicaragua" office yes 0.101 Nicaragua FALSE
+aba ng Africa Western Africa FALSE 1 2021-02-03 4302273 node "Aba, Aba South, Abia, Nigeria" place city 0.51986117350753 Nigeria FALSE
+agi ng Africa Western Africa FALSE 1 2021-02-03 4166597 node "Agi, Ushongo, Benue, Nigeria" place village 0.375 Nigeria FALSE
+asor ng Africa Western Africa FALSE 1 2021-02-03 4143033 node "Asor, Vandeikya, Benue, Nigeria" place village 0.375 Nigeria FALSE
+bank of industry ng Africa Western Africa FALSE 1 2021-02-03 251858983 way "Bank of Industry, Oba Adesida Road, Akure, Akure South, Ondo, P.M.B 704, Nigeria" amenity bank 0.301 Nigeria FALSE
+cipm ng Africa Western Africa FALSE 1 2021-02-03 215607744 way "CIPM, Agidingbi, Ikeja, Nigeria" landuse commercial 0.3 Nigeria FALSE
+egu ng Africa Western Africa FALSE 1 2021-02-03 4155158 node "Egue, Ogoja, Cross River, Nigeria" place village 0.375 Nigeria FALSE
+emu ng Africa Western Africa FALSE 1 2021-02-03 4192015 node "Emu, Lokoja, Kogi, Nigeria" place village 0.375 Nigeria FALSE
+european union council ng Africa Western Africa FALSE 1 2021-02-03 61840071 node "Delegation of the European Union to Nigeria and ECOWAS, European Union Crescent, Abuja, Municipal Area Council, Federal Capital Territory, 900281, Nigeria" office diplomatic 0.301 Nigeria FALSE
+federal university of bahia ng Africa Western Africa FALSE 1 2021-02-03 212660417 way "Wudil - Potiskum Federal Road, Sabon Gari Arewa, Sabon Gari Lga Quarter, Sabon Gari, Wudil, Kano, Nigeria" highway primary 0.2 Nigeria FALSE
+gwu ng Africa Western Africa FALSE 1 2021-02-03 4216886 node "Gwu, Guma, Benue, Nigeria" place village 0.375 Nigeria FALSE
+iddo ng Africa Western Africa FALSE 1 2021-02-03 4158848 node "Iddo, Ijumu, Kogi, Nigeria" place village 0.375 Nigeria FALSE
+iita ng Africa Western Africa FALSE 1 2021-02-03 210080586 way "IITA, Oluana, Akinyele, Oyo, Nigeria" landuse research 0.3 Nigeria FALSE
+itar ng Africa Western Africa FALSE 1 2021-02-03 4164628 node "Itar, Ushongo, Benue, Nigeria" place village 0.375 Nigeria FALSE
+kigam ng Africa Western Africa FALSE 1 2021-02-03 4191125 node "Kigam, Dankolo, Sakaba, Kebbi, Nigeria" place hamlet 0.35 Nigeria FALSE
+living proof ng Africa Western Africa FALSE 1 2021-02-03 214035104 way "Living-Proof Church Street, Ijaiye, Coker, Ifako/Ijaye, 100282, Nigeria" highway residential 0.3 Nigeria FALSE
+national primary health care development agency ng Africa Western Africa FALSE 1 2021-02-03 63408220 node "National Primary Health Care Development Agency, Murtala Muhammed Way, Yamma 2, Muhammadu Dikko Stadium, Katsina, Nigeria" amenity hospital 0.601 Nigeria FALSE
+obafemi awolowo university ng Africa Western Africa FALSE 1 2021-02-03 65154644 node "Obafemi Awolowo University, Road 1, Ife, Ife Central, Osun, Nigeria" amenity university 0.675561325671519 Nigeria FALSE
+open technology fund ng Africa Western Africa FALSE 1 2021-02-03 301111077 way "Petroleum Technology Development Fund, Memorial Drive, Wuse II, Abuja, Municipal Area Council, Federal Capital Territory, 223140, Nigeria" office government 0.201 Nigeria FALSE
+redeemer's university ng Africa Western Africa FALSE 1 2021-02-03 82335474 node "Redeemers University, Ede, Akoda Road, Ede South, Osun, 232121, Nigeria" amenity college 0.301 Nigeria FALSE
+rivers ng Africa Western Africa FALSE 1 2021-02-03 258774669 relation "Rivers, Nigeria" boundary administrative 0.589155408370537 Nigeria FALSE
+sheba ng Africa Western Africa FALSE 1 2021-02-03 4292823 node "Sheba, Fufore, Adamawa, Nigeria" place village 0.375 Nigeria FALSE
+tüba ng Africa Western Africa FALSE 1 2021-02-03 258538002 relation "Tuba, Jere, Borno, Nigeria" boundary administrative 0.35 Nigeria FALSE
+ukaea ng Africa Western Africa FALSE 1 2021-02-03 4061173 node "Ukaa, Lafia, Nasarawa, Nigeria" place village 0.275 Nigeria FALSE
+ukip ng Africa Western Africa FALSE 1 2021-02-03 4135824 node "Ukip, Odukpani, Cross River, Nigeria" place village 0.375 Nigeria FALSE
+ussa ng Africa Western Africa FALSE 1 2021-02-03 4138452 node "Ussa, Rafi, Niger, Nigeria" place village 0.375 Nigeria FALSE
+ut health ng Africa Western Africa FALSE 1 2021-02-03 252874587 way "health, Ganye - Jimeta Federal Road, Kubi, Jada, Adamawa, Nigeria" amenity hospital 0.111 Nigeria FALSE
+zenith bank ng Africa Western Africa FALSE 1 2021-02-03 217118303 way "Zenith Bank, Lairdstown, Lokoja, Kogi, Nigeria" landuse commercial 0.4 Nigeria FALSE
+acmad ne Africa Western Africa FALSE 1 2021-02-03 48915388 node "ACMAD, Avenue des Ministères, Kombo, Niamey, 227, Niger" office telecommunication 0.101 Niger FALSE
+akari ne Africa Western Africa FALSE 1 2021-02-03 3928427 node "Akari, Tchirozérine, Agadez, Niger" place village 0.375 Niger FALSE
+court of auditors ne Africa Western Africa FALSE 1 2021-02-03 40892781 node "Cour de Compte, Avenue des Ministères, Kombo, Niamey, 227, Niger" amenity courthouse 0.001 Niger FALSE
+ecole normale supérieure ne Africa Western Africa FALSE 1 2021-02-03 150675686 way "École Normale Supérieure, Nogaré, Niamey, Niger" landuse residential 0.4 Niger FALSE
+global health program ne Africa Western Africa FALSE 1 2021-02-03 72262246 node "USAID Global Health Supply Chain Program, Rue KK - 37, Ambassades, Yantala Bas, Niamey, 12519, Niger" office ngo 0.301 Niger FALSE
+sciences en marche ne Africa Western Africa FALSE 1 2021-02-03 247370552 way "Faculté des Sciences Économiques et Juridiques (FSEJ), Rue du Malii, Baie d'Along, Kalley Sud, Niamey, 13053, Niger" amenity university 0.201 Niger FALSE
+united nations economic commission for africa ne Africa Western Africa FALSE 1 2021-02-03 100693942 way "Commission Economique de Nations Unis pour l'Afrique, Avenue du Fleuve Niger, Château 1, Plateau, Niamey, PO BOX 744, Niger" office international_organization 0.201 Niger FALSE
+adelie land NA Africa Southern Africa FALSE 1 2021-02-03 258784652 relation French Antarctic Territory boundary region 0.512160492428557 NA FALSE
+concordia station NA Africa Southern Africa FALSE 1 2021-02-03 17620139 node "Concordia Station, Route 66, Camp d'été, Concordia Station" tourism attraction 0.54728560320245 NA FALSE
+flower garden banks national marine sanctuary NA Africa Southern Africa FALSE 1 2021-02-03 259278410 relation Flower Garden Banks National Marine Sanctuary boundary protected_area 0.896586468044334 NA FALSE
+icecube neutrino observatory NA Africa Southern Africa FALSE 1 2021-02-03 59696254 node IceCube Neutrino Observatory office research 0.703758799530623 NA FALSE
+jang bogo station NA Africa Southern Africa FALSE 1 2021-02-03 76959223 node Jang Bogo Station office research 0.301 NA FALSE
+ou NA Africa Southern Africa FALSE 1 2021-02-03 299876346 node أوروبا place continent 0.820706719188318 NA FALSE
+southern ocean NA Africa Southern Africa FALSE 1 2021-02-03 1180665 node Southern Ocean place ocean 0.804907554591729 NA FALSE
+security commission na NA NA FALSE 1 2021-02-03 176798699 way "Social Security Commission, Social Security Commission Street, Evululuko, Oshakati, Oshana Region, Namibia" building yes 0.201 Namibia FALSE
+university of namibia na NA NA FALSE 1 2021-02-03 259061968 relation "University of Namibia (UNAM), 340, Western Bypass, Academia, Windhoek, Khomas Region, 10021, Namibia" amenity university 0.65609057542022 Namibia FALSE
+defence science institute my Asia South-Eastern Asia FALSE 1 2021-02-03 201603752 way "Institut Penyelidikan Sains dan Teknologi Pertahanan, Kajang 2, Majlis Perbandaran Kajang, Selangor, 43000, Malaysia" landuse military 0.2 Malaysia FALSE
+executive council my Asia South-Eastern Asia FALSE 1 2021-02-03 181186080 way "Klang Executive Club, Majlis Perbandaran Klang, Selangor, Malaysia" landuse commercial 0.3 Malaysia FALSE
+ipo my Asia South-Eastern Asia FALSE 1 2021-02-03 919320 node "Ipoh, Perak, 30450, Malaysia" place city 0.615222407384027 Malaysia FALSE
+micron my Asia South-Eastern Asia FALSE 1 2021-02-03 170067917 way "Micron, Muar, Johor, Malaysia" landuse industrial 0.3 Malaysia FALSE
+nas council my Asia South-Eastern Asia FALSE 1 2021-02-03 77986421 node "NAS THE BARBERSHOP, Jalan Rantau Panjang, Kampung Rantau Panjang, Majlis Perbandaran Klang, Selangor, 42100, Malaysia" shop hairdresser_supply 0.101 Malaysia FALSE
+national defence university of malaysia my Asia South-Eastern Asia FALSE 1 2021-02-03 177354671 way "Universiti Pertahanan Nasional Malaysia, Sungai Besi, Kuala Lumpur, 57000, Malaysia" amenity university 0.453359579316511 Malaysia FALSE
+national institute of occupational safety and health my Asia South-Eastern Asia FALSE 1 2021-02-03 56964700 node "Institut Keselamatan dan Kesihatan Pekerjaan Negara (NIOSH), Jalan Tun Abdul Razak, Ayer Keroh, Majlis Perbandaran Hang Tuah Jaya, Melaka Tengah, Melaka, 75450, Malaysia" office government 0.101 Malaysia FALSE
+niosh my Asia South-Eastern Asia FALSE 1 2021-02-03 191530658 way "National Institute of Safety and Health (NIOSH), Majlis Perbandaran Kajang, Selangor, Malaysia" landuse commercial 0.3 Malaysia FALSE
+university malaysia sarawak my Asia South-Eastern Asia FALSE 1 2021-02-03 77913241 node "Open University Malaysia, Jalan Ibrahim Sultan, Johor Bahru, Iskandar Malaysia, Johor, 80300, Malaysia" amenity university 0.201 Malaysia FALSE
+zero hour my Asia South-Eastern Asia FALSE 1 2021-02-03 54517763 node "OYO 304 Zero Hour, 60, Changkat Bukit Bintang, Bukit Bintang, Kuala Lumpur, 50200, Malaysia" tourism hotel 0.201 Malaysia FALSE
+autonomous university of mexico state mx Americas Central America FALSE 1 2021-02-03 96671012 way "Universidad Nacional Autónoma de México, Circuito Exterior, Ciudad Universitaria, Coyoacán, Ciudad de México, 04360, México" amenity university 0.562409087444079 México FALSE
+cañales de la fuente mx Americas Central America FALSE 1 2021-02-03 130437167 way "Rió Chiquito, Morelia, Michoacán de Ocampo, 58010, México" waterway canal 0.35 México FALSE
+chiquita mx Americas Central America FALSE 1 2021-02-03 83170179 node "La Chiquita, Escárcega, Campeche, 24350, México" place village 0.375 México FALSE
+ciencia mx Americas Central America FALSE 1 2021-02-03 300995336 way "Ciencia, Industrial Cuamatla, Cuautitlán Izcalli, Estado de México, 54730, México" highway unclassified 0.2 México FALSE
+cimmyt mx Americas Central America FALSE 1 2021-02-03 185530203 way "CIMMyT, San Sebastian, Metepec, Estado de México, México" landuse farmland 0.3 México FALSE
+cincia mx Americas Central America FALSE 1 2021-02-03 300995336 way "Ciencia, Industrial Cuamatla, Cuautitlán Izcalli, Estado de México, 54730, México" highway unclassified 0.1 México FALSE
+cjs mx Americas Central America FALSE 1 2021-02-03 168991899 way "Aeropuerto Intl. Abraham González, Calle Mariposas, Fraccionamiento Paseos del Alba, Ciudad Juárez, Municipio de Juárez, Chihuahua, 32695, México" aeroway aerodrome 0.20962395537125 México FALSE
+el mercurio mx Americas Central America FALSE 1 2021-02-03 258592407 relation "Mercurio, Delegación Centro Histórico, Santiago de Querétaro, Municipio de Querétaro, Querétaro, 76040, México" boundary administrative 0.45 México FALSE
+ixtoc mx Americas Central America FALSE 1 2021-02-03 144903083 way "Ixtoc, Municipio de Zacatecas, Zacatecas, 98050, México" highway residential 0.2 México FALSE
+jumex mx Americas Central America FALSE 1 2021-02-03 256750870 way "Jumex, Salinas Victoria, Nuevo León, México" landuse industrial 0.3 México FALSE
+mexic mx Americas Central America FALSE 1 2021-02-03 257065613 relation México boundary administrative 0.839923932441765 México FALSE
+mexichem fluor mx Americas Central America FALSE 1 2021-02-03 83412633 node "Mexichem Flúor, S.A. de C.V., Avenida Minerales, FRACCIONAMIENTO PUENTE SOL, San Luis PotosÃ, Municipio de San Luis PotosÃ, San Luis PotosÃ, 78398, México" man_made works 0.101 México FALSE
+paranal mx Americas Central America FALSE 1 2021-02-03 64125022 node "El Paranal, Compostela, México" place village 0.375 México FALSE
+paseo de la reforma mx Americas Central America FALSE 1 2021-02-03 206203911 way "Paseo de la Reforma, Matamoros, Municipio de Matamoros, Tamaulipas, México" leisure park 0.55 México FALSE
+pds mx Americas Central America FALSE 1 2021-02-03 126696505 way "Aeropuerto Intl. de Piedras Negras, Libramiento Venustiano Carranza, Colonia Venustiano Carranza, Nava, Coahuila de Zaragoza, 26090, México" aeroway aerodrome 0.305439512435045 México FALSE
+pemex mx Americas Central America FALSE 1 2021-02-03 259232903 relation "PEMEX, Tierra Blanca, Veracruz de Ignacio de la Llave, 95180, México" boundary administrative 0.35 México FALSE
+petróleos mexicanos mx Americas Central America FALSE 1 2021-02-03 198944140 way "Petróleos Mexicanos, Encarnación de DÃaz, Jalisco, México" highway residential 0.3 México FALSE
+ucu mx Americas Central America FALSE 1 2021-02-03 258828316 relation "Ucú, Yucatán, 97357, México" boundary administrative 0.349448365439565 México FALSE
+ursus maritimus mx Americas Central America FALSE 1 2021-02-03 258279792 relation "Polar bear, Panoramica 1a. Sección, Guadalajara, Jalisco, México" landuse enclosure 0.2 México FALSE
+food and nutrition sciences mw Africa Eastern Africa FALSE 1 2021-02-03 163124289 way "Nutrition and Food Sciences Department, S125, Mitundu, Lilongwe, Central Region, Malawi" building school 0.401 Malawi FALSE
+malawi-liverpool-wellcome trust clinical research programme mw Africa Eastern Africa FALSE 1 2021-02-03 203971970 way "Malawi-Liverpool-Wellcome Trust Clinical Research Programme, Kenyatta Drive, Limbe, Blantyre, Southern Region, Malawi" building yes 0.701 Malawi FALSE
+national research programme mw Africa Eastern Africa FALSE 1 2021-02-03 203971970 way "Malawi-Liverpool-Wellcome Trust Clinical Research Programme, Kenyatta Drive, Limbe, Blantyre, Southern Region, Malawi" building yes 0.201 Malawi FALSE
+istc mt Europe Southern Europe FALSE 1 2021-02-03 103649213 way "ISTC, Hal Far, Birżebbuġa, Nofsinhar, BBG 2366, Malta" amenity school 0.101 Malta FALSE
+national museum of the archaeology mt Europe Southern Europe FALSE 1 2021-02-03 98624313 way "National Museum of Archaeology, Triq ir-Repubblika, Valletta, Xlokk, 1112, Malta" tourism museum 0.753955066068524 Malta FALSE
+unt mn Asia Eastern Asia FALSE 1 2021-02-03 15012021 node "Уньт, Хутаг-Өндөр, Булган, Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á °" place hamlet 0.25 Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° FALSE
+burma mm Asia South-Eastern Asia FALSE 1 2021-02-03 257686006 relation မြန်မာ boundary administrative 0.70160293453831 မြန်မာ FALSE
+japan japan mm Asia South-Eastern Asia FALSE 1 2021-02-03 52812179 node "Japan Japan, ပန်းဆá€á€¯á€¸á€<90>န်းလမ်း, ကျောက်á€<90>ံá€<90>ား, ရန်ကုန်, Western District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 11183, မြန်မာ" amenity restaurant 0.201 မြန်မာ FALSE
+khwe mm Asia South-Eastern Asia FALSE 1 2021-02-03 56327123 node "Ma Khwe, မá€á€¯á€¸á€™á€±á€¬á€€á€º, ဗန်းမော်á€<81>ရá€á€¯á€„်, ကá€<81>ျင်ပြည်နယ် (Kachin), မြန်မာ" place village 0.375 မြန်မာ FALSE
+meteorological office mm Asia South-Eastern Asia FALSE 1 2021-02-03 165525254 way "Meteorological Office, ကမ္ဘာအေးစေá€<90>ီလမ်း, မရမ်းကုန်း, Northern District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 11061, မြန်မာ" building yes 0.201 မြန်မာ FALSE
+petronas mm Asia South-Eastern Asia FALSE 1 2021-02-03 176840009 way "Petronas, ဗဟန်း, ရန်ကုန်, Western District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, မြန်မာ" landuse commercial 0.3 မြန်မာ FALSE
+suny college mm Asia South-Eastern Asia FALSE 1 2021-02-03 73203724 node "suny, 3, Chay-myit-pin, ပြင်ဦးလွင်, ပြင်ဦးလွင်á€<81>ရá€á€¯á€„်, ရှမ်းပြည်နယ်မြောက်ပá€á€¯á€„်း, မန္á€<90>လေးá€<90>á€á€¯á€„်း, 05082, မြန်မာ" shop car_repair 0.111 မြန်မာ FALSE
+united nation mm Asia South-Eastern Asia FALSE 1 2021-02-03 211221297 way "ကမ္ဘာ့ကုလသမဂ္ဂ United Nation, နá€<90>်မောက်လမ်း, á€<90>ာမွေ, ရန်ကုန်, Southern District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 00000, မြန်မာ" building yes 0.201 မြန်မာ FALSE
+fema ml Africa Western Africa FALSE 1 2021-02-03 20841052 node "Féma, Cercle d'Ansongo, Gao, Mali" place hamlet 0.25 Mali FALSE
+mpdl ml Africa Western Africa FALSE 1 2021-02-03 84054815 node "ONG Mouvement pour la Paix MPDL, Route secondaire kita liberté, Liberté Darsalam, Kita, Kayes, Mali" office ngo 0.101 Mali FALSE
+european university mk Europe Southern Europe FALSE 1 2021-02-03 99750914 way "ЕвропÑ<81>ки уиверзитет, 68, Булевар Климент ОхридÑ<81>ки, Капиштец, Центар, Скопје, Општина Центар, Град Скопје, СкопÑ<81>ки СР, 1000, Северна Македонија" building university 0.289139026272805 Северна Македонија FALSE
+macedonia mk Europe Southern Europe FALSE 1 2021-02-03 258289965 relation Северна Македонија boundary administrative 0.700106436214969 Северна Македонија FALSE
+methodius university mk Europe Southern Europe FALSE 1 2021-02-03 91653738 way "Универзитет „Св. Кирил и Методиј“, 9, Булевар Гоце Делчев, Маџир Маало, Центар, Скопје, Општина Центар, Град Скопје, СкопÑ<81>ки СР, 1000, Северна Македонија" amenity university 0.445726149027095 Северна Македонија FALSE
+sofia mg Africa Eastern Africa FALSE 1 2021-02-03 50765789 node "Sofia, Province de Mahajanga, Madagasikara" place state 0.65 Madagasikara FALSE
+university of antananarivo mg Africa Eastern Africa FALSE 1 2021-02-03 247271163 way "IT University, N 7, Andoharanofotsy, Antananarivo, Analamanga, Province d’Antananarivo, 102, Madagasikara" amenity university 0.301 Madagasikara FALSE
+brca me Europe Southern Europe FALSE 1 2021-02-03 259536883 relation "Brca, Opština Bar, Crna Gora / Црна Гора" boundary administrative 0.442480646342894 Crna Gora / Црна Гора FALSE
+strp me Europe Southern Europe FALSE 1 2021-02-03 6436011 node "Strp, Opština Kotor, 85338, Crna Gora / Црна Гора" place village 0.442954744060451 Crna Gora / Црна Гора FALSE
+university of montenegro me Europe Southern Europe FALSE 1 2021-02-03 300314506 way "Sportski i kulturni centar Univerziteta Crne Gore, 1, Studentska, Kruševac, Podgorica, Glavni grad Podgorica, 81000, Crna Gora / Црна Гора" office yes 0.001 Crna Gora / Црна Гора FALSE
+culture and research md Europe Eastern Europe FALSE 1 2021-02-03 76263818 node "Ministerul Educației, Culturii și Cercetării, 1, Piața Marea Adunare Națională, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2033, Moldova" office government 0.001 Moldova FALSE
+moldova md Europe Eastern Europe FALSE 1 2021-02-03 258078872 relation Moldova boundary administrative 0.810647543596845 Moldova FALSE
+moldova state university md Europe Eastern Europe FALSE 1 2021-02-03 96416496 way "Universitatea de Stat din Moldova, 60, Strada Alexei Mateevici, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2009, Moldova" amenity university 0.511834385728338 Moldova FALSE
+republic of moldova md Europe Eastern Europe FALSE 1 2021-02-03 258078872 relation Moldova boundary administrative 0.810647543596845 Moldova FALSE
+social democratic party md Europe Eastern Europe FALSE 1 2021-02-03 75621414 node "Partidul Social Democrat, Strada Ghioceilor, Buiucanii Vechi, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2008, Moldova" office political_party 0.101 Moldova FALSE
+technical university of moldova md Europe Eastern Europe FALSE 1 2021-02-03 259221802 relation "Universitatea Tehnică a Moldovei, Bulevardul Cuza-Vodă, Toamna de Aur, Chișinău, Sectorul Botanica, Municipiul Chișinău, 2032, Moldova" amenity university 0.412408728172101 Moldova FALSE
+transparency international md Europe Eastern Europe FALSE 1 2021-02-03 80688236 node "Transparency International, 98, Strada 31 August 1989, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2004, Moldova" office association 0.201 Moldova FALSE
+atlas ma Africa Northern Africa FALSE 1 2021-02-03 58180936 node "Atlas Mountains, Toubkal ⵜⵓⴱⵇⴰâµ<8d> توبقال, caïdat de’Ouzioua, cercle de Taliouine, Province de Taroudant ⵜⴰⵙⴳⴰ âµ<8f> ⵜⴰⵔⵓⴷⴰâµ<8f>ⵜ إقليم تارودانت, Souss-Massa ⵙⵓⵙⵙ-ⵎⴰⵙⵙⴰ سوس-ماسة, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" natural mountain_range 0.622636990621202 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+bureau of international cooperation ma Africa Northern Africa FALSE 1 2021-02-03 151396673 way "Bureau International de la Coopération Décentralisée - Figuig المكتب الدولي التعاون اللامركزي لمدينة Ù<81>كيك, Boulevard Hassan II شارع الØسن الثاني, Quartier Administratif الØÙŠ الإداري, Figuig ⵉⴼⵉⵢⵢⵉⵢ Ù<81>كيك, Pachalik de Figuig, Province de Figuig إقليم الناظور, Oriental ⵜⴰâµ<8f>ⴳⵎⵓⴹⵜ الشرقية, 61002, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" office ngo 0.201 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+institute pasteur ma Africa Northern Africa FALSE 1 2021-02-03 36249968 node "Institute Pasteur, Avenue Hadj Mohamed Tazi, Marshan مرشان, Tanger طنجة, arrondissement de Tanger-Medina طنجة المدينة, pachalik de Tanger طنجة, Préfecture de Tanger-Assilah عمالة طنجة-أصيلة, Tanger-Tétouan-Al Hoceima ⵟⴰâµ<8f>ⵊ-ⵟⵉⵜⴰⵡⵉâµ<8f>-âµ<8d>ⵃⵓⵙⵉⵎⴰ طنجة تطوان الØسيمة, 90005, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" office educational_institution 0.201 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+environmental computer science ly Africa Northern Africa FALSE 1 2021-02-03 77766672 node "مراقبة Øماية البيئة من التلوث, طريق المنطقه الاولي, مدينة البريقة, الواØات, ليبيا" tourism artwork 0.001 ليبيا FALSE
+national library of science and technology ly Africa Northern Africa FALSE 1 2021-02-03 193077551 way "المكتبة الوطنية للعلوم والتقنية, طريق تاجوراء الوسط, طرابلس, سوق الجمعة, طرابلس, ليبيا" amenity library 0.001 ليبيا FALSE
+new hope fertility clinic ly Africa Northern Africa FALSE 1 2021-02-03 245123183 way "عيادة الامل للخصبة, شارع الخليج العربي, الØدائق, بنغازي, 10001, ليبيا" amenity hospital 0.001 ليبيا FALSE
+mie university lu Europe Western Europe FALSE 1 2021-02-03 229451045 way "Maison de l'Innovation, Avenue des Hauts-Fourneaux, Belval, Esch-sur-Alzette, Canton Esch-sur-Alzette, 4362, Lëtzebuerg" building yes 0.001 Lëtzebuerg FALSE
+university of luxembourg lu Europe Western Europe FALSE 1 2021-02-03 186892046 way "Université du Luxembourg - Campus Limpertsberg, Rue Frantz Clément, Limpertsberg, Luxembourg, Canton Luxembourg, 1913, Lëtzebuerg" amenity university 0.101 Lëtzebuerg FALSE
+skoda lt Europe Northern Europe FALSE 1 2021-02-03 258707357 relation "Skuodas, Skuodo miesto seniūnija, Skuodo rajono savivaldybė, Klaipėdos apskritis, Lietuva" boundary administrative 0.443410405267134 Lietuva FALSE
+vu university lt Europe Northern Europe FALSE 1 2021-02-03 259014111 relation "Vilniaus universitetas, Simono Daukanto aikÅ¡tÄ—, Senamiestis, SenamiesÄ<8d>io seniÅ«nija, Vilnius, Vilniaus miesto savivaldybÄ—, Vilniaus apskritis, Lietuva" amenity university 0.557377358917248 Lietuva FALSE
+appeal court ls Africa Southern Africa FALSE 1 2021-02-03 167262882 way "Appeal Court, Nightingale Road, White City, Maseru, Maseru District, 100, Lesotho" amenity courthouse 0.201 Lesotho FALSE
+maoa ls Africa Southern Africa FALSE 1 2021-02-03 175399852 way "Proposed Maoa-Mafubelu Community Council, Ha Mahala, Lithotaneng, Leribe District, Lesotho" landuse construction 0.3 Lesotho FALSE
+last mile health lr Africa Western Africa FALSE 1 2021-02-03 197374476 way "Last Mile Health, Dweh Street, Niao, Zone 5, Tchien, Grand Gedeh County, Liberia" office ngo 0.301 Liberia FALSE
+liber lr Africa Western Africa FALSE 1 2021-02-03 257865924 relation Liberia boundary administrative 0.76493857339783 Liberia FALSE
+people's party lr Africa Western Africa FALSE 1 2021-02-03 57756179 node "United People's Party Office, Baltimore Boulevard, Borworor Quarrer Community (E, Barwror Quarter, Gbarnga, Zone 3, Jorquelleh, Bong County, Liberia" office political_party 0.301 Liberia FALSE
+aaaaaa lk Asia Southern Asia FALSE 1 2021-02-03 177636879 way "aaaaaa, Kapithan Bandula Weerasingha Mawatha, Bendiyamulla, ගම්පහ, බස්නà·<8f>හිර පළà·<8f>à¶, 63.A.63, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" building residential 0.111 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+department of geography lk Asia Southern Asia FALSE 1 2021-02-03 147802012 way "Department of Geography, Wijerama Junction, Gangodawila South, Delkanda, බස්නà·<8f>හිර පළà·<8f>à¶, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" natural grassland 0.5 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+district general hospital lk Asia Southern Asia FALSE 1 2021-02-03 43623408 node "District General Hospital, Thalvupadu Mannar Road, Toddaveli, மனà¯<8d>னாரà¯<8d> மாவடà¯<8d>டமà¯<8d>, வட மாகாணமà¯<8d>, 41000, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity hospital 0.367710111330712 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+freedom party lk Asia Southern Asia FALSE 1 2021-02-03 212085481 way "Sri Lanka Freedom Party - Jaffna District, 4th Cross Street, Mixed Retail Residential, யாழà¯<8d>பà¯<8d>பாணமà¯<8d>, யாழà¯<8d>பà¯<8d>பாணமà¯<8d> மாவடà¯<8d>டமà¯<8d>, வட மாகாணமà¯<8d>, 7, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office political_party 0.201 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+hri lk Asia Southern Asia FALSE 1 2021-02-03 135662687 way "Mattala Rajapaksa International Airport, Airport Road, Maththala, හම්බන්à¶à·œà¶§ දිස්à¶à·Šâ€<8d>රික්කය, දකුණු පළà·<8f>à¶, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" aeroway aerodrome 0.326239076957718 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+individual house lk Asia Southern Asia FALSE 1 2021-02-03 199672414 way "Individual house, Village road, Pasyala, බස්නà·<8f>හිර පළà·<8f>à¶, 033, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" building house 0.201 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+itn lk Asia Southern Asia FALSE 1 2021-02-03 139273914 way "Independent Television Network – ITN, Wickramasinghe Pura Road, Jayawadanagama, Thalangama South, Thalawathugoda, බස්නà·<8f>හිර පළà·<8f>à¶, 10116, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity public_building 0.101 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+members of parliament lk Asia Southern Asia FALSE 1 2021-02-03 232939503 way "Parliament Members' Housing, Madiwela, à·<81>à·Šâ€<8d>රී ජයවර්ධනපුර කà·<9d>ට්ටේ, බස්නà·<8f>හිර පළà·<8f>à¶, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" landuse residential 0.4 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+national aquatic resources research and development agency lk Asia Southern Asia FALSE 1 2021-02-03 72133325 node "The National Aquatic Resources Research and Development Agency, Nara Road, Crow Island, Mattakkuliya, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00150, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office Research_and_product_development 0.701 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+ucsc lk Asia Southern Asia FALSE 1 2021-02-03 183525981 way "UCSC, 35, Reid Avenue, Independace Squre, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" building yes 0.101 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+university of ruhuna lk Asia Southern Asia FALSE 1 2021-02-03 44083620 node "University Of Ruhuna, New Tangalle Road, මà·<8f>à¶à¶», Devinuwara, මà·<8f>à¶à¶» දිස්à¶à·Šâ€<8d>රික්කය, දකුණු පළà·<8f>à¶, 81160, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity university 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+us national herbarium lk Asia Southern Asia FALSE 1 2021-02-03 138112413 way "National Herbarium, River Drive, Kendakaduwa, Eriyagama, මහනුවර දිස්à¶à·Šâ€<8d>රික්කය, මධ්â€<8d>යම පළà·<8f>à¶, 20400, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" building yes 0.201 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+fountain medical development lc Americas Caribbean FALSE 1 2021-02-03 187420482 way "American International Medical University, Beausejour Main Road, Beausejour NHC Phase 2, Acacia Heights, Beausejour, Gros Islet, LCO1 101, Saint Lucia" amenity university 0.287641222780259 Saint Lucia FALSE
+global environment facility lc Americas Caribbean FALSE 1 2021-02-03 48669497 node "Global Environment Facility Small Grants Programmme United nations Development Programme (GEF SGP UNDP), Desir Avenue, L'anse Road, Sans Souci, Castries, 1487, Saint Lucia" office yes 0.301 Saint Lucia FALSE
+town lc Americas Caribbean FALSE 1 2021-02-03 70258427 node "Town, Soufriere, ST. LUCIA, Saint Lucia" place suburb 0.375 Saint Lucia FALSE
+american university of beirut lb Asia Western Asia FALSE 1 2021-02-03 95275637 way "الجامعة الأمريكية Ù<81>ÙŠ بيروت, شارع 76, الØمرا, الØمراء, رأس بيروت, بيروت, Ù…ØاÙ<81>ظة بيروت, 2033 9105, لبنان" amenity university 0.486153860067244 لبنان FALSE
+apec lb Asia Western Asia FALSE 1 2021-02-03 71190099 node "Apec, Old Souk Hasroun, Øصرون, قضاء بشرّي, Ù…ØاÙ<81>ظة الشمال, 1377, لبنان" amenity fuel 0.101 لبنان FALSE
+aapa la Asia South-Eastern Asia FALSE 1 2021-02-03 53572459 node "ຈິງ, ເມືàºàº‡àº<81>ະລຶມ, ເຊàº<81>àºàº‡, ປະເທດລາວ" place village 0.275 ປະເທດລາວ FALSE
+department of meteorology and hydrology la Asia South-Eastern Asia FALSE 1 2021-02-03 21008314 node "Department of Meteorology and Hydrology, Avenue Souphanouvong, ໜàºàº‡àº›àº²à»ƒàº™, ວຽງຈັນ, ສີໂຄດຕະບàºàº‡, ນະຄàºàº™àº«àº¼àº§àº‡àº§àº½àº‡àºˆàº±àº™, 6441, ປະເທດລາວ" building office 0.501 ປະເທດລາວ FALSE
+ministry of public security la Asia South-Eastern Asia FALSE 1 2021-02-03 200397894 way "Ministry of Public Security, Chemin Nongbone, ບ້ານàº<9d>າàº<8d>, ວຽງຈັນ, ເມືàºàº‡àºˆàº±àº™àº—ະບູລີ, ນະຄàºàº™àº«àº¼àº§àº‡àº§àº½àº‡àºˆàº±àº™, 01003, ປະເທດລາວ" amenity police 0.401 ປະເທດລາວ FALSE
+omb la Asia South-Eastern Asia FALSE 1 2021-02-03 54244449 node "ດູ່, ເມືàºàº‡àº®àº¸àº™, àºàº¸àº”ົມໄຊ, ປະເທດລາວ" place village 0.275 ປະເທດລາວ FALSE
+prison law office la Asia South-Eastern Asia FALSE 1 2021-02-03 252411118 way "ຄຸໄໃຫມ່ຄຸໄໃຫມ່, ຖະຫນົ່ນໄປຫາບ້ານເàº<81>ິນ, ເàº<81>ີນໃຕ້, ທຸລະຄົມ, ວຽງຈັນ, ປະເທດລາວ" amenity prison 0.001 ປະເທດລາວ FALSE
+mgh kz Asia Central Asia FALSE 1 2021-02-03 62523570 node "MGH, ПанфиловÑ<81>кий район, Ð<90>лматинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, ҚазақÑ<81>тан" mountain_pass yes 0.35 ҚазақÑ<81>тан FALSE
+republic of kazakhstan kz Asia Central Asia FALSE 1 2021-02-03 258456913 relation ҚазақÑ<81>тан boundary administrative 0.762519577338093 ҚазақÑ<81>тан FALSE
+chosun ilbo kr Asia Eastern Asia FALSE 1 2021-02-03 145965192 way "ì¡°ì„ ì<9d>¼ë³´ë¯¸ìˆ ê´€, 세종대로21길, 소공ë<8f>™, 중구, 서울, 04519, 대한민êµ" tourism gallery 0.441531223132585 ëŒ€í•œë¯¼êµ FALSE
+election commission kr Asia Eastern Asia FALSE 1 2021-02-03 229109140 way "세종특별ìž<90>치시 ì„ ê±°ê´€ë¦¬ìœ„ì›<90>회, 남세종로, 보람ë<8f>™, 세종, 30150, 대한민êµ" office government 0.001 ëŒ€í•œë¯¼êµ FALSE
+ewha womans university kr Asia Eastern Asia FALSE 1 2021-02-03 259075058 relation "ì<9d>´í™”ì—¬ìž<90>대학êµ<90>, 52, ì<9d>´í™”여대길, ì‹ ì´Œë<8f>™, 서대문구, 서울, 03760, 대한민êµ" amenity university 0.47254535964387 ëŒ€í•œë¯¼êµ FALSE
+gachon university kr Asia Eastern Asia FALSE 1 2021-02-03 69928613 node "가천대, 성남대로, ìˆ˜ì •êµ¬, 수진ë<8f>™, 13110, 대한민êµ" railway station 0.350501936383412 ëŒ€í•œë¯¼êµ FALSE
+gwangju institute of science and technology kr Asia Eastern Asia FALSE 1 2021-02-03 197084062 way "ê´‘ì£¼ê³¼í•™ê¸°ìˆ ì›<90>, 123, 첨단과기로, 광산구, 광주, 61005, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+hanaro kr Asia Eastern Asia FALSE 1 2021-02-03 117966939 way "하나로, 대ë<8f>™ë¦¬, 거창군, ê²½ìƒ<81>남ë<8f>„, 대한민êµ" landuse residential 0.2 ëŒ€í•œë¯¼êµ FALSE
+hanyang university kr Asia Eastern Asia FALSE 1 2021-02-03 66564765 node "한양대, 206, 왕ì‹ë¦¬ë¡œ, 사근ë<8f>™, 성ë<8f>™êµ¬, 서울, 04763, 대한민êµ" railway station 0.370185956704757 ëŒ€í•œë¯¼êµ FALSE
+institute for environment and health kr Asia Eastern Asia FALSE 1 2021-02-03 229907799 way "세종시보건환경연구ì›<90>, 12, ì„œë¶<81>부2ë¡œ, 조치ì›<90>ì„œë¶<81>부지구 (본 지구는 ì˜ˆì •/공사 중ì<9d>´ë¯€ë¡œ 변경ë<90> 수 있ì<9d>Œ), 조치ì›<90>ì<9d><8d>, 세종, 30015, 대한민êµ" office government 0.001 ëŒ€í•œë¯¼êµ FALSE
+jeju national university kr Asia Eastern Asia FALSE 1 2021-02-03 11306936 node "ì œì£¼êµ<90>대, ì<9d>¼ì£¼ë<8f>™ë¡œ, ê±´ìž…ë<8f>™, ì œì£¼ì‹œ, 63293, 대한민êµ" junction yes 0.001 ëŒ€í•œë¯¼êµ FALSE
+kookmin university kr Asia Eastern Asia FALSE 1 2021-02-03 129642584 way "êµë¯¼ëŒ€í•™êµ<90>, ë³´êµë¬¸ë¡œ29길, ì •ë¦‰3ë<8f>™, 성ë¶<81>구, 서울, 02707, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+korea atomic energy research institute kr Asia Eastern Asia FALSE 1 2021-02-03 238115633 way "í•œêµì›<90>ìž<90>ë ¥ì—°êµ¬ì›<90>, ì‹ ì„±ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 대한민êµ" landuse military 0.2 ëŒ€í•œë¯¼êµ FALSE
+korea development institute kr Asia Eastern Asia FALSE 1 2021-02-03 72869447 node "ë¶<81>한개발연구소, 28, í<9d>¬ìš°ì •ë¡œ5길, í•©ì •ë<8f>™, 마í<8f>¬êµ¬, 서울, ì˜¤ì •êµ¬, 04019, 대한민êµ" office research 0.001 ëŒ€í•œë¯¼êµ FALSE
+korea institute of nuclear safety kr Asia Eastern Asia FALSE 1 2021-02-03 198459956 way "í•œêµì›<90>ìž<90>ë ¥ì•ˆì „ê¸°ìˆ ì›<90>, 온천ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 대한민êµ" landuse commercial 0.2 ëŒ€í•œë¯¼êµ FALSE
+korea institute of ocean science and technology kr Asia Eastern Asia FALSE 1 2021-02-03 175306429 way "í•œêµí•´ì–‘ê³¼í•™ê¸°ìˆ ì›<90>, ìƒ<81>ë¡<9d>구, 안산시, 경기ë<8f>„, 대한민êµ" landuse industrial 0.2 ëŒ€í•œë¯¼êµ FALSE
+kyungpook national university kr Asia Eastern Asia FALSE 1 2021-02-03 145552795 way "êµë¦½ê²½ë¶<81>대학êµ<90>, 대현로9길, 대현ë<8f>™, ë¶<81>구, 대구, 41573, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+ls cable kr Asia Eastern Asia FALSE 1 2021-02-03 207764001 way "LSì „ì„ ì‚¬ì›<90>아파트, ì‹ í<8f>‰ë<8f>™, 구미시, ê²½ìƒ<81>ë¶<81>ë<8f>„, 대한민êµ" landuse residential 0.3 ëŒ€í•œë¯¼êµ FALSE
+ministry of oceans and fisheries kr Asia Eastern Asia FALSE 1 2021-02-03 53551582 node "해양수산부(5ë<8f>™), 94, 다솜2ë¡œ, 어진ë<8f>™, ë<8f>„ë‹´ë<8f>™, 세종, 30110, 대한민êµ" office government 0.001 ëŒ€í•œë¯¼êµ FALSE
+postech kr Asia Eastern Asia FALSE 1 2021-02-03 259443543 relation "í<8f>¬í•ê³µê³¼ëŒ€í•™êµ<90>, 77, ì²ì•”ë¡œ, 효곡ë<8f>™, 남구, í<8f>¬í•ì‹œ, ê²½ìƒ<81>ë¶<81>ë<8f>„, 37673, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+pusan national university in busan kr Asia Eastern Asia FALSE 1 2021-02-03 196919997 way "부산대학êµ<90>, 금강로335번길, ìž¥ì „1ë<8f>™, ìž¥ì „ë<8f>™, ê¸ˆì •êµ¬, 부산, 46282, 대한민êµ" amenity university 0.439740442442793 ëŒ€í•œë¯¼êµ FALSE
+sbs kr Asia Eastern Asia FALSE 1 2021-02-03 61070534 node "SBS, 161, 목ë<8f>™ì„œë¡œ, 목1ë<8f>™, 양천구, 서울, ì˜¤ì •êµ¬, 08006, 대한민êµ" amenity studio 0.692747798796741 ëŒ€í•œë¯¼êµ FALSE
+seoul national university of science and technology kr Asia Eastern Asia FALSE 1 2021-02-03 178768152 way "ì„œìš¸ê³¼í•™ê¸°ìˆ ëŒ€í•™êµ<90>, ë…¸ì›<90>ë¡œ, 공릉2ë<8f>™, 서울, 01816, 대한민êµ" amenity university 0.375700293936422 ëŒ€í•œë¯¼êµ FALSE
+sungkyunkwan kr Asia Eastern Asia FALSE 1 2021-02-03 107069637 way "ì„±ê· ê´€ëŒ€í•™êµ<90> ì<9d>¸ë¬¸ì‚¬íšŒê³¼í•™ìº í<8d>¼ìŠ¤, 25-2, ì„±ê· ê´€ë¡œ, 혜화ë<8f>™, 종로구, 명륜1ê°€, 서울, 03063, 대한민êµ" amenity university 0.483507677970318 ëŒ€í•œë¯¼êµ FALSE
+university of ulsan college of medicine kr Asia Eastern Asia FALSE 1 2021-02-03 200588646 way "울산대학êµ<90> ì<9d>˜ê³¼ëŒ€í•™, 88, 올림픽로43길, Pungnap 2(i)-dong, 송파구, 서울, 05505, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+kim chaek university of technology kp Asia Eastern Asia FALSE 1 2021-02-03 117123664 way "김책공업종합대학, ì˜<81>광거리, 중구ì—, 외성ë<8f>™, í<8f>‰ì–‘ì‹œ, ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ" amenity university 0.340053860433783 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ FALSE
+kim il-sung university kp Asia Eastern Asia FALSE 1 2021-02-03 258684511 relation "ê¹€ì<9d>¼ì„±ì¢…합대학, ë ¤ëª…ê±°ë¦¬, 대성구ì—, í<8f>‰ì–‘, í<8f>‰ì–‘ì‹œ, ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ" amenity university 0.42474743961288 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ FALSE
+pyongyang university of science and technology kp Asia Eastern Asia FALSE 1 2021-02-03 45781187 node "í<8f>‰ì–‘ê³¼í•™ê¸°ìˆ ëŒ€í•™, AH1, ë<9d>½ëž‘구ì—, í<8f>‰ì–‘, í<8f>‰ì–‘ì‹œ, ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ" amenity university 0.292441551930616 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ FALSE
+university of the west indies kn Americas Caribbean FALSE 1 2021-02-03 207615978 way "University Of The West Indies, Horsfords Road, Irish Town, Port Zante, Basseterre, Saint George Basseterre, Saint Kitts, 07162, Saint Kitts and Nevis" amenity university 0.501 Saint Kitts and Nevis FALSE
+central pacific ki Oceania Micronesia FALSE 1 2021-02-03 195202169 way "Central Pacific, Main Road, Nawerewere, Tarawa Te Inainano, Kiribati" shop seafood 0.201 Kiribati FALSE
+cdri kh Asia South-Eastern Asia FALSE 1 2021-02-03 53298902 node "CDRI, ផ្លូវ ៣១៥, សង្កាáž<8f>់បឹងកក់ទី ២, áž<81>ណ្ឌទួលគោក, រាជធានីភ្នំពáŸ<81>ញ, 120408, ព្រះរាជាណាចក្រ​កម្ពុជា" office educational_institution 0.101 ព្រះរាជាណាចក្រ​កម្ពុជា FALSE
+morakot kh Asia South-Eastern Asia FALSE 1 2021-02-03 150353783 way "កោះពស់, ក្រុងព្រះសីហនុ, áž<81>áŸ<81>áž<8f>្áž<8f>ព្រះសីហនុ, ព្រះរាជាណាចក្រ​កម្ពុជា" place island 0.325 ព្រះរាជាណាចក្រ​កម្ពុជា FALSE
+public prosecutor's office kg Asia Central Asia FALSE 1 2021-02-03 104759616 way "Прокуратура, Бишкек, КыргызÑ<81>тан" landuse construction 0.2 КыргызÑ<81>тан FALSE
+angelina jolie ke Africa Eastern Africa FALSE 1 2021-02-03 185368038 way "Angelina Jolie Primary School, E1351, Turkana, Kenya" amenity school 0.201 Kenya FALSE
+glaxosmithkline ke Africa Eastern Africa FALSE 1 2021-02-03 256812958 way "Glaxo Smithkline, Mbotela, Central Business District, Nairobi, Kenya" landuse industrial 0.4 Kenya FALSE
+international centre of insect physiology and ecology ke Africa Eastern Africa FALSE 1 2021-02-03 193624949 way "International Centre of Insect Physiology and Ecology (ICIPE) Field Station, Ukunda-Ramisi Road, Kona Ya Chale, Kwale, Coastal Kenya, 80400, Kenya" building industrial 0.701 Kenya FALSE
+international livestock research institute ke Africa Eastern Africa FALSE 1 2021-02-03 154926034 way "International Livestock Research Institute, C61, Nairobi, P.O. BOX 30709, Kenya" office educational_institution 0.401 Kenya FALSE
+kenya wildlife service ke Africa Eastern Africa FALSE 1 2021-02-03 168205921 way "Kenya Wildlife Service, Kisumu, Nyanza, Kenya" landuse commercial 0.5 Kenya FALSE
+mount kenya safari club ke Africa Eastern Africa FALSE 1 2021-02-03 15683008 node "Mount Kenya Safari Club, D488, Nyeri, Central Kenya, 10400, Kenya" tourism hotel 0.401 Kenya FALSE
+sino-africa joint research centre ke Africa Eastern Africa FALSE 1 2021-02-03 177716862 way "Sino-Africa Joint Research Centre, Juja, Kiambu, Central Kenya, Kenya" landuse construction 0.7 Kenya FALSE
+university of nairobi ke Africa Eastern Africa FALSE 1 2021-02-03 66537019 node "University of Nairobi(Kabete Campus), Kapenguria Road, Nairobi, P.O. BOX 30709, Kenya" amenity university 0.301 Kenya FALSE
+us court of appeals ke Africa Eastern Africa FALSE 1 2021-02-03 116083341 way "Court of Appeals, Fort Jesus Road, Mombasa, Coastal Kenya, 80100, Kenya" amenity courthouse 0.401 Kenya FALSE
+verity ke Africa Eastern Africa FALSE 1 2021-02-03 163539434 way "Verity, Nyeri, Central Kenya, 10100, Kenya" highway residential 0.2 Kenya FALSE
+world agroforestry centre ke Africa Eastern Africa FALSE 1 2021-02-03 259495866 relation "World Agroforestry Center, ICRAF Road, Gigiri, Nairobi, 00800, Kenya" building yes 0.512795139465266 Kenya FALSE
+advanced science institute jp Asia Eastern Asia FALSE 1 2021-02-03 180150166 way "産æ¥æŠ€è¡“ç·<8f>å<90>ˆç ”究所;西事æ¥æ‰€, å¦åœ’西大通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0061, 日本" amenity research_institute 0.42962282009393 日本 FALSE
+aerospace exploration agency jp Asia Eastern Asia FALSE 1 2021-02-03 104684391 way "å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本" amenity research_institute 0.534103782224402 日本 FALSE
+aga jp Asia Eastern Asia FALSE 1 2021-02-03 258597957 relation "阿賀町, æ<9d>±è’²åŽŸéƒ¡, 新潟県, 日本" boundary administrative 0.438650451987068 日本 FALSE
+atomic energy agency jp Asia Eastern Asia FALSE 1 2021-02-03 220860551 way "Japan Atomic Energy Agency, 765-1, ã<81>¯ã<81>ªã<81>¿ã<81>šã<81><8d>通り, æ<9d>±æµ·æ<9d>‘, é‚£ç<8f>‚郡, 茨城県, 319-1184, 日本" building yes 0.301 日本 FALSE
+azabu university jp Asia Eastern Asia FALSE 1 2021-02-03 129610650 way "麻布大å¦, 矢部ã<81>µã‚Œã<81>‚ã<81>„地下é<81>“, ä¸å¤®åŒº, 相模原市, 神奈å·<9d>県, 229-0032, 日本" amenity university 0.415142283922981 日本 FALSE
+bandai jp Asia Eastern Asia FALSE 1 2021-02-03 258916292 relation "ç£<90>梯町, 耶麻郡, ç¦<8f>島県, 969-3301, 日本" boundary administrative 0.408093117536752 日本 FALSE
+carbon institute jp Asia Eastern Asia FALSE 1 2021-02-03 144485403 way "カーボンニュートラル・エãƒ<8d>ãƒ«ã‚®ãƒ¼å›½éš›ç ”ç©¶æ‰€ 第1ç ”ç©¶æ£Ÿ, 桜井太郎丸線, 西区, ç¦<8f>岡市, ç¦<8f>岡県, 819-0382, 日本" building university 0.001 日本 FALSE
+center for materials science jp Asia Eastern Asia FALSE 1 2021-02-03 140270004 way "ナノマテリアルテクノãƒã‚¸ãƒ¼ã‚»ãƒ³ã‚¿ãƒ¼ (Center for Nano Materials and Technology), 石å·<9d>県é<81>“55å<8f>·å°<8f>æ<9d>¾è¾°å<8f>£ç·š, æ—å<8f>°, 能美市, 石å·<9d>県, 923-1206, 日本" building university 0.301 日本 FALSE
+chiba institute of technology jp Asia Eastern Asia FALSE 1 2021-02-03 104275451 way "å<8d>ƒè‘‰å·¥æ¥å¤§å¦, ã<81>¾ã‚<8d>ã<81>«ã<81>ˆé€šã‚Š, 津田沼2, 習志野市, å<8d>ƒè‘‰çœŒ, 274-0825, 日本" amenity university 0.442477975994532 日本 FALSE
+chiba university jp Asia Eastern Asia FALSE 1 2021-02-03 133433420 way "å<8d>ƒè‘‰å¤§å¦, 文教通り, æ<9d>¾æ³¢2, 緑町1, 稲毛区, å<8d>ƒè‘‰å¸‚, å<8d>ƒè‘‰çœŒ, 2600033, 日本" amenity university 0.495611571950763 日本 FALSE
+chuo university jp Asia Eastern Asia FALSE 1 2021-02-03 218424118 way "ä¸å¤®å¤§å¦, 多摩モノレール通り, 八王å<90>市, æ<9d>±äº¬éƒ½, 191-8506, 日本" amenity university 0.540197762731253 日本 FALSE
+cooperative research center jp Asia Eastern Asia FALSE 1 2021-02-03 207174922 way "百周年記念館(産å¦é€£æ<90>ºæŽ¨é€²æ©Ÿæ§‹ï¼‰, 秋田八郎潟線, 手形山崎町, 秋田市, 秋田県, 010-0864, 日本" building university 0.001 日本 FALSE
+council for science and technology jp Asia Eastern Asia FALSE 1 2021-02-03 14641777 node "ç·<8f>å<90>ˆç§‘å¦æŠ€è¡“会è°, å…本木通り, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.001 日本 FALSE
+denka jp Asia Eastern Asia FALSE 1 2021-02-03 216092175 way "Denka, 糸éšå·<9d>市, 新潟県, 日本" landuse industrial 0.3 日本 FALSE
+department of internal medicine jp Asia Eastern Asia FALSE 1 2021-02-03 302545893 way "å°<8f>å<9d>‚内科クリニック, 11, å°<8f>立野通り 金沢湯涌ç¦<8f>光線, å®<9d>町, 金沢市, 石å·<9d>県, 920-8638, 日本" amenity doctors 0.001 日本 FALSE
+department of physiology jp Asia Eastern Asia FALSE 1 2021-02-03 50185221 node "Department of Physiology, Wakayama Medical University School of Medicine, ä¸å¤®é€šã‚Š, å’ŒæŒå±±å¸‚, å’ŒæŒå±±çœŒ, 640-8511, 日本" amenity school 0.301 日本 FALSE
+doi jp Asia Eastern Asia FALSE 1 2021-02-03 48804686 node "土居, 平野守å<8f>£ç·š, 大æž<9d>西町, é¦¬å ´ç”ºä¸‰ä¸<81>ç›®, 守å<8f>£å¸‚, 大阪府, 570-0038, 日本" railway station 0.338296402069185 日本 FALSE
+fisheries agency jp Asia Eastern Asia FALSE 1 2021-02-03 14700372 node "水産åº<81>, 霞ケ関, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.001 日本 FALSE
+goto jp Asia Eastern Asia FALSE 1 2021-02-03 258571934 relation "五島市, 長崎県, 日本" boundary administrative 0.430996300874427 日本 FALSE
+hirosaki university jp Asia Eastern Asia FALSE 1 2021-02-03 173133861 way "弘å‰<8d>大å¦, 石å·<9d>土手町線, 富田3, 富野町, 弘å‰<8d>市, é<9d>’森県, 036-8186, 日本" amenity university 0.444601849346538 日本 FALSE
+idex jp Asia Eastern Asia FALSE 1 2021-02-03 158633198 way "Cosmo, 二ä¸é€šã‚Š, 高麗町, 鹿å…<90>島市, 鹿å…<90>島県, 892-8677, 日本" amenity fuel 0.001 日本 FALSE
+ito jp Asia Eastern Asia FALSE 1 2021-02-03 258663212 relation "伊æ<9d>±å¸‚, é<9d>™å²¡çœŒ, 日本" boundary administrative 0.460897541165665 日本 FALSE
+itochu jp Asia Eastern Asia FALSE 1 2021-02-03 164136286 way "ITOCHU, ã<81>¾ã‚<81>ã<81> 大通り;金沢田鶴浜線, 広岡1, 広岡, 金沢市, 石å·<9d>県, 920-0031, 日本" building yes 0.101 日本 FALSE
+jamstec jp Asia Eastern Asia FALSE 1 2021-02-03 15031015 node "æµ·æ´‹ç ”ç©¶é–‹ç™ºæ©Ÿæ§‹, テストコース(GRANDRIVE), æ¨ªé ˆè³€å¸‚, 神奈å·<9d>県, 238-8550, 日本" amenity public_building 0.001 日本 FALSE
+japan aerospace and exploration agency jp Asia Eastern Asia FALSE 1 2021-02-03 104684391 way "å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本" amenity research_institute 0.534103782224402 日本 FALSE
+japan patent office jp Asia Eastern Asia FALSE 1 2021-02-03 15012020 node "特許åº<81>, 3, å¤–å €é€šã‚Š, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8915, 日本" office government 0.412830331815194 日本 FALSE
+japanese communist party jp Asia Eastern Asia FALSE 1 2021-02-03 26533301 node "日本共産党ä¸å¤®å§”員会, 7, 明治通り, å<8d>ƒé§„ヶ谷四ä¸<81>ç›®, 渋谷区, æ<9d>±äº¬éƒ½, 151-8586, 日本" office political_party 0.001 日本 FALSE
+juntendo university jp Asia Eastern Asia FALSE 1 2021-02-03 126277004 way "é †å¤©å ‚å¤§å¦ï¼ˆåŒ»å¦éƒ¨ï¼‰, æ²¹å<9d>‚, 本郷二ä¸<81>ç›®, 文京区, æ<9d>±äº¬éƒ½, 113-8431, 日本" amenity university 0.001 日本 FALSE
+kawasaki jp Asia Eastern Asia FALSE 1 2021-02-03 258763819 relation "å·<9d>崎市, 神奈å·<9d>県, 日本" boundary administrative 0.579153673816489 日本 FALSE
+keio jp Asia Eastern Asia FALSE 1 2021-02-03 226108428 way "Keio Line, 国際通り, 西新宿一ä¸<81>ç›®, 新宿区, æ<9d>±äº¬éƒ½, 160-0023, 日本" shop mall 0.101 日本 FALSE
+kurume university jp Asia Eastern Asia FALSE 1 2021-02-03 173775202 way "久留米大å¦ï¼ˆåŒ»å¦éƒ¨ï¼‰, 県é<81>“17å<8f>·åŒ»å¤§é€šã‚Š, 城å<8d>—町, 久留米市, ç¦<8f>岡県, 830-0011, 日本" amenity university 0.446874063573656 日本 FALSE
+laboratory of radioisotope complex jp Asia Eastern Asia FALSE 1 2021-02-03 111776378 way "R.I ç·<8f>å<90>ˆ 実験室, ã‚„ã<81>™ã‚‰ã<81>Žã<81>®é<81>“, 北å°<8f>路町, 内ä¾<8d>原町, 奈良市, 奈良県, 6308271, 日本" building university 0.001 日本 FALSE
+mathematical society jp Asia Eastern Asia FALSE 1 2021-02-03 64702547 node "日本数å¦ä¼š, 8, 蔵å‰<8d>橋通り, å<8f>°æ<9d>±äºŒä¸<81>ç›®, å<8f>°æ<9d>±åŒº, æ<9d>±äº¬éƒ½, 110-0006, 日本" office association 0.001 日本 FALSE
+meijo university jp Asia Eastern Asia FALSE 1 2021-02-03 128174721 way "å<90><8d>城大å¦, 飯田街é<81>“, 天白区, å<90><8d>å<8f>¤å±‹å¸‚, 愛知県, 468-8503, 日本" amenity university 0.445726149027095 日本 FALSE
+merck & company jp Asia Eastern Asia FALSE 1 2021-02-03 218371594 way "Merck, ã<81>„ã‚<8f>ã<81><8d>市, ç¦<8f>島県, 日本" landuse industrial 0.3 日本 FALSE
+meteorological agency jp Asia Eastern Asia FALSE 1 2021-02-03 258888416 relation "気象åº<81>, å†…å €é€šã‚Š, 大手町1, 大手町, 神田, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0004, 日本" building public 0.528920419784088 日本 FALSE
+mext jp Asia Eastern Asia FALSE 1 2021-02-03 50358605 node "文部科å¦çœ<81>, 桜田通り, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" office government 0.541445598310702 日本 FALSE
+ministry of foreign affairs jp Asia Eastern Asia FALSE 1 2021-02-03 14859293 node "外務çœ<81>, 霞ヶ関å<9d>‚, 霞ヶ関2, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.545769418466942 日本 FALSE
+ministry of the environment jp Asia Eastern Asia FALSE 1 2021-02-03 123742322 way "環境çœ<81>, ç¥<9d>田通り, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" amenity public_building 0.508986391392961 日本 FALSE
+monju jp Asia Eastern Asia FALSE 1 2021-02-03 164574010 way "ã‚‚ã‚“ã<81>˜ã‚…, 宮津養父線, å—æ<9d>‰æœ«, 宮津市, 京都府, 626-0001, 日本" building transportation 0.322405775434826 日本 FALSE
+nara jp Asia Eastern Asia FALSE 1 2021-02-03 258244510 relation "奈良県, 日本" boundary administrative 0.611235608420169 日本 FALSE
+national aerospace laboratory jp Asia Eastern Asia FALSE 1 2021-02-03 788177 node "èˆªç©ºå®‡å®™æŠ€è¡“ç ”ç©¶æ‰€, 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 181-8555, 日本" highway traffic_signals 0.001 日本 FALSE
+national cerebral and cardiovascular center jp Asia Eastern Asia FALSE 1 2021-02-03 196010585 way "å›½ç«‹å¾ªç’°å™¨ç—…ç ”ç©¶ã‚»ãƒ³ã‚¿ãƒ¼, 1, 豊ä¸å²¸éƒ¨ç·š, 岸部新町, å<90>¹ç”°å¸‚, 大阪府, 564-8565, 日本" amenity hospital 0.001 日本 FALSE
+national council for science and technology jp Asia Eastern Asia FALSE 1 2021-02-03 14641777 node "ç·<8f>å<90>ˆç§‘å¦æŠ€è¡“会è°, å…本木通り, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.001 日本 FALSE
+national institute for environmental studies jp Asia Eastern Asia FALSE 1 2021-02-03 118729145 way "å›½ç«‹ç’°å¢ƒç ”ç©¶æ‰€, å¦åœ’西大通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0053, 日本" amenity research_institute 0.385200970199076 日本 FALSE
+national institute for materials science jp Asia Eastern Asia FALSE 1 2021-02-03 118354285 way "物質・æ<9d><90>æ–™ç ”ç©¶æ©Ÿæ§‹, 1, ã<81>¤ã<81><8f>ã<81>°å…¬åœ’通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0047, 日本" office research 0.367391061753173 日本 FALSE
+national institute for materials science in tsukuba jp Asia Eastern Asia FALSE 1 2021-02-03 118354285 way "物質・æ<9d><90>æ–™ç ”ç©¶æ©Ÿæ§‹, 1, ã<81>¤ã<81><8f>ã<81>°å…¬åœ’通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0047, 日本" office research 0.367391061753173 日本 FALSE
+national science and technology library jp Asia Eastern Asia FALSE 1 2021-02-03 130023176 way "ç<90>†ç³»å›³æ›¸é¤¨, ä¹<9d>大ゲートブリッジ, 西区, ç¦<8f>岡市, ç¦<8f>岡県, 819−0395, 日本" amenity library 0.001 日本 FALSE
+nature astronomy jp Asia Eastern Asia FALSE 1 2021-02-03 183168113 way "ã<81>¡ã<81>¯ã‚„星ã<81>¨è‡ªç„¶ã<81>®ãƒŸãƒ¥ãƒ¼ã‚¸ã‚¢ãƒ , 金剛山é<81>Šæ©é<81>“, å<8d>ƒæ—©èµ¤é˜ªæ<9d>‘, å<8d>—河内郡, 大阪府, 5850051, 日本" tourism museum 0.001 日本 FALSE
+nect jp Asia Eastern Asia FALSE 1 2021-02-03 79692993 node "salon Lie-nect, 上尾白岡線, 伊奈町, 北足立郡, 埼玉県, 362-0806, 日本" shop hairdresser 0.101 日本 FALSE
+nihon jp Asia Eastern Asia FALSE 1 2021-02-03 258446007 relation 日本 boundary administrative 0.871013326546246 日本 FALSE
+npc jp Asia Eastern Asia FALSE 1 2021-02-03 216467228 way "NPC, æ<9d>±æ<9d>¾å±±å<81>œè»Šå ´ç·š, ç®å¼“町1, æ<9d>±æ<9d>¾å±±å¸‚, 埼玉県, 355-0014, 日本" amenity parking 0.101 日本 FALSE
+nuclear regulation authority jp Asia Eastern Asia FALSE 1 2021-02-03 51874808 node "原å<90>力è¦<8f>制委員会, 9, 御組å<9d>‚, å…本木一ä¸<81>ç›®, å…本木, 麻布, 港区, æ<9d>±äº¬éƒ½, 106-8487, 日本" office government 0.001 日本 FALSE
+nuclear safety commission jp Asia Eastern Asia FALSE 1 2021-02-03 14941318 node "原å<90>力安全委員会, 三年å<9d>‚, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.001 日本 FALSE
+obama white house jp Asia Eastern Asia FALSE 1 2021-02-03 258672713 relation "å°<8f>浜市, ç¦<8f>井県, 日本" boundary administrative 0.449107677186954 日本 FALSE
+oita university jp Asia Eastern Asia FALSE 1 2021-02-03 120859745 way "大分大å¦æ—¦é‡ŽåŽŸã‚ャンパス, 国é<81>“10å<8f>·, 大分市, 大分県, 870-0854, 日本" amenity university 0.001 日本 FALSE
+osaka city university jp Asia Eastern Asia FALSE 1 2021-02-03 22182825 node "市立大å¦å‰<8d>, Mediacenter, ä½<8f>å<90>‰åŒº, 大阪市, 大阪府, 558-0022, 日本" highway bus_stop 0.001 日本 FALSE
+red cross hospital jp Asia Eastern Asia FALSE 1 2021-02-03 45442138 node "赤å<8d><81>å—病院å‰<8d>, æ<9d>¾å±±å¸‚é<81>“ 鮒屋町è·å›½ç¥žç¤¾å‰<8d>ç·š, 平和通一ä¸<81>ç›®, 西一万町, æ<9d>¾å±±å¸‚, 愛媛県, 790-0825, 日本" railway tram_stop 0.267719150556049 日本 FALSE
+riken brain institute jp Asia Eastern Asia FALSE 1 2021-02-03 151778643 way "脳科å¦ç·<8f>å<90>ˆç ”究センター æ<9d>±æ£Ÿ, 新座ãƒ<90>イパス, 和光市, 埼玉県, 351-0106, 日本" building yes 0.001 日本 FALSE
+saitama university jp Asia Eastern Asia FALSE 1 2021-02-03 139990167 way "埼玉大å¦, ã<81>•ã<81>„ã<81>Ÿã<81>¾é´»å·£ç·š, 桜区, ã<81>•ã<81>„ã<81>Ÿã<81>¾å¸‚, 埼玉県, 338-0835, 日本" amenity university 0.001 日本 FALSE
+sakurada jp Asia Eastern Asia FALSE 1 2021-02-03 123818427 way "桜田門, å†…å €é€šã‚Š, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" historic city_gate 0.29350420583069 日本 FALSE
+sapporo medical university jp Asia Eastern Asia FALSE 1 2021-02-03 129721276 way "æœå¹ŒåŒ»ç§‘大å¦, ç¦<8f>ä½<8f>桑園通, å<8d>—1æ<9d>¡è¥¿9, ä¸å¤®åŒº, æœå¹Œå¸‚, 石狩振興局, 北海é<81>“, 060-8556, 日本" amenity university 0.406681943714513 日本 FALSE
+sdo jp Asia Eastern Asia FALSE 1 2021-02-03 108898337 way "ä½<90>渡空港, 両津広域農é<81>“, 秋津, ä½<90>渡市, 新潟県, 952-0006, 日本" aeroway aerodrome 0.40710035943812 日本 FALSE
+shen neng jp Asia Eastern Asia FALSE 1 2021-02-03 83114350 node "神能,輪æ¥, 日高å·<9d>島線, å<9d>‚戸市, 埼玉県, 350-2222, 日本" shop bicycle 0.001 日本 FALSE
+shinshu university jp Asia Eastern Asia FALSE 1 2021-02-03 58242149 node "Shinshu University, 国é<81>“292å<8f>·, å¹³ç©<8f>, 山ノ内町, 下高井郡, 長野県, 381-0401, 日本" highway bus_stop 0.201 日本 FALSE
+tamagawa jp Asia Eastern Asia FALSE 1 2021-02-03 258585111 relation "多摩å·<9d>, 神奈å·<9d>県, 198-0212, 日本" waterway river 0.450854461294197 日本 FALSE
+tokai university in hiratsuka jp Asia Eastern Asia FALSE 1 2021-02-03 104165416 way "æ<9d>±æµ·å¤§å¦ 湘å<8d>—ã‚ャンパス, 1, 北門通り, 平塚市, 神奈å·<9d>県, 259-1292, 日本" amenity university 0.001 日本 FALSE
+tokushima university jp Asia Eastern Asia FALSE 1 2021-02-03 37840846 node "大å¦å‰<8d>, å<90>‰é‡Žå·<9d>ãƒ<90>イパス, 徳島市, 徳島県, 770-8571, 日本" highway bus_stop 0.001 日本 FALSE
+tokyo electric power company jp Asia Eastern Asia FALSE 1 2021-02-03 121819030 way "æ<9d>±äº¬é›»åŠ›æ¸‹è°·æ”¯ç¤¾, ファイアー通り, 神å<8d>—一ä¸<81>ç›®, 渋谷区, æ<9d>±äº¬éƒ½, 150-8334, 日本" building yes 0.001 日本 FALSE
+tokyo metropolitan assembly jp Asia Eastern Asia FALSE 1 2021-02-03 940456 node "è°äº‹å ‚å<8d>—, å<8d>—通り, 西新宿二ä¸<81>ç›®, 新宿区, æ<9d>±äº¬éƒ½, 163-8001, 日本" highway traffic_signals 0.001 日本 FALSE
+tokyo university of agriculture jp Asia Eastern Asia FALSE 1 2021-02-03 104451530 way "æ<9d>±äº¬è¾²æ¥å¤§å¦, å<8d>ƒæ³é€šã‚Š, çµŒå ‚4, 船橋, 世田谷区, æ<9d>±äº¬éƒ½, 156-0054, 日本" amenity university 0.476564468003337 日本 FALSE
+tokyo university of agriculture and technology jp Asia Eastern Asia FALSE 1 2021-02-03 129699576 way "æ<9d>±äº¬è¾²å·¥å¤§å¦, 下山谷通り, ä¸ç”º, å°<8f>金井市, æ<9d>±äº¬éƒ½, 184-0012, 日本" amenity university 0.001 日本 FALSE
+toyohashi university of technology jp Asia Eastern Asia FALSE 1 2021-02-03 108255102 way "豊橋技術科å¦å¤§å¦, å°<8f>æ<9d>¾åŽŸå°<8f>æ± ç·š, 天伯町, 豊橋市, 愛知県, 441-8115, 日本" amenity university 0.411679724670082 日本 FALSE
+trade and innovation jp Asia Eastern Asia FALSE 1 2021-02-03 65049975 node "Trade Next Standard Innovation, 黒田庄多井田線, æ<9d>¿æ³¢ç”º, 西脇市, 兵庫県, 日本" shop car 0.301 日本 FALSE
+university museum of the university of tokyo jp Asia Eastern Asia FALSE 1 2021-02-03 122005976 way "æ<9d>±äº¬å¤§å¦ç·<8f>å<90>ˆç ”究å<8d>šç‰©é¤¨, æ£èµ¤é€šã‚Š, 本郷五ä¸<81>ç›®, 文京区, æ<9d>±äº¬éƒ½, 113-0033, 日本" tourism museum 0.323710213530857 日本 FALSE
+university of hokkaido jp Asia Eastern Asia FALSE 1 2021-02-03 128417717 way "北海é<81>“大å¦, 環状通, 北14æ<9d>¡æ<9d>±7, æ<9d>±åŒº, æœå¹Œå¸‚, 石狩振興局, 北海é<81>“, 060-0808, 日本" amenity university 0.525438377157725 日本 FALSE
+university of kyoto jp Asia Eastern Asia FALSE 1 2021-02-03 128750307 way "äº¬éƒ½å¤§å¦ åŒ—éƒ¨æ§‹å†…, 志賀越é<81>“, 北白å·<9d>ä¹…ä¿<9d>田町, 左京区, 京都市, 京都府, 606-8276, 日本" amenity university 0.57959701929309 日本 FALSE
+university of the ryukyus jp Asia Eastern Asia FALSE 1 2021-02-03 107343763 way "ç<90>‰ç<90>ƒå¤§å¦, 宜野湾西原線, 内間, 西原町, ä¸é 郡, 沖縄県, 903-0121, 日本" amenity university 0.468090947740774 日本 FALSE
+university of yamanashi jp Asia Eastern Asia FALSE 1 2021-02-03 158492717 way "å¸<9d>京科å¦å¤§å¦æ<9d>±äº¬è¥¿ã‚ャンパス, ä¸å¤®è‡ªå‹•è»Šé<81>“, 上野原市, 山梨県, 日本" amenity university 0.428807256594898 日本 FALSE
+wakayama university jp Asia Eastern Asia FALSE 1 2021-02-03 127282447 way "å’ŒæŒå±±å¤§å¦, 1ã‚ãƒå<9d>‚, æ „è°·, å’ŒæŒå±±å¸‚, å’ŒæŒå±±çœŒ, 640-8511, 日本" amenity university 0.001 日本 FALSE
+waseda university jp Asia Eastern Asia FALSE 1 2021-02-03 194562447 way "æ—©ç¨²ç”°å¤§å¦ åŒ—ä¹<9d>å·žã‚ャンパス, 2-2, 有毛引野線, è‹¥æ<9d>¾åŒº, 北ä¹<9d>州市, ç¦<8f>岡県, 808-0135, 日本" amenity university 0.001 日本 FALSE
+xfel jp Asia Eastern Asia FALSE 1 2021-02-03 103594598 way "XFEL, 上郡末広線, 光都二ä¸<81>ç›®, éž<8d>å±…, 上郡町, 赤穂郡, 兵庫県, 日本" building yes 0.101 日本 FALSE
+xiap jp Asia Eastern Asia FALSE 1 2021-02-03 132243075 way "地下P入路, ç ‚å±±ç”º, ä¸åŒº, 浜æ<9d>¾å¸‚, é<9d>™å²¡çœŒ, 430-0926, 日本" highway service 0.075 日本 FALSE
+yokohama city university jp Asia Eastern Asia FALSE 1 2021-02-03 110892089 way "横浜市立大å¦, æ<9d>±è¥¿è‡ªç”±é€šè·¯ 西å<81>´éšŽæ®µ, 柳町, 金沢区, 横浜市, 神奈å·<9d>県, 231-0017, 日本" amenity university 0.443549060892257 日本 FALSE
+yuan jp Asia Eastern Asia FALSE 1 2021-02-03 297445876 node "原, 原å<81>œè»Šå ´ç·š, 沼津市, é<9d>™å²¡çœŒ, 410-0312, 日本" railway station 0.364463378933884 日本 FALSE
+ama jo Asia Western Asia FALSE 1 2021-02-03 16241175 node "عمان, 2062, الأردن" place city 0.610035786199553 الأردن FALSE
+four seasons hotel jo Asia Western Asia FALSE 1 2021-02-03 138307414 way "Four Seasons Hotel, شارع البصرة, ام اذينة الشرقي, عمان, 11195, الأردن" tourism hotel 0.750443028528829 الأردن FALSE
+jordan university of science and technology jo Asia Western Asia FALSE 1 2021-02-03 148655079 way "Jordan University of Science and Technology, Betra St, إربد‎, إربد, الأردن" amenity university 0.601 الأردن FALSE
+wadi rum jo Asia Western Asia FALSE 1 2021-02-03 149386364 way "وادي رم, العقبة, الأردن" natural desert 0.408010995739962 الأردن FALSE
+maytals jm Americas Caribbean FALSE 1 2021-02-03 139033445 way "Maytals Crescent, Cooreville Gardens, Saint Andrew, Surrey County, 20, Jamaica" highway residential 0.2 Jamaica FALSE
+durrell wildlife conservation trust je Europe Northern Europe FALSE 1 2021-02-03 129612064 way "Jersey Zoo, La Profonde Rue, Trinity, JE3 5BP, Jersey" tourism zoo 0.30922699466609 Jersey FALSE
+abr it Europe Southern Europe FALSE 1 2021-02-03 258290208 relation "Abruzzo, Italia" boundary administrative 0.755885514368911 Italia FALSE
+adria it Europe Southern Europe FALSE 1 2021-02-03 257700491 relation "Adria, Rovigo, Veneto, 45011, Italia" boundary administrative 0.58739021265696 Italia FALSE
+aetna it Europe Southern Europe FALSE 1 2021-02-03 241820 node "Etna, Maletto, Catania, Sicilia, Italia" natural volcano 0.547928846167033 Italia FALSE
+allea it Europe Southern Europe FALSE 1 2021-02-03 224399555 way "Largo Luigi Sante Colonna, Sacro Cuore, Novara, Piemonte, 28100, Italia" highway tertiary 0.1 Italia FALSE
+ari it Europe Southern Europe FALSE 1 2021-02-03 257982588 relation "Ari, Chieti, Abruzzo, Italia" boundary administrative 0.588735462120359 Italia FALSE
+asce it Europe Southern Europe FALSE 1 2021-02-03 50299980 node "Sc'é, Dalico, Chiuro, Comunità Montana della Valtellina di Sondrio, Sondrio, Lombardia, 23026, Italia" place locality 0.125 Italia FALSE
+aurora cannabis it Europe Southern Europe FALSE 1 2021-02-03 299833705 way "Cannabis, Livorno, Toscana, 57128, Italia" highway path 0.175 Italia FALSE
+baselga it Europe Southern Europe FALSE 1 2021-02-03 257765077 relation "Baselga di Piné, Comunità Alta Valsugana e Bersntol, Provincia di Trento, Trentino-Alto Adige/Südtirol, 38042, Italia" boundary administrative 0.610764750724671 Italia FALSE
+cal it Europe Southern Europe FALSE 1 2021-02-03 258205142 relation "Calabria, Italia" boundary administrative 0.767103527755831 Italia FALSE
+candiolo cancer institute it Europe Southern Europe FALSE 1 2021-02-03 100915781 way "Istituto per la Ricerca e la Cura del Cancro Candiolo (IRCCS), SP142, Candiolo, Torino, Piemonte, Italia" amenity hospital 0.101 Italia FALSE
+casa sollievo it Europe Southern Europe FALSE 1 2021-02-03 73520663 node "Casa Sollievo, Due Torri 3 Perpendicolare, Due Torri, Fiumarella, Milazzo, Messina, Sicilia, 98057, Italia" amenity social_facility 0.201 Italia FALSE
+ceres it Europe Southern Europe FALSE 1 2021-02-03 257753212 relation "Ceres, Unione Montana di Comuni delle Valli di Lanzo, Ceronda e Casternone, Torino, Piemonte, Italia" boundary administrative 0.633997464448559 Italia FALSE
+ceva it Europe Southern Europe FALSE 1 2021-02-03 257748591 relation "Ceva, Cuneo, Piemonte, 12073, Italia" boundary administrative 0.645044323052155 Italia FALSE
+civil protection it Europe Southern Europe FALSE 1 2021-02-03 7407617 node "Sede Protezione Civile, 4, Via delle Gambarare, San Tommaso, Soleschiano, Vermegliano, Ronchi dei Legionari, UTI Carso Isonzo Adriatico / MTU Kras SoÄ<8d>a Jadran, Friuli Venezia Giulia, 34077, Italia" building public 0.101 Italia FALSE
+cmv it Europe Southern Europe FALSE 1 2021-02-03 129267416 way "CMV, Via Baldassarre Malamini, Zona Industriale Cento 2000, Cento, Unione Alto Ferrarese, Ferrara, Emilia-Romagna, 44042, Italia" building yes 0.101 Italia FALSE
+consert it Europe Southern Europe FALSE 1 2021-02-03 217849481 way "ConserT srl, Cavaione, Truccazzano, Milano, Lombardia, Italia" landuse industrial 0.3 Italia FALSE
+continental africa it Europe Southern Europe FALSE 1 2021-02-03 59058346 node "Africa, Monteveglio Alto, Monteveglio, Valsamoggia, Unione dei comuni Valli del Reno, Lavino e Samoggia, Bologna, Emilia-Romagna, 40053, Italia" place locality 0.225 Italia FALSE
+cornare it Europe Southern Europe FALSE 1 2021-02-03 15654248 node "Cornarè, Mansuè, Treviso, Veneto, 31018, Italia" place hamlet 0.25 Italia FALSE
+cosac it Europe Southern Europe FALSE 1 2021-02-03 179535513 way "Vicolo Cosac, Carvacco, Vendoglio, Treppo Grande, UTI Collinare, Friuli Venezia Giulia, Italia" highway residential 0.2 Italia FALSE
+cossa it Europe Southern Europe FALSE 1 2021-02-03 13413104 node "Cossa, Via Vittorio Asinari di Bernezzo, Parella, Circoscrizione 4, Torino, Piemonte, 10146, Italia" highway bus_stop 0.101 Italia FALSE
+cs it Europe Southern Europe FALSE 1 2021-02-03 257689055 relation "Cosenza, Calabria, Italia" boundary administrative 0.62816937725518 Italia FALSE
+cta it Europe Southern Europe FALSE 1 2021-02-03 103730268 way "Aeroporto di Catania Fontanarossa, Via Filippo Eredia, Villaggio Santa Maria Goretti, San Giorgio-Librino-San Giuseppe la Rena-Zia Lisa-Villaggio Sant'Agata, Catania, Sicilia, 95121, Italia" aeroway aerodrome 0.452592978117187 Italia FALSE
+di ferranti it Europe Southern Europe FALSE 1 2021-02-03 14645919 node "Ferranti, Strada Provinciale 502 di Cingoli, Savignano, Caccamo, Serrapetrona, Macerata, Marche, Italia" tourism hotel 0.201 Italia FALSE
+di maio it Europe Southern Europe FALSE 1 2021-02-03 61053488 node "Di Maio, Piazza Noce, Uditore, V Circoscrizione, Palermo, Sicilia, 90135, Italia" shop bakery 0.201 Italia FALSE
+eia it Europe Southern Europe FALSE 1 2021-02-03 3653571 node "Eia, Golese, Parma, Emilia-Romagna, 43126, Italia" place hamlet 0.526719844716193 Italia FALSE
+etna it Europe Southern Europe FALSE 1 2021-02-03 241820 node "Etna, Maletto, Catania, Sicilia, Italia" natural volcano 0.647928846167033 Italia FALSE
+famiglia cristiana it Europe Southern Europe FALSE 1 2021-02-03 119137909 way "Via Famiglia Cristiana, Sicomo, Mazara del Vallo, Trapani, Sicilia, 91026, Italia" highway residential 0.3 Italia FALSE
+fera it Europe Southern Europe FALSE 1 2021-02-03 12359963 node "Il Ferà , Cuneo, Piemonte, Italia" natural peak 0.3 Italia FALSE
+fgf it Europe Southern Europe FALSE 1 2021-02-03 15408539 node "FGF, 12, Piazza Insurrezione, Isola San Giacomo, Padova, Veneto, 35149, Italia" shop clothes 0.101 Italia FALSE
+forza italia it Europe Southern Europe FALSE 1 2021-02-03 49634864 node "Forza Italia, 3, Via del Borgo Antico, Centro, Gallarate, Varese, Lombardia, 21013, Italia" office political_party 0.201 Italia FALSE
+gavi it Europe Southern Europe FALSE 1 2021-02-03 258404642 relation "Gavi, Alessandria, Piemonte, 15066, Italia" boundary administrative 0.626348589615649 Italia FALSE
+gsk vaccines it Europe Southern Europe FALSE 1 2021-02-03 259248267 relation "GSK Vaccines, Petriccio, Siena, Toscana, Italia" landuse industrial 0.4 Italia FALSE
+huvepharma it Europe Southern Europe FALSE 1 2021-02-03 159437631 way "Huvepharma (ex Sanofi), Garessio, Cuneo, Piemonte, Italia" landuse industrial 0.3 Italia FALSE
+ibl it Europe Southern Europe FALSE 1 2021-02-03 108832964 way "IBL, Cavallino, Coniolo, Alessandria, Piemonte, Italia" landuse industrial 0.3 Italia FALSE
+ictp it Europe Southern Europe FALSE 1 2021-02-03 99444447 way "ICTP Galileo Guesthouse, 7, Via Beirut, Roiano-Gretta-Barcola-Cologna-Scorcola, Miramare / Miramar, Trieste, UTI Giuliana / Julijska MTU, Friuli Venezia Giulia, 34151, Italia" building university 0.101 Italia FALSE
+imt it Europe Southern Europe FALSE 1 2021-02-03 258348177 relation "Campus IMT, 19, Piazza San Francesco, San Concordio, Lucca, Toscana, 55100, Italia" building school 0.443892137025745 Italia FALSE
+inaf it Europe Southern Europe FALSE 1 2021-02-03 113942153 way "La Specola, 5, Vicolo dell'Osservatorio, San Giuseppe, Padova, Veneto, 35141, Italia" tourism attraction 0.258218474293395 Italia FALSE
+ingv it Europe Southern Europe FALSE 1 2021-02-03 105415909 way "Istituto Nazionale di Geofisica e Vulcanologia, 605, Via di Vigna Murata, Quartiere XX Ardeatino, Roma, Roma Capitale, Lazio, 00143, Italia" amenity research_institute 0.312795139465266 Italia FALSE
+istituto di astrofisica it Europe Southern Europe FALSE 1 2021-02-03 96661608 way "INAF - Istituto Nazionale di AstroFisica, Viale Professor Cesare Sanfilippo, Picanello-Ognina-Barriera-Canalicchio, Catania, Sicilia, 95123, Italia" building university 0.574532111506442 Italia FALSE
+la repubblica it Europe Southern Europe FALSE 1 2021-02-03 2308014 node "Repubblica, Piazza della Repubblica, Municipio Roma I, Roma, Roma Capitale, Lazio, 00184, Italia" railway station 0.563961619858331 Italia FALSE
+legambiente it Europe Southern Europe FALSE 1 2021-02-03 67713400 node "Legambiente, Piazzetta San Giovanni dal Fosso, Perugia, Umbria, 06122, Italia" office association 0.101 Italia FALSE
+mar it Europe Southern Europe FALSE 1 2021-02-03 257717754 relation "Marche, Italia" boundary administrative 0.753750462851578 Italia FALSE
+mol it Europe Southern Europe FALSE 1 2021-02-03 256848066 relation "Molise, Italia" boundary administrative 0.73612097112061 Italia FALSE
+mosaico it Europe Southern Europe FALSE 1 2021-02-03 44551556 node "Mosaico, Via Tito Livio, San Leonardo, Larino, Campobasso, Molise, 86035, Italia" tourism attraction 0.377334066701962 Italia FALSE
+mose it Europe Southern Europe FALSE 1 2021-02-03 2517979 node "Mosè, 4/a, Piazza di San Pietro in Vincoli, Rione I Monti, Municipio Roma I, Roma, Roma Capitale, Lazio, 00184, Italia" tourism artwork 0.427503445679354 Italia FALSE
+national front it Europe Southern Europe FALSE 1 2021-02-03 257702157 relation "Front, Torino, Piemonte, Italia" boundary administrative 0.628491408781471 Italia FALSE
+national institute of statistics it Europe Southern Europe FALSE 1 2021-02-03 69505825 node "ISTAT Ufficio Regionale Toscana, 80, Via dell'Agnolo, San Niccolò, Quartiere 1, Firenze, Toscana, 50122, Italia" office research 0.703323682867195 Italia FALSE
+nokia bell labs it Europe Southern Europe FALSE 1 2021-02-03 202583074 way "Nokia Bell Labs, Via Energy Park, Segro Energy Park, Torri Bianche, Vimercate, Monza e della Brianza, Lombardia, 20871, Italia" building yes 0.301 Italia FALSE
+numonyx it Europe Southern Europe FALSE 1 2021-02-03 33774179 node "Via Alfredo Agosta f/te Numonyx, Via Alfredo Agosta, San Giorgio-Librino-San Giuseppe la Rena-Zia Lisa-Villaggio Sant'Agata, Catania, Sicilia, 95121, Italia" highway bus_stop 0.101 Italia FALSE
+palermo it Europe Southern Europe FALSE 1 2021-02-03 258312426 relation "Palermo, Sicilia, Italia" boundary administrative 0.756114817144791 Italia FALSE
+parma it Europe Southern Europe FALSE 1 2021-02-03 257214446 relation "Parma, Emilia-Romagna, Italia" boundary administrative 0.725573424016841 Italia FALSE
+people nih it Europe Southern Europe FALSE 1 2021-02-03 50769806 node "People, Piazza dell'Olmo, Terni, Umbria, 05100, Italia" amenity bar 0.101 Italia FALSE
+piper it Europe Southern Europe FALSE 1 2021-02-03 24253230 node "Monte Piper, Dogna, UTI del Canal del Ferro - Val Canale, Friuli Venezia Giulia, Italia" natural peak 0.4 Italia FALSE
+procter & gamble it Europe Southern Europe FALSE 1 2021-02-03 107973245 way "100, Procter & Gamble, Santa Palomba, Pomezia, Roma Capitale, Lazio, 00040, Italia" landuse industrial 0.4 Italia FALSE
+pz it Europe Southern Europe FALSE 1 2021-02-03 256841560 relation "Potenza, Basilicata, Italia" boundary administrative 0.623700593766485 Italia FALSE
+sapienza university it Europe Southern Europe FALSE 1 2021-02-03 93614288 way "Sapienza Università di Roma, Piazzale del Verano, San Lorenzo, Municipio Roma II, Roma, Roma Capitale, Lazio, 00161, Italia" amenity university 0.646633621782453 Italia FALSE
+sar it Europe Southern Europe FALSE 1 2021-02-03 259005837 relation "Sardegna, Italia" boundary administrative 0.784794769506041 Italia FALSE
+sca it Europe Southern Europe FALSE 1 2021-02-03 226340670 way "Sca, Montaretto, Bonassola, La Spezia, Liguria, Italia" natural beach 0.3 Italia FALSE
+sissa it Europe Southern Europe FALSE 1 2021-02-03 256792 node "Sissa, Sissa Trecasali, Parma, Emilia-Romagna, 43018, Italia" place village 0.549149847834766 Italia FALSE
+slow food italy it Europe Southern Europe FALSE 1 2021-02-03 55351950 node "Slow Food Godo e Bassa Romagna, 17, Via della Chiesa, Villanova di Bagnacavallo, Bagnacavallo, Unione dei comuni della Bassa Romagna, Ravenna, Emilia-Romagna, 48012, Italia" office association 0.201 Italia FALSE
+united nations world food programme it Europe Southern Europe FALSE 1 2021-02-03 119517457 way "United Nations World Food Programme, Brindisi, Puglia, Italia" landuse military 0.7 Italia FALSE
+university of bergamo it Europe Southern Europe FALSE 1 2021-02-03 145293897 way "Università degli Studi di Bergamo, Via dei Caniana, Finazzi, San Tommaso, Grumellina, Bergamo, Lombardia, 24122, Italia" amenity university 0.508338828424476 Italia FALSE
+university of cagliari it Europe Southern Europe FALSE 1 2021-02-03 49358856 node "Scuola Universitaria per Mediatori Linguistici, Via Abruzzi, San Michele, Pirri, Cagliari - Casteddu, Cagliari, Sardegna, 09122, Italia" amenity university 0.101 Italia FALSE
+university of catania it Europe Southern Europe FALSE 1 2021-02-03 259056568 relation "Università degli Studi di Catania - Dipartimento di Giurisprudenza, Picanello-Ognina-Barriera-Canalicchio, Catania, Sicilia, Italia" amenity university 0.565624057571395 Italia FALSE
+university of insubria it Europe Southern Europe FALSE 1 2021-02-03 104135116 way "Università degli Studi dell'Insubria, Piazza della Repubblica, Motta, Giubiano, Biumo Superiore, Varese, Lombardia, Italia" amenity university 0.495276863807175 Italia FALSE
+university of milan bicocca it Europe Southern Europe FALSE 1 2021-02-03 44257894 node "University Bar, 13, Via Luigi Pulci, Bicocca, Municipio 9, Milano, Lombardia, 20162, Italia" amenity restaurant 0.301 Italia FALSE
+university of milan-bicocca it Europe Southern Europe FALSE 1 2021-02-03 44257894 node "University Bar, 13, Via Luigi Pulci, Bicocca, Municipio 9, Milano, Lombardia, 20162, Italia" amenity restaurant 0.301 Italia FALSE
+university of rome it Europe Southern Europe FALSE 1 2021-02-03 104579427 way "Pontificia Università Gregoriana, 4, Piazza della Pilotta, Rione II Trevi, Municipio Roma I, Roma, Roma Capitale, Lazio, 00187, Italia" amenity university 0.553259727348553 Italia FALSE
+university of valle it Europe Southern Europe FALSE 1 2021-02-03 104135116 way "Università degli Studi dell'Insubria, Piazza della Repubblica, Motta, Giubiano, Biumo Superiore, Varese, Lombardia, Italia" amenity university 0.395276863807175 Italia FALSE
+university of venice it Europe Southern Europe FALSE 1 2021-02-03 258599724 relation "Venice International University, Viale Vittorio Veneto, Sant'Elena, Venezia-Murano-Burano, Lido, Venezia, Veneto, 30132, Italia" amenity university 0.507572334229807 Italia FALSE
+us marine it Europe Southern Europe FALSE 1 2021-02-03 257688159 relation "Marineo, Palermo, Sicilia, 90035, Italia" boundary administrative 0.569621885852042 Italia FALSE
+verona it Europe Southern Europe FALSE 1 2021-02-03 257258792 relation "Verona, Veneto, Italia" boundary administrative 0.746157388882853 Italia FALSE
+vimm it Europe Southern Europe FALSE 1 2021-02-03 121353519 way "VIMM, Via Giuseppe Orus, Stanga, Padova, Veneto, 35131, Italia" amenity public_building 0.101 Italia FALSE
+vlbi it Europe Southern Europe FALSE 1 2021-02-03 60295636 node "Antenna VLBI, SP5, Matera, Basilicata, 74013, Italia" man_made tower 0.101 Italia FALSE
+egs is Europe Northern Europe FALSE 1 2021-02-03 210808767 way "Egilsstaðaflugvöllur, Flugvallarvegur Egilsstöðum, Egilsstaðir, Múlaþing, Austurland, 700, Ã<8d>sland" aeroway aerodrome 0.328668254407684 Ã<8d>sland FALSE
+national earthquake center is Europe Northern Europe FALSE 1 2021-02-03 163994877 way "Skjálftasetrið, Akurgerði, Kópasker, Norðurþing, Norðurland eystra, 670, Ã<8d>sland" tourism museum 0.001 Ã<8d>sland FALSE
+perlan is Europe Northern Europe FALSE 1 2021-02-03 96152073 way "Perlan, 1, VarmahlÃð, HlÃðar, ReykjavÃkurborg, Höfuðborgarsvæðið, 105, Ã<8d>sland" tourism attraction 0.379354982157541 Ã<8d>sland FALSE
+reykjavik is Europe Northern Europe FALSE 1 2021-02-03 258385845 relation "ReykjavÃkurborg, Höfuðborgarsvæðið, Ã<8d>sland" boundary administrative 0.618605174933632 Ã<8d>sland FALSE
+agriculture organization ir Asia Southern Asia FALSE 1 2021-02-03 54642145 node "جهادکشاورزی استان آذربایجان شرقی, امیر کبیر, مرز Ù…Øله, لیلاوا, شهر تبریز, بخش مرکزی شهرستان تبریز, شهرستان تبریز, استان آذربایجان شرقی, 5183731665, ایران" office government 0.001 ایران FALSE
+cultural heritage ir Asia Southern Asia FALSE 1 2021-02-03 194900450 way "سازمان میراث Ù<81>رهنگی، صنایع دستی Ùˆ گردشگری, یکم, شهرک ملاصدرا, چهارصد دستگاه, شهر قزوین, مرز شهر قزوین, شهرستان قزوین, استان قزوین, چهار راه هشت بهشت, ایران" office yes 0.001 ایران FALSE
+energy research institute ir Asia Southern Asia FALSE 1 2021-02-03 100441310 way "مرکز تØقیقات وزارت نیرو, گلستان دوم, درختی, منطقه Û² شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1468763785, ایران" amenity university 0.001 ایران FALSE
+eni ir Asia Southern Asia FALSE 1 2021-02-03 43316866 node "اعنی, دهستان شوئیل, بخش رØیم آباد, شهرستان رودسر, استان گیلان, ایران" place village 0.275 ایران FALSE
+goodarzi ir Asia Southern Asia FALSE 1 2021-02-03 199464728 way "گودرزی, Ú©ÙˆÛŒ Ù<81>رهنگیان, شهر بروجرد, دهستان همت‌آباد, بخش مرکزی, شهرستان بروجرد, استان لرستان‎, 6915863614, ایران" highway residential 0.1 ایران FALSE
+hse ir Asia Southern Asia FALSE 1 2021-02-03 258618125 relation "استان هرمزگان, ایران" boundary administrative 0.571634966054199 ایران FALSE
+institute of agricultural resources ir Asia Southern Asia FALSE 1 2021-02-03 71510476 node "مرکز تØقیقات کشاورزی Ùˆ منابع‌طبیعی زابل, مرکز تØقیقات کشاورزی, دهستان قائم آباد, بخش مرکزی, شهرستان نیمروز, استان سیستان Ùˆ بلوچستان, 432, ایران" office research 0.001 ایران FALSE
+ira ir Asia Southern Asia FALSE 1 2021-02-03 258075432 relation ایران boundary administrative 0.824702703615226 ایران FALSE
+islamic azad university ir Asia Southern Asia FALSE 1 2021-02-03 66010042 node "دانشگاه آزاد اسلامی همدان, مرز دانشگاه آزاد اسلامی, شهر همدان, بخش مرکزی شهرستان همدان, شهرستان همدان, استان همدان, همدان, ایران" place neighbourhood 0.25 ایران FALSE
+islamic revolutionary guard corps ir Asia Southern Asia FALSE 1 2021-02-03 75598301 node "سپاه پاسدارن انقلاب اسلامی, شهید Ù<81>همیده, گرمی, دهستان انی, بخش مرکزی, شهرستان گرمی, استان اردبیل, ایران" office government 0.001 ایران FALSE
+kermanshah university of medical sciences ir Asia Southern Asia FALSE 1 2021-02-03 206194946 way "دانشگاه علوم پزشکی کرمانشاه, شاهمرادی, کرمانشاه, شهر کرمانشاه, بخش مرکزی, شهرستان کرمانشاه, استان کرمانشاه, 6714853559, ایران" amenity university 0.001 ایران FALSE
+nfl ir Asia Southern Asia FALSE 1 2021-02-03 52785808 node "Ù†Ù<81>Ù„, دهستان جایزان, بخش جایزان, شهرستان امیدیه, استان خوزستان, ایران" place hamlet 0.25 ایران FALSE
+niakan ir Asia Southern Asia FALSE 1 2021-02-03 197613717 way "نیاکان, پوریای ولی, شهر اصÙ<81>هان, بخش مرکزی شهرستان اصÙ<81>هان, شهرستان اصÙ<81>هان, استان اصÙ<81>هان, 8148745781, ایران" highway residential 0.1 ایران FALSE
+nsl ir Asia Southern Asia FALSE 1 2021-02-03 6151867 node "نسل, دهستان رزآب, بخش مرکزی, شهرستان سروآباد, استان کردستان, ایران" place village 0.281311730611622 ایران FALSE
+oic ir Asia Southern Asia FALSE 1 2021-02-03 227400895 way "OIEC, منطقه ۱ شهر تهران, شهر تجریش, بخش رودبار قصران, شهرستان شمیرانات, استان تهران, ایران" landuse commercial 0.2 ایران FALSE
+sharif university of technology ir Asia Southern Asia FALSE 1 2021-02-03 139885466 way "دانشگاه صنعتی شریÙ<81>, خیابان آزادی, زنجان شمالی, منطقه Û² شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1458744811, ایران" amenity university 0.430996300874427 ایران FALSE
+tehran university ir Asia Southern Asia FALSE 1 2021-02-03 259097888 relation "دانشگاه تهران, منطقه ۶ شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, ایران" boundary administrative 0.2 ایران FALSE
+tehran university of medical sciences ir Asia Southern Asia FALSE 1 2021-02-03 54623759 node "دانشگاه علوم پزشکی Ùˆ خدمات بهداشتی درمانی تهران, Û±Û¶ آذر, دانشگاه تهران, منطقه Û¶ شهر تهران, شهرداری تهران منطقه شش ناØیه سه, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1314665611, ایران" amenity university 0.383021208265432 ایران FALSE
+toshiba ir Asia Southern Asia FALSE 1 2021-02-03 259514382 relation "توشیبا, شهر رشت, بخش مرکزی شهرستان رشت, شهرستان رشت, استان گیلان, ایران" boundary administrative 0.2 ایران FALSE
+trp ir Asia Southern Asia FALSE 1 2021-02-03 45155123 node "ترپ, دهستان رودقات, بخش صوÙ<81>یان, شهرستان شبستر, استان آذربایجان شرقی, ایران" place village 0.325302870611459 ایران FALSE
+wsl ir Asia Southern Asia FALSE 1 2021-02-03 177714403 way "وصل, دزÙ<81>ول, شهر دزÙ<81>ول, بخش مرکزی, شهرستان دزÙ<81>ول, استان خوزستان, 009861, ایران" highway residential 0.1 ایران FALSE
+academic journals iq Asia Western Asia FALSE 1 2021-02-03 67750372 node "المركز الاكاديمي للنشر Ù<81>ÙŠ المجلات العالمية, باب المعظم, مدينة الطب, البلدية الرصاÙ<81>Ø©, بغداد, ناØية مرکز قضاء الرصاÙ<81>Ø©, قضاء الرصاÙ<81>Ø©, Ù…ØاÙ<81>ظة بغداد, 10047, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" amenity university 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+emergency response division iq Asia Western Asia FALSE 1 2021-02-03 69832805 node "شعبة استجابة الطوارئ, شارع الجمهورية, الØكيمية, ناØية مرکز قضاء البصرة, قضاء البصرة, Ù…ØاÙ<81>ظة البصرة, 99650, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" tourism artwork 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+higher institute of health iq Asia Western Asia FALSE 1 2021-02-03 247159587 way "Higher Institute of Health Professions, شەقامی بازاڕی مووسەڵا, Ú¯Û•Ú•Û•Ú©ÛŒ قازی Ù…Øەمەد, كركوك, ناØیەی ناوەندەکەی قەزای کەرکووک, قضاء كركوك / قەزای كەركووك, Ù…ØاÙ<81>ظة كركوك / پارێزگای کەرکووک, 36001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" office educational_institution 0.401 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+ministry of natural resources iq Asia Western Asia FALSE 1 2021-02-03 213588840 way "Ministry Of Natural Resources, Salahaddin, پارکی سامی عەبدولڕەØمان, هەولێر, ناØیەی ناوەندەکەی قەزای ھەولێر, قەزای ھەولێر, پارێزگای هەولێر, ‎هەرێمی کوردستان, 44001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" office government 0.401 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+national university of sciences and technology iq Asia Western Asia FALSE 1 2021-02-03 255577829 way "الجامعة الوطنية للعلوم والتكنولوجيا, شارع المرتضا, الÙ<81>داء, الناصرية, Ù…ØاÙ<81>ظة ذي قار, 64001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" amenity college 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+nwf iq Asia Western Asia FALSE 1 2021-02-03 24555027 node "نوÙ<81>, ناØية السنية, قضاء الديوانية, Ù…ØاÙ<81>ظة القادسية, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" place village 0.275 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+refugees international iq Asia Western Asia FALSE 1 2021-02-03 67638652 node "IFIR - Ù<81>یدراسیۆنی پەنابەران, 05, 412-5, Rizgari 412, سلێمانی, ناØیەی بەکرەجۆ, قەزای سلێمانی, ‎هەرێمی کوردستان, 46001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" office ngo 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+university of kurdistan iq Asia Western Asia FALSE 1 2021-02-03 69030276 node "زانکۆی سەلاØەددین-ھەولێر/ Ú©Û†Ù„ÛŽÚ˜ÛŒ ئەندازیاری بەشی ئەندازیاریی سەرچاوەکانی ئاو Ùˆ بەنداوو, شەقامی زانکۆ, زانکۆ ٣٤١, هەولێر, ناØیەی ناوەندەکەی قەزای ھەولێر, قەزای ھەولێر, پارێزگای هەولێر, ‎هەرێمی کوردستان, 44001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" amenity college 0.338041195081873 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+aaab in Asia Southern Asia FALSE 1 2021-02-03 38383655 node "aaab, NH45, Sadar, Jabalpur, Jabalpur Tahsil, Jabalpur, Madhya Pradesh, 482001, India" tourism museum 0.111 India FALSE
+actionaid in Asia Southern Asia FALSE 1 2021-02-03 47347601 node "ActionAid, Richmond Road, Craig Park Layout, Shantala Nagar, East Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, - 560095, India" office ngo 0.101 India FALSE
+agharkar research institute in Asia Southern Asia FALSE 1 2021-02-03 38271396 node "Agharkar Research Institute, Gopal Ganesh Agarkar Path, Deccan Gymkhana, Pune City, Pune District, Maharashtra, 411004, India" office educational_institution 0.301 India FALSE
+aiims in Asia Southern Asia FALSE 1 2021-02-03 75775290 node "All India Institute of Medical Sciences, Aurobindo Marg, Yusuf Sarai Market, Defence Colony Teshil, South East Delhi, Delhi, 110029, India" railway station 0.344585942469205 India FALSE
+aip in Asia Southern Asia FALSE 1 2021-02-03 59077197 node "Attippattu, Manali Ponneri Road, Edayanchavadi, Ward 15, Nappalayam, Vellaiveyil Chavadi, Ponneri, Thiruvallur District, Tamil Nadu, 600120, India" railway station 0.292441551930616 India FALSE
+akp in Asia Southern Asia FALSE 1 2021-02-03 10482569 node "Anakapalle, Anakapalle - Chodavaram Road, Anakapalle, Visakhapatnam, Andhra Pradesh, 531001, India" railway station 0.319018527529768 India FALSE
+ap in Asia Southern Asia FALSE 1 2021-02-03 258583657 relation "Andhra Pradesh, India" boundary administrative 0.6434753044048 India FALSE
+aries systems in Asia Southern Asia FALSE 1 2021-02-03 16414945 node "Aris Global Software Pvt Ltd., Krishnaraja Sagara Road, Kumbara Koppalu, Metagalli Industrial Area, Mysuru, Mysuru taluk, Mysuru district, Karnataka, 570016, India" building office 0.001 India FALSE
+ashoka university in Asia Southern Asia FALSE 1 2021-02-03 214685328 way "Ashoka University, Grand Trunk Road, Kundli Industrial Area, Rasoi, Sonipat, Haryana, 131029, India" amenity university 0.201 India FALSE
+astronomy & astrophysics in Asia Southern Asia FALSE 1 2021-02-03 113630721 way "Inter University Center for Astronomy & Astrophysics, Breman Chowk - Khadki Bazar Road, Mandalay Lines, Khadki, Pune City, Pune District, Maharashtra, 411007, India" building yes 0.201 India FALSE
+astrophysics institute in Asia Southern Asia FALSE 1 2021-02-03 99960273 way "Indian Institute of Astrophysics, Koramangala 2nd Block, Koramangala, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, India" boundary wall 0.589453166408414 India FALSE
+asv in Asia Southern Asia FALSE 1 2021-02-03 4568562 node "Asarva, Naroda ROad, Kalapi nagar, Ahmedabad, Ahmadabad City Taluka, Ahmedabad District, Gujarat, 380001, India" railway station 0.319711033684734 India FALSE
+atomic energy regulatory board in Asia Southern Asia FALSE 1 2021-02-03 300213241 relation "Atomic Energy Regulatory Board, V.N. Purav Marg, Govandi West, M/E Ward, Zone 5, Mumbai, Mumbai Suburban, Maharashtra, 400088, India" building yes 0.401 India FALSE
+azim premji university in Asia Southern Asia FALSE 1 2021-02-03 47600219 node "Azim Premji University, Service Road, Begur, Bommanahalli Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, 560 100, India" amenity university 0.569299555080491 India FALSE
+banaras hindu university in Asia Southern Asia FALSE 1 2021-02-03 65891789 node "काशी हिनà¥<8d>दू विशà¥<8d>वविदà¥<8d>यालय, Semi Circle Road 2, Karbirdas Colony, Varanasi, Uttar Pradesh, 221005, India" amenity college 0.001 India FALSE
+bar association in Asia Southern Asia FALSE 1 2021-02-03 47769764 node "Bar Association, Court Road, Paravur, Ernakulam district, Kerala, 683513, India" office association 0.201 India FALSE
+bhabha atomic research centre in Asia Southern Asia FALSE 1 2021-02-03 103414770 way "Bhabha Atomic Research Centre - BARC, M/E Ward, Zone 5, Mumbai, Mumbai Suburban, Maharashtra, India" landuse industrial 0.6 India FALSE
+bharat biotech in Asia Southern Asia FALSE 1 2021-02-03 146726935 way "biotech road, Clappana, Karunagappally, Kollam, Kerala, 690525, India" highway living_street 0.2 India FALSE
+bhaskaracharya college of applied sciences in Asia Southern Asia FALSE 1 2021-02-03 85536123 node "Bhaskaracharya College Of Applied Sciences, Nala Road, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110075, India" amenity college 0.501 India FALSE
+bhp in Asia Southern Asia FALSE 1 2021-02-03 18383797 node "Bolpur Santiniketan, NH114, Bolpur, Bolpur Sriniketan, Birbhum, West Bengal, 731204, India" railway station 0.33596057896493 India FALSE
+biocon in Asia Southern Asia FALSE 1 2021-02-03 74803996 node "Biocon, Joggers Ln, Veerasandra Industrial Estate, Anantnagar, Anekal, Bangalore Urban, Karnataka, 560100, India" office company 0.101 India FALSE
+bma in Asia Southern Asia FALSE 1 2021-02-03 82778948 node "Belmuri, Durgapur Expressway, Polba - Dadpur, Hugli, West Bengal, 712305, India" railway station 0.321743055077702 India FALSE
+bsp in Asia Southern Asia FALSE 1 2021-02-03 6684331 node "Bilaspur Junction, Bilaspur Bypass, Lalkhadan, Bilaspur, Bilaspur Tahsil, Bilaspur, Chhattisgarh, 495004, India" railway station 0.332141421099015 India FALSE
+cdm in Asia Southern Asia FALSE 1 2021-02-03 60122088 node "Chidambaram, Railway Feeder Road, Chidambaram, Cuddalore District, Tamil Nadu, 608001, India" railway station 0.328965278593994 India FALSE
+center for science in Asia Southern Asia FALSE 1 2021-02-03 78997138 node "Centre for science(aravindan sir), ITS, Karunagapally, Karunagappally, Kollam, Kerala, 690518, India" office educational_institution 0.201 India FALSE
+center for the study of science in Asia Southern Asia FALSE 1 2021-02-03 26344651 node "CSTEP, 10th Cross Road, Papanna Layout, Kodigehalli, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560094, India" office ngo 0.001 India FALSE
+central bureau of investigation in Asia Southern Asia FALSE 1 2021-02-03 253091618 way "Central Bureau Of Investigation, Road 3, Sector 7, Gandhinagar, Gandhinagar Taluka, Gandhinagar District, Gujarat, 382008, India" office yes 0.401 India FALSE
+central information commission in Asia Southern Asia FALSE 1 2021-02-03 173685766 way "Central Information Commission, Baba Gang Nath Marg, Vasant Vihar Tehsil, New Delhi, Delhi, 110 067, India" office government 0.301 India FALSE
+central news agency in Asia Southern Asia FALSE 1 2021-02-03 69050515 node "Central News Agency, Outer Circle, Connaught Place, Rakab Ganj, Chanakya Puri Tehsil, New Delhi, Delhi, 110001, India" shop books 0.301 India FALSE
+central pollution control board in Asia Southern Asia FALSE 1 2021-02-03 141460125 way "Pollution Control Board, Maharaj Surajmal Marg, Shahdara CBD, Vivek Vihar Tehsil, Shahdara, Delhi, 110051, India" building public 0.301 India FALSE
+centre for nanotechnology in Asia Southern Asia FALSE 1 2021-02-03 173998399 way "Center for Nanotechnology, CIS road, Ward 105 Gachibowli, Hyderabad, Serilingampalle mandal, Rangareddy, Telangana, 50046, India" building yes 0.201 India FALSE
+centre for scientific research in Asia Southern Asia FALSE 1 2021-02-03 134025877 way "Center for Scientific Research, Bliss Road, Annainagar, Ozhukarai Taluk, Puducherry district, Puducherry, 605101, India" building yes 0.301 India FALSE
+centre for sustainable agriculture in Asia Southern Asia FALSE 1 2021-02-03 68078354 node "centre for sustainable agriculture (CSA), Street 14, Tarnaka, Ward 143 Tarnaka, Greater Hyderabad Municipal Corporation North Zone, Hyderabad, Maredpally mandal, Hyderabad, Telangana, 500003, India" office ngo 0.401 India FALSE
+century foundation in Asia Southern Asia FALSE 1 2021-02-03 75013783 node "The New Century Medical & Education Foundation Trust Blood Bank & Aphaeresis Centre, Nagras Road, Aundh, Pune City, Pune District, Maharashtra, 411007, India" amenity blood_bank 0.201 India FALSE
+cga in Asia Southern Asia FALSE 1 2021-02-03 5997295 node "Chengail, NH16, Sankrail, Howrah, West Bengal, 711322, India" railway station 0.24352463088163 India FALSE
+congress party in Asia Southern Asia FALSE 1 2021-02-03 60778451 node "Congress Party, Powai Road, Anandgadh, N Ward, Zone 6, Mumbai, Mumbai Suburban, Maharashtra, 400084, India" office government 0.201 India FALSE
+csr in Asia Southern Asia FALSE 1 2021-02-03 55519048 node "Chak Sikandar, Station Road Chaksikandar, Bidupur, Vaishali, Bihar, 844115, India" railway station 0.279354982157541 India FALSE
+ctd in Asia Southern Asia FALSE 1 2021-02-03 14471317 node "Chhota Udepur, SH62, Chhota Udaipur, Chhota Udaipur Taluka, Chhota Udaipur District, Gujarat, 391165, India" railway station 0.320054390558144 India FALSE
+d. d. & mariani in Asia Southern Asia FALSE 1 2021-02-03 259426205 relation "Mariani, Jorhat, India" boundary administrative 0.75 India FALSE
+dbt in Asia Southern Asia FALSE 1 2021-02-03 64558864 node "Dakshin Barasat‎, Baruipur Kulpi Road, Dakshin Barasat‎, Jaynagar - I, South 24 Parganas, West Bengal, 743391, India" railway station 0.338296402069185 India FALSE
+defence research & development organisation in Asia Southern Asia FALSE 1 2021-02-03 83060459 node "Defence Research and Development Organisation, Bakavand Tahsil, Bastar, Chhattisgarh, India" office research 0.401 India FALSE
+defence research establishment in Asia Southern Asia FALSE 1 2021-02-03 224432662 way "Defence Avionics Research Establishment - DARE, A Narayanapura, Mahadevapura Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, India" landuse military 0.561844955490086 India FALSE
+delhi school of economics in Asia Southern Asia FALSE 1 2021-02-03 83554677 node "Delhi School of Economics, Chhatra Marg, Delhi University (North Campus), Civil Lines Tehsil, Central Delhi, Delhi, 110007, India" amenity college 0.401 India FALSE
+department of electrical engineering and computer science in Asia Southern Asia FALSE 1 2021-02-03 166771882 way "Department of Electrical engineering, IIT Bombay, Infinite Corridoor, Jyotiba Phule Nagar, S Ward, Zone 6, Mumbai, Mumbai Suburban, Maharashtra, 400076, INDIA, India" building university 0.401 India FALSE
+dpj in Asia Southern Asia FALSE 1 2021-02-03 2772343 node "Dharmapuri, Main Road, Dharmapuri, Dharmapuri District, Tamil Nadu, 636700, India" railway station 0.328369791841981 India FALSE
+entrepreneurship institute in Asia Southern Asia FALSE 1 2021-02-03 129614030 way "Xavier Institute of Management and Entrepreneurship, Shantipura Main Road, Electronics City Phase 2 (East), Bangalore South, Bangalore Urban, Karnataka, 560100, India" amenity university 0.587306266325387 India FALSE
+fisheries research in Asia Southern Asia FALSE 1 2021-02-03 120316625 way "Fisheries Research, Okha, Okhamandal Taluka, Devbhumi Dwaraka District, Gujarat, 361350, India" landuse commercial 0.4 India FALSE
+foxconn in Asia Southern Asia FALSE 1 2021-02-03 223452108 way "Foxconn, Sunguvarchatram, Sriperumbudur, Kanchipuram District, Tamil Nadu, India" landuse industrial 0.3 India FALSE
+genomics institute in Asia Southern Asia FALSE 1 2021-02-03 130622683 way "CSIR-Institute of Genomics & Integrative Biology, Mathura Road, Pocket A, Govindpuri, Kalkaji Tehsil, South East Delhi, Delhi, 1243, India" office government 0.462719188578863 India FALSE
+glenmark pharmaceuticals in Asia Southern Asia FALSE 1 2021-02-03 166823886 way "Glenmark Pharmaceuticals Ltd., Shendra MIDC, Aurangabad, Maharashtra, India" landuse industrial 0.4 India FALSE
+goa university in Asia Southern Asia FALSE 1 2021-02-03 302010537 way "Goa University, Library, Dr. E Borges Road, Dona Paula, Tiswadi, North Goa, Goa, 403004, India" amenity library 0.201 India FALSE
+google maps in Asia Southern Asia FALSE 1 2021-02-03 185532602 way "Vani Dahivi Road, Vani, Dindori, Nashik, Maharashtra, 422215, India" highway tertiary 0.1 India FALSE
+gslv in Asia Southern Asia FALSE 1 2021-02-03 71301324 node "GSLV Mk II rocket model, Veli- Perumathura road, Veli, Thiruvananthapuram, Kerala, 695001, India" tourism attraction 0.101 India FALSE
+guru gobind singh indraprastha university in Asia Southern Asia FALSE 1 2021-02-03 124450320 way "Guru Gobind Singh Indraprastha University, Road 205, Sector 17, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110078, India" amenity university 0.841762590849456 India FALSE
+hindu rao hospital in Asia Southern Asia FALSE 1 2021-02-03 85536497 node "Hindu Rao Hospital, Chhatra Marg, Delhi University (North Campus), Civil Lines Tehsil, Central Delhi, Delhi, 110007, India" amenity hospital 0.301 India FALSE
+hp labs in Asia Southern Asia FALSE 1 2021-02-03 15156752 node "HP Labs and HP India Sales, Hosur Road, Adugodi, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, 560095, India" building yes 0.201 India FALSE
+htc in Asia Southern Asia FALSE 1 2021-02-03 11364266 node "Hathras City, NH530B, Madan Lal Banswale, Hathras, Uttar Pradesh, 204101, India" railway station 0.331291305560682 India FALSE
+iia in Asia Southern Asia FALSE 1 2021-02-03 99960273 way "Indian Institute of Astrophysics, Koramangala 2nd Block, Koramangala, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, India" boundary wall 0.389453166408414 India FALSE
+iiser in Asia Southern Asia FALSE 1 2021-02-03 156513014 way "Indian Institute of Science Education and Research (IISER), Pune, IISER-NCL Inner road, Pashan, Pune City, Pune District, Maharashtra, 411008, India" amenity university 0.435695492967573 India FALSE
+indian agricultural research institute in Asia Southern Asia FALSE 1 2021-02-03 140318395 way "Indian Agricultural Research Institute, Aundh, Pune City, Pune District, Maharashtra, 411027, India" landuse farmland 0.6 India FALSE
+indian astronomical observatory in Asia Southern Asia FALSE 1 2021-02-03 180757589 way "Indian Astronomical Observatory, Hanle, Hanle-Ukdungle road, Leh, Leh District, Ladakh, India" man_made observatory 0.301 India FALSE
+indian institute of science bangalore in Asia Southern Asia FALSE 1 2021-02-03 259230417 relation "Indian Institute of Science, CV Raman Road, Malleswaram, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India" amenity university 0.960020321697533 India FALSE
+indian institute of science education and research kolkata in Asia Southern Asia FALSE 1 2021-02-03 174148762 way "IISER Kolkata, National Highway 34 Connector, Haringhata, Nadia, West Bengal, 741246, India" amenity university 0.101 India FALSE
+indian institute of technology bombay in Asia Southern Asia FALSE 1 2021-02-03 259128373 relation "Indian Institute of Technology Bombay, Powai, S Ward, Zone 6, Mumbai, Mumbai Suburban, Maharashtra, 400076, India" amenity university 0.913885190805925 India FALSE
+indian medical association in Asia Southern Asia FALSE 1 2021-02-03 15338881 node "Indian Medical Association, Albert Victor Road, Chamarajapete, Chamrajapet, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560 002, India" amenity library 0.301 India FALSE
+indian national congress in Asia Southern Asia FALSE 1 2021-02-03 221253786 way "Indian Trade Union Congress Nagar, Pudupalayam, Rajapalayam, Virudhunagar District, Tamil Nadu, 626117, India" highway residential 0.3 India FALSE
+indraprastha university in Asia Southern Asia FALSE 1 2021-02-03 124450320 way "Guru Gobind Singh Indraprastha University, Road 205, Sector 17, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110078, India" amenity university 0.541762590849456 India FALSE
+information centre in Asia Southern Asia FALSE 1 2021-02-03 5709828 node "Information Centre, Talala Taluka, Gir Somnath District, Gujarat, 362135, India" place locality 0.325 India FALSE
+institute for plasma research in Asia Southern Asia FALSE 1 2021-02-03 192038053 way "Institute For Plasma Research ,IPR,Bhat, Gandhinagar-Ahmedabad Highway, Bhat, Gandhinagar Taluka, Gandhinagar District, Gujarat, 382428, India" amenity college 0.401 India FALSE
+institute of aerospace medicine in Asia Southern Asia FALSE 1 2021-02-03 101944990 way "Institute of Aerospace Medicine - IAM, Airport Arrival Road, HAL Township, HAL Airport Ward, Mahadevapura Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, 560103, India" amenity college 0.401 India FALSE
+institute of electronics in Asia Southern Asia FALSE 1 2021-02-03 129614030 way "Xavier Institute of Management and Entrepreneurship, Shantipura Main Road, Electronics City Phase 2 (East), Bangalore South, Bangalore Urban, Karnataka, 560100, India" amenity university 0.687306266325387 India FALSE
+institute of microbial technology in Asia Southern Asia FALSE 1 2021-02-03 120906770 way "CSIR Institute for Microbial Technology, Pashchim Marg, Sector 39, Ward 9, Palsora, Chandigarh, 160039, India" amenity research_institute 0.54352463088163 India FALSE
+integrative biology in Asia Southern Asia FALSE 1 2021-02-03 130622683 way "CSIR-Institute of Genomics & Integrative Biology, Mathura Road, Pocket A, Govindpuri, Kalkaji Tehsil, South East Delhi, Delhi, 1243, India" office government 0.462719188578863 India FALSE
+jawaharlal nehru university in Asia Southern Asia FALSE 1 2021-02-03 95083567 way "Jawaharlal Nehru University, Bhagwan Mahavir Marg, Vasant Kunj, Vasant Vihar Tehsil, New Delhi, Delhi, 110067, India" amenity university 0.301 India FALSE
+jsps in Asia Southern Asia FALSE 1 2021-02-03 80164905 node "JSPS Government Homeopathic Medical College, Uppal Road, Bharat Nagar, Ward 8 Habsiguda, Greater Hyderabad Municipal Corporation East Zone, Hyderabad, Uppal mandal, Medchal–Malkajgiri, Telangana, 500013, India" amenity university 0.101 India FALSE
+kemri in Asia Southern Asia FALSE 1 2021-02-03 298924784 node "Kemri, Girwa Tehsil, Udaipur, Rajasthan, India" place hamlet 0.35 India FALSE
+kmt in Asia Southern Asia FALSE 1 2021-02-03 29584870 node "Khammam, Railway Station road, Gandhi chowk, Khammam_Urban mandal, Khammam, Telangana, 507002, India" railway station 0.239862222899095 India FALSE
+ligo-india in Asia Southern Asia FALSE 1 2021-02-03 234678680 way "LIGO India project site, Aundha (Nagnath), Hingoli, Maharashtra, India" landuse construction 0.4 India FALSE
+madras high court in Asia Southern Asia FALSE 1 2021-02-03 100230126 way "Madras High Court, North Fort Road, Island Grounds, Ward 60, Zone 5 Royapuram, Chennai, Chennai District, Tamil Nadu, 600009, India" amenity courthouse 0.767530366216316 India FALSE
+mdr tb in Asia Southern Asia FALSE 1 2021-02-03 302694362 way "MDR, Indore, Indore Tahsil, Madhya Pradesh, 452001, India" highway primary 0.2 India FALSE
+medical college in Asia Southern Asia FALSE 1 2021-02-03 49107221 node "Medical College, kudamaloor, Kottayam, Kerala, 686008, India" place quarter 0.45 India FALSE
+ministry of external affairs in Asia Southern Asia FALSE 1 2021-02-03 65278763 node "Ministry of External Affairs, Rajpath, Central Secretariat, Rakab Ganj, Chanakya Puri Tehsil, New Delhi, Delhi, 110001, India" office government 0.84541340693117 India FALSE
+ministry of finance in Asia Southern Asia FALSE 1 2021-02-03 64686582 node "Ministry of Finance, Rajpath, Central Secretariat, Rakab Ganj, Chanakya Puri Tehsil, New Delhi, Delhi, 110004, India" office government 0.723545743680597 India FALSE
+msc in Asia Southern Asia FALSE 1 2021-02-03 650745 node "Chennai Chetpat, McNichols Road, Ward 104, Zone 8 Anna Nagar, Chennai, Chennai District, Tamil Nadu, 600010, India" railway station 0.310439474412231 India FALSE
+nalco in Asia Southern Asia FALSE 1 2021-02-03 259264932 relation "NALCO, Anugul, Odisha, 759145, India" boundary administrative 0.55 India FALSE
+national centre for radio astrophysics in Asia Southern Asia FALSE 1 2021-02-03 154987972 way "National Centre for Radio Astrophysics, Pune Univesity Campus, Breman Chowk - Khadki Bazar Road, Mandalay Lines, Khadki, Pune City, Pune District, Maharashtra, 411007, India" amenity university 0.501 India FALSE
+national chemical laboratory in Asia Southern Asia FALSE 1 2021-02-03 105954638 way "National Chemical Laboratory, NCL Colony Road, Pune City, Pune District, Maharashtra, 411008, India" building yes 0.59350420583069 India FALSE
+national green tribunal in Asia Southern Asia FALSE 1 2021-02-03 212085570 way "National Green Tribunal, Faridkot House Lane, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India" building yes 0.301 India FALSE
+national institute of biomedical genomics in Asia Southern Asia FALSE 1 2021-02-03 68325867 node "National Institute of Biomedical Genomics, SH1, Gayespur, Chakdah, Nadia, West Bengal, 741232, India" office educational_institution 0.501 India FALSE
+national law university in Asia Southern Asia FALSE 1 2021-02-03 138974523 way "National Law University, Road 205, Sector 13, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110078, India" amenity university 0.602323854176492 India FALSE
+nmda in Asia Southern Asia FALSE 1 2021-02-03 14578782 node "New Morinda Junction, Ludhiana-Chandigarh Highway, Sukho Majra, Chamkaur Sahib Tahsil, Rupnagar, Punjab, 140101, India" railway station 0.001 India FALSE
+nstl in Asia Southern Asia FALSE 1 2021-02-03 244047342 way "nstl road, Susarla Colony, Visakhapatnam, Visakhapatnam (Urban), Visakhapatnam, Andhra Pradesh, 530001, India" highway residential 0.2 India FALSE
+nuclear power corporation of india in Asia Southern Asia FALSE 1 2021-02-03 161045684 way "Nuclear Power Research Corporation of India - NPCI, Benniganahalli Ward, East Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, India" landuse commercial 0.7 India FALSE
+onb in Asia Southern Asia FALSE 1 2021-02-03 26652731 node "O N B, Naduvattom, Beypore Road, Kozhikode Municipal Corporation - Beypore zone, Beypore, Kozhikode, Kozhikode district, Kerala, 673015, India" building yes 0.001 India FALSE
+open access india in Asia Southern Asia FALSE 1 2021-02-03 107854140 way "Buddha Park Access Rd., Kanpur, Kanpur Nagar, Uttar Pradesh, 208012, India" highway residential 0.3 India FALSE
+phat in Asia Southern Asia FALSE 1 2021-02-03 81736230 node "Phat, Palampur, Kangra, Himachal Pradesh, 176102, India" place village 0.375 India FALSE
+raja ramanna centre for advanced technology in indore in Asia Southern Asia FALSE 1 2021-02-03 136320888 way "Raja Ramanna Centre for Advanced Technology, Rau-Indore road, Indore, Indore Tahsil, Madhya Pradesh, 452001, India" amenity university 0.801 India FALSE
+ranbaxy in Asia Southern Asia FALSE 1 2021-02-03 715218 node "Ranbaxy, Service Road, Sector 18, Gurgaon, Gurugram, Haryana, 122010, India" landuse commercial 0.101 India FALSE
+regenerative medicine in Asia Southern Asia FALSE 1 2021-02-03 226982489 way "Institute For Stem Cell Science and Regenerative Medicine, 5th Main Road, Canara Bank Layout, Vidyaranyapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560065, India" building yes 0.201 India FALSE
+regenerative medicine center in Asia Southern Asia FALSE 1 2021-02-03 226982489 way "Institute For Stem Cell Science and Regenerative Medicine, 5th Main Road, Canara Bank Layout, Vidyaranyapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560065, India" building yes 0.201 India FALSE
+science and research in Asia Southern Asia FALSE 1 2021-02-03 83813152 node "KPR College of Arts, Science and Research, KPR college road, Coimbatore, Sulur, Coimbatore District, Tamil Nadu, 641407, India" office educational_institution 0.301 India FALSE
+serum institute in Asia Southern Asia FALSE 1 2021-02-03 104626139 way "Serum Institute Road, Aivarakandapura, Bangalore North, Bangalore Urban, Karnataka, 560088, India" highway secondary 0.3 India FALSE
+shiv nadar university in Asia Southern Asia FALSE 1 2021-02-03 174803369 way "Hostel 2A, 2011 Street, Chithera, Dadri, Gautam Buddha Nagar, Uttar Pradesh, 201314, India" tourism hostel 0.001 India FALSE
+sinochem in Asia Southern Asia FALSE 1 2021-02-03 153854957 way "DSM Sinochem Pharmaceutical Industries, Balachaur Tahsil, Shaheed Bhagat Singh Nagar, Punjab, India" landuse industrial 0.3 India FALSE
+space science institute in Asia Southern Asia FALSE 1 2021-02-03 176056727 way "Indian Institute of Space Science and Technology, Trivandrum, Manoorkonam-panacode, Maannoorkkonam, Nedumangad, Thiruvananthapuram, Kerala, 695547, India" amenity university 0.676937105996802 India FALSE
+sri sathya sai university in Asia Southern Asia FALSE 1 2021-02-03 296017694 node "Sri Sathya Sai Loka Seva Pre University College, SH100, Alike, Bantwal taluk, Dakshina Kannada, Karnataka, 574235, India" amenity college 0.401 India FALSE
+sse in Asia Southern Asia FALSE 1 2021-02-03 177888378 way "Sholapur Airport, Hotgi Road, Ratandeep Housing Society, Ramlal Nagar, Solapur North, Solapur, Maharashtra, 413007, India" aeroway aerodrome 0.390444593674683 India FALSE
+state supreme court in Asia Southern Asia FALSE 1 2021-02-03 258928765 relation "Supreme Court, Tilak Marg, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India" amenity courthouse 0.700289443464696 India FALSE
+tata institute in Asia Southern Asia FALSE 1 2021-02-03 259230417 relation "Indian Institute of Science, CV Raman Road, Malleswaram, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India" amenity university 0.560020321697533 India FALSE
+tata institute of social sciences in Asia Southern Asia FALSE 1 2021-02-03 175114004 way "Tata Institute of Social Sciences, NIRD Rd, Rajendra Nagar, Ward 60 Rajendra Nagar, Greater Hyderabad Municipal Corporation South Zone, Hyderabad, Rajendranagar mandal, Rangareddy, Telangana, 500030, India" building yes 0.501 India FALSE
+technology and research in Asia Southern Asia FALSE 1 2021-02-03 168546735 way "Technology and Research, Kh road, Sector 14, Gandhinagar, Gandhinagar Taluka, Gandhinagar District, Gujarat, 382024, India" amenity college 0.301 India FALSE
+times of india in Asia Southern Asia FALSE 1 2021-02-03 47081191 node "Times of India, Rest House Crescent Road, Shantala Nagar, East Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, BENGALURU, India" office newspaper 0.301 India FALSE
+tuberculosis research centre in Asia Southern Asia FALSE 1 2021-02-03 143672353 way "Tuberculosis Research Institute, Club Road, Chetpet, Ward 107, Zone 8 Anna Nagar, Chennai, Chennai District, Tamil Nadu, 600 006, India" amenity college 0.201 India FALSE
+uaa in Asia Southern Asia FALSE 1 2021-02-03 56392022 node "Uppala, LR, Uppala, Manjeswaram, Kasaragod, Kerala, 671322, India" railway station 0.299997827209804 India FALSE
+united nations children's fund in Asia Southern Asia FALSE 1 2021-02-03 143582995 way "United Nations Childrens' Fund (UNICEF) - India, K. K. Birla Lane, Lodhi Estate, Chanakya Puri Tehsil, New Delhi, Delhi, 110003, India" office government 0.501 India FALSE
+united technologies corporation in Asia Southern Asia FALSE 1 2021-02-03 75181630 node "United Technologies Corp, Durgam Cheruvu Road, Madhapur, Ward 104 Kondapur, Hyderabad, Serilingampalle mandal, Rangareddy, Telangana, 996544, India" office company 0.201 India FALSE
+university of delhi south campus in Asia Southern Asia FALSE 1 2021-02-03 205692666 way "Benito Juarez Marg, Delhi Cantonment, New Delhi, Delhi, 110057, India" highway tertiary 0.2 India FALSE
+university of mysore in Asia Southern Asia FALSE 1 2021-02-03 183116886 way "University of Mysore, Chamaraja Double Road, Chamarajapuram, Mysuru, Mysuru taluk, Mysuru district, Karnataka, 570001, India" amenity university 0.667707938540516 India FALSE
+university of pune in Asia Southern Asia FALSE 1 2021-02-03 120165826 way "Department of Geography, विदà¥<8d>यापीठरसà¥<8d>ता, Aundh, Khadki, Pune City, Pune District, Maharashtra, 411 007, India" amenity college 0.201 India FALSE
+us catholics in Asia Southern Asia FALSE 1 2021-02-03 246582495 way "St. Augustine Roman Catholics Latin Church, Murukkumpuzha, chirayinkeezhu-Thiruvananthapuram Road, Azhoor, Thiruvananthapuram, Kerala, 695302, India" amenity place_of_worship 0.201 India FALSE
+wadia institute of himalayan geology in Asia Southern Asia FALSE 1 2021-02-03 158407716 way "Wadia Institute of Himalayan Geology, General Mahadev Singh (GMS) Road, Ashirwad Enclave, Dehradun, 248001, India" amenity school 0.501 India FALSE
+bar-ilan university il Asia Western Asia FALSE 1 2021-02-03 103805843 way "×<90>×•× ×™×‘×¨×¡×™×˜×ª בר ×<90>ילן, השקד, רמת ×<90>ילן, גבעת שמו×<90>ל, × ×¤×ª פתח תקווה, מחוז המרכז, no, ישר×<90>ל" amenity university 0.517808168627706 ישר×<90>ל FALSE
+barzilai il Asia Western Asia FALSE 1 2021-02-03 103366196 way "ברזילי, גיבתון, רחובות, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל" highway residential 0.1 ישר×<90>ל FALSE
+better place il Asia Western Asia FALSE 1 2021-02-03 22147093 node "Better Place, 65, מועצה ×<90>זורית גליל תחתון, × ×¤×ª יזרע×<90>ל, מחוז הצפון, no, ישר×<90>ל" amenity fuel 0.201 ישר×<90>ל FALSE
+israel border police il Asia Western Asia FALSE 1 2021-02-03 160962387 way "משמר הגבול, מוס×<90> סייק, קרית ×ž× ×—×<9d> בגין, الشيخ جراØ, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" amenity police 0.001 ישר×<90>ל FALSE
+meteorological service il Asia Western Asia FALSE 1 2021-02-03 119417889 way "המכון המט×<90>ורולוגי, 4, ×<90>זור תעשייה ×’, ר×<90>שון לציון, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל" office government 0.324987614684334 ישר×<90>ל FALSE
+saab il Asia Western Asia FALSE 1 2021-02-03 258610150 relation "شعب‎, × ×¤×ª עכו, מחוז הצפון, ישר×<90>ל" boundary administrative 0.390771556772395 ישר×<90>ל FALSE
+technion il Asia Western Asia FALSE 1 2021-02-03 112050731 way "×˜×›× ×™×•×Ÿ, קרית ×”×˜×›× ×™×•×Ÿ, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" highway platform 0.1 ישר×<90>ל FALSE
+technion — israel institute of technology il Asia Western Asia FALSE 1 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+technion institute il Asia Western Asia FALSE 1 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+technion institute of technology il Asia Western Asia FALSE 1 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+technion israel institute of technology il Asia Western Asia FALSE 1 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+tel aviv university in israel il Asia Western Asia FALSE 1 2021-02-03 58968232 node "×”×˜×›× ×™×•×Ÿ, מרדכי מקלף, תל ×<90>ביב - יפו, ×’× ×™ ×©×¨×•× ×”, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל" amenity university 0.001 ישר×<90>ל FALSE
+un office for the coordination of humanitarian affairs il Asia Western Asia FALSE 1 2021-02-03 6354500 node "UN Office for the Coordination of Humanitarian Affairs (OCHA), ×—×™×™×<9d> ברלב, باب الساهرة, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" amenity public_building 0.801 ישר×<90>ל FALSE
+wright brothers il Asia Western Asia FALSE 1 2021-02-03 123047810 way "×”×<90>×—×™×<9d> רייט, ×<90>גמי×<9d>, רמת ידין, × ×ª× ×™×”, × ×¤×ª השרון, מחוז המרכז, no, ישר×<90>ל" highway residential 0.1 ישר×<90>ל FALSE
+abbvie ie Europe Northern Europe FALSE 1 2021-02-03 258648097 relation "AbbVie, Calry ED, Sligo Municipal Borough District, County Sligo, Connacht, F91 XH39, Éire / Ireland" landuse industrial 0.3 Éire / Ireland FALSE
+alexion ie Europe Northern Europe FALSE 1 2021-02-03 203009581 way "Alexion, Cruiserath Road, College Business & Technology Park, Blanchardstown-Mulhuddart ED, Blanchardstown, Fingal, Dublin 15, Leinster, D15 R925, Éire / Ireland" man_made works 0.101 Éire / Ireland FALSE
+ardi ie Europe Northern Europe FALSE 1 2021-02-03 226577 node "Ardee, The Municipal District of Ardee, County Louth, Leinster, A92 H006, Éire / Ireland" place town 0.370185956704757 Éire / Ireland FALSE
+cams ie Europe Northern Europe FALSE 1 2021-02-03 258628095 relation "Cams, Drumfin ED, Ballymote-Tubbercurry Municipal District, County Sligo, Connacht, Éire / Ireland" boundary administrative 0.35 Éire / Ireland FALSE
+county kildare ie Europe Northern Europe FALSE 1 2021-02-03 258403200 relation "County Kildare, Leinster, Éire / Ireland" boundary administrative 0.723362011212736 Éire / Ireland FALSE
+intel ireland ie Europe Northern Europe FALSE 1 2021-02-03 188372471 way "Intel Ireland, Collinstown Industrial Park, Leixlip ED, The Municipal District of Celbridge — Leixlip, County Kildare, Leinster, W23 N2T7, Éire / Ireland" highway service 0.275 Éire / Ireland FALSE
+maynooth university ie Europe Northern Europe FALSE 1 2021-02-03 55317797 node "Dance, River Apartments, Maynooth ED, The Municipal District of Clane — Maynooth, County Kildare, Leinster, KILDARE, Éire / Ireland" tourism artwork 0.101 Éire / Ireland FALSE
+mayo foundation ie Europe Northern Europe FALSE 1 2021-02-03 39624203 node "Hospice Shop, Market Street, Ballina Urban ED, Ballina Municipal District, County Mayo, Connacht, F26 P6C1, Éire / Ireland" shop charity 0.101 Éire / Ireland FALSE
+merck sharp & dohme ie Europe Northern Europe FALSE 1 2021-02-03 5765653 node "Merck Sharp & Dohme, R448, Pollerton Little, Carlow Rural, The Municipal District of Carlow, County Carlow, Leinster, R93 Y381, Éire / Ireland" man_made works 0.301 Éire / Ireland FALSE
+national university of ireland ie Europe Northern Europe FALSE 1 2021-02-03 148002637 way "National University of Ireland, 49, Merrion Square East, Dublin, Dublin 2, Leinster, DO2 VY60, Éire / Ireland" building house 0.401 Éire / Ireland FALSE
+national university of ireland galway ie Europe Northern Europe FALSE 1 2021-02-03 128311337 way "National University of Ireland, Galway, University Road, Nun's Island, Galway Municipal District, Cathair na Gaillimhe, County Galway, Connacht, H91 F5Y3, Éire / Ireland" amenity university 0.501 Éire / Ireland FALSE
+ncbi ie Europe Northern Europe FALSE 1 2021-02-03 297995042 node "NCBI, High Street, Kilkenny No.1 Urban, The Municipal District of Kilkenny City, County Kilkenny, Leinster, R95 V6TE, Éire / Ireland" shop charity 0.101 Éire / Ireland FALSE
+ncse ie Europe Northern Europe FALSE 1 2021-02-03 76554855 node "National Council for Special Education, Heritage Business Park, Mahon Industrial Estate, Mahon, Mahon B, Cork, County Cork, Munster, T12 XK5R, Éire / Ireland" office government 0.001 Éire / Ireland FALSE
+newgrange ie Europe Northern Europe FALSE 1 2021-02-03 96120841 way "Newgrange, Towpath, Duleek, The Municipal District of Laytown — Bettystown, County Meath, Leinster, C15 XW28, Éire / Ireland" tourism attraction 0.529041378051631 Éire / Ireland FALSE
+noc ie Europe Northern Europe FALSE 1 2021-02-03 133056952 way "Ireland West Airport Knock, R376, Sonnagh ED, Claremorris-Swinford Municipal District, County Mayo, Connacht, Éire / Ireland" aeroway aerodrome 0.402778707896871 Éire / Ireland FALSE
+pheic ie Europe Northern Europe FALSE 1 2021-02-03 258835961 relation "Peakroe, Aughrim ED, Athenry-Oranmore Municipal District, County Galway, Connacht, Éire / Ireland" boundary administrative 0.25 Éire / Ireland FALSE
+physics division ie Europe Northern Europe FALSE 1 2021-02-03 94426972 way "Science Centre (North), Route1, Roebuck, Dundrum ED, Dundrum, Dún Laoghaire-Rathdown, County Dublin, Leinster, D04 XT65, Éire / Ireland" building university 0.001 Éire / Ireland FALSE
+research and development division ie Europe Northern Europe FALSE 1 2021-02-03 83761129 node "HSE, Research and Development, Parkgate Street, Islandbridge, Phoenix Park ED, Dublin, Dublin 8, Leinster, D08 YFF1, Éire / Ireland" office government 0.301 Éire / Ireland FALSE
+thermo fisher ie Europe Northern Europe FALSE 1 2021-02-03 98913796 way "Thermo-Fisher, Carrigaline, Ballincollig - Carrigaline, County Cork, Munster, Éire / Ireland" landuse industrial 0.4 Éire / Ireland FALSE
+ucd ie Europe Northern Europe FALSE 1 2021-02-03 6829023 node "UCD, Wynnsward Drive, Roebuck, Clonskeagh-Belfield ED, Dundrum, Dún Laoghaire-Rathdown, County Dublin, Leinster, D14 NH72, Éire / Ireland" place house 0.101 Éire / Ireland FALSE
+university college cork ie Europe Northern Europe FALSE 1 2021-02-03 219587720 way "IRA Volunteers Memorial and Gravesite, College Road, Gillabbey B, Cork, County Cork, Munster, T12 ND89, Éire / Ireland" historic memorial 0.201 Éire / Ireland FALSE
+apha id Asia South-Eastern Asia FALSE 1 2021-02-03 13638301 node "Apha, Sawang, Aceh Selatan, Aceh, Indonesia" place village 0.375 Indonesia FALSE
+bandung institute of technology id Asia South-Eastern Asia FALSE 1 2021-02-03 132073472 way "Institut Teknologi Bandung, 10-12, Ganesha, Lebak Siliwangi, Jawa Barat, 40132, Indonesia" amenity university 0.546170188407265 Indonesia FALSE
+bandung institute of technology indonesia id Asia South-Eastern Asia FALSE 1 2021-02-03 132073472 way "Institut Teknologi Bandung, 10-12, Ganesha, Lebak Siliwangi, Jawa Barat, 40132, Indonesia" amenity university 0.646170188407265 Indonesia FALSE
+bina nusantara university id Asia South-Eastern Asia FALSE 1 2021-02-03 301970874 way "Universitas BINUS (Bina Nusantara) Kampus Syahdan, 9, Jalan KH. Syahdan, RW 12, Palmerah, Jakarta Barat, Daerah Khusus Ibukota Jakarta, 11480, Indonesia" amenity university 0.201 Indonesia FALSE
+cctv id Asia South-Eastern Asia FALSE 1 2021-02-03 73875815 node "CCTV, Turgo, Dusun Tegalmindi, Sleman, Daerah Istimewa Yogyakarta, 55786, Indonesia" leisure park 0.25 Indonesia FALSE
+center for international forestry research id Asia South-Eastern Asia FALSE 1 2021-02-03 242934787 way "Center for International Forestry Research (CIFOR), Situ Gede, Jawa Barat, 16115, Indonesia" landuse research 0.786244954737813 Indonesia FALSE
+cifor id Asia South-Eastern Asia FALSE 1 2021-02-03 154300870 way "Cifor, Bubulak, Jawa Barat, 16112, Indonesia" highway trunk 0.2 Indonesia FALSE
+department of pharmacy id Asia South-Eastern Asia FALSE 1 2021-02-03 161761878 way "Departemen Farmasi, Jalan Profesor Dokter Mahar Mardjono, Pondok Cina, Jawa Barat, 16424, Indonesia" building yes 0.101 Indonesia FALSE
+eijkman institute for molecular biology id Asia South-Eastern Asia FALSE 1 2021-02-03 199379553 way "Lembaga Eijkman, 69, Jalan Pangeran Diponegoro, RW 05, Kenari, Senen, Jakarta Pusat, Daerah Khusus Ibukota Jakarta, 10430, Indonesia" building yes 0.101 Indonesia FALSE
+gadjah mada university id Asia South-Eastern Asia FALSE 1 2021-02-03 117923558 way "Gadjah Mada University Press, Jalan Teknika, Pogung Baru, Sinduadi, Mlati, Sleman, Daerah Istimewa Yogyakarta, 55222, Indonesia" craft bookbinder 0.301 Indonesia FALSE
+google earth id Asia South-Eastern Asia FALSE 1 2021-02-03 210747083 way "Jalan Saxophone, RW 05, Kel.Tunggulwulung, Landungsari, Malang, Jawa Timur, 65144, Indonesia" highway service 0.075 Indonesia FALSE
+inaoe id Asia South-Eastern Asia FALSE 1 2021-02-03 13470927 node "Inaoe, Rote Ndao, Nusa Tenggara Timur, Indonesia" place village 0.375 Indonesia FALSE
+la stampa id Asia South-Eastern Asia FALSE 1 2021-02-03 13921820 node "Stampa, Tapanuli Selatan, Sumatera Utara, Indonesia" place village 0.475 Indonesia FALSE
+laetoli id Asia South-Eastern Asia FALSE 1 2021-02-03 10742285 node "Bulu Latoli, Sulawesi Selatan, Indonesia" natural peak 0.3 Indonesia FALSE
+liang bua id Asia South-Eastern Asia FALSE 1 2021-02-03 51149275 node "Liang Bua, Jalan Ruteng-Reo, Barang, Manggarai, Nusa Tenggara Timur, Indonesia" natural cave_entrance 0.588895403331395 Indonesia FALSE
+mai-mai id Asia South-Eastern Asia FALSE 1 2021-02-03 13953284 node "Mai Mai, Papua Barat, Indonesia" place village 0.475 Indonesia FALSE
+national institute of aeronautics and space id Asia South-Eastern Asia FALSE 1 2021-02-03 198403505 way "LAPAN, 1, Jalan Pemuda, RW 08, Jati, Pulo Gadung, Jakarta Timur, Daerah Khusus Ibukota Jakarta, 13220, Indonesia" office government 0.416374248267951 Indonesia FALSE
+nda id Asia South-Eastern Asia FALSE 1 2021-02-03 136395382 way "Bandar Udara Bandaneira, Jl. Rajawali, Kampung Baru, Kepulauan Banda, Maluku, 97593, Indonesia" aeroway aerodrome 0.488670877038008 Indonesia FALSE
+padjadjaran university id Asia South-Eastern Asia FALSE 1 2021-02-03 233157303 way "Universitas Padjadjaran, Jalan Raya Jatinangor, Bandung, Jawa Barat, 45363, Indonesia" amenity university 0.101 Indonesia FALSE
+pdip id Asia South-Eastern Asia FALSE 1 2021-02-03 72671249 node "PDIP, Jalan Kinibalu, Banjarmasin, Kalimantan Selatan, 70114, Indonesia" office political_party 0.101 Indonesia FALSE
+pedot id Asia South-Eastern Asia FALSE 1 2021-02-03 10559819 node "Gunung Pedot, Jember, Jawa Timur, Indonesia" natural peak 0.4 Indonesia FALSE
+ppr id Asia South-Eastern Asia FALSE 1 2021-02-03 225747104 way "Bandar Udara Pasir Pangaraian, Jalan Rambah Utama, Kecamatan Rambah Samo, Rokan Hulu, Riau, Indonesia" aeroway aerodrome 0.324987614684334 Indonesia FALSE
+saiful islam id Asia South-Eastern Asia FALSE 1 2021-02-03 206069525 way "Dokter Hewan Saiful Islam, Jalan Awang Long, Gunung Elai, Kalimantan Timur, 75311, Indonesia" amenity veterinary 0.201 Indonesia FALSE
+southwest melas id Asia South-Eastern Asia FALSE 1 2021-02-03 13958295 node "Melas, Karo, Sumatera Utara, 22152, Indonesia" place village 0.375 Indonesia FALSE
+srg id Asia South-Eastern Asia FALSE 1 2021-02-03 196603793 way "Bandar Udara Ahmad Yani, Jalan Taman Avonia VI, RW 04, Jerakah, Jawa Tengah, 50144, Indonesia" aeroway aerodrome 0.394667642378454 Indonesia FALSE
+university of gadjah mada id Asia South-Eastern Asia FALSE 1 2021-02-03 207160405 way "Universitas Kanjuruhan, Jalan Sudanco Supriyadi, RW 06 Kel. Sukun, Sukun, Kota Malang, Bandungrejosari, Malang, Jawa Timur, 65147, Indonesia" amenity university 0.001 Indonesia FALSE
+biologicals e hu Europe Eastern Europe FALSE 1 2021-02-03 146927310 way "82, GlaxoSmithKline Biologicals Gyógyszergyártó és Forgalmazó Kft., Haraszt, Gödöllő, Gödöllői járás, Pest megye, Közép-Magyarország, 2100, Magyarország" landuse industrial 0.4 Magyarország FALSE
+eötvös university hu Europe Eastern Europe FALSE 1 2021-02-03 123965591 way "Eötvös Loránd Tudományegyetem Bölcsészettudományi Kar, 4-8, Múzeum körút, Belváros, V. kerület, Budapest, Közép-Magyarország, 1088, Magyarország" amenity university 0.659079404587545 Magyarország FALSE
+fodor hu Europe Eastern Europe FALSE 1 2021-02-03 162880526 way "Fodor, Teleki utca, Dunafalva, Bajai járás, Bács-Kiskun megye, Dél-Alföld, Alföld és Észak, 6513, Magyarország" amenity pub 0.101 Magyarország FALSE
+fold hu Europe Eastern Europe FALSE 1 2021-02-03 46893027 node "Föld, Ifjúsági sétány, Népliget, X. kerület, Budapest, Közép-Magyarország, 1101, Magyarország" tourism artwork 0.378282845036744 Magyarország FALSE
+kaposi hu Europe Eastern Europe FALSE 1 2021-02-03 66535112 node "Kaposi, Erdőbénye, Tokaji járás, Borsod-Abaúj-Zemplén megye, Észak-Magyarország, Alföld és Észak, 3932, Magyarország" place locality 0.225 Magyarország FALSE
+kek hu Europe Eastern Europe FALSE 1 2021-02-03 258398258 relation "Kék, Kemecsei járás, Szabolcs-Szatmár-Bereg megye, Észak-Alföld, Alföld és Észak, 4515, Magyarország" boundary administrative 0.448129702072077 Magyarország FALSE
+national university of public service hu Europe Eastern Europe FALSE 1 2021-02-03 258425305 relation "Nemzeti Közszolgálati Egyetem, 2, Ludovika tér, Orczy Fórum Városközpont, Orczy negyed, VIII. kerület, Budapest, Közép-Magyarország, 1083, Magyarország" amenity university 0.001 Magyarország FALSE
+nistar hu Europe Eastern Europe FALSE 1 2021-02-03 60976160 node "Nyistár, Bakonya, Pécsi járás, Baranya megye, Dél-Dunántúl, Dunántúl, 7675, Magyarország" place locality 0.125 Magyarország FALSE
+office of diversity hu Europe Eastern Europe FALSE 1 2021-02-03 157561731 way "Diversity, Ã<81>sotthalom, Mórahalmi járás, Csongrád-Csanád megye, Dél-Alföld, Alföld és Észak, 6783, Magyarország" natural grassland 0.3 Magyarország FALSE
+tass hu Europe Eastern Europe FALSE 1 2021-02-03 258122144 relation "Tass, Kunszentmiklósi járás, Bács-Kiskun megye, Dél-Alföld, Alföld és Észak, 6098, Magyarország" boundary administrative 0.532228989952608 Magyarország FALSE
+tokai hu Europe Eastern Europe FALSE 1 2021-02-03 258396132 relation "Tokaj, Tokaji járás, Borsod-Abaúj-Zemplén megye, Észak-Magyarország, Alföld és Észak, Magyarország" boundary administrative 0.519419743521435 Magyarország FALSE
+un refugee agency hu Europe Eastern Europe FALSE 1 2021-02-03 122135603 way "ENSZ Menekültügyi Főbiztosság, 5/A-D, Ipoly utca, Újlipótváros, XIII. kerület, Budapest, Közép-Magyarország, 1133, Magyarország" office government 0.001 Magyarország FALSE
+university of szeged hu Europe Eastern Europe FALSE 1 2021-02-03 258169251 relation "Szegedi Tudományegyetem, 13, Dugonics tér, Belváros, Szeged, Szegedi járás, Csongrád-Csanád megye, Dél-Alföld, Alföld és Észak, 6720, Magyarország" building university 0.577156057530702 Magyarország FALSE
+civil protection department ht Americas Caribbean FALSE 1 2021-02-03 212453122 way "Protection Civil SMA, Saint Michel de l’Attalaye, Commune de Saint Michel de l'Attalaye, Arrondissement de Marmelade, Département de l'Artibonite, HT4520, Ayiti" landuse residential 0.4 Ayiti FALSE
+commerce department ht Americas Caribbean FALSE 1 2021-02-03 169235488 way "Rue du Commerce, Grande Passe, 1re Paricot, Bois Marguerite, Commune Port-à -Piment, Arrondissement des Côteaux, Département du Sud, Ayiti" highway unclassified 0.2 Ayiti FALSE
+international medical corps ht Americas Caribbean FALSE 1 2021-02-03 16244363 node "International Medical Corps, RC 700A, 1re Maniche, Maniche, Commune Maniche, Arrondissement des Cayes, Département du Sud, Ayiti" amenity doctors 0.301 Ayiti FALSE
+iscf ht Americas Caribbean FALSE 1 2021-02-03 21279485 node "InstitutionScolaire Claire Fontaine, Ruelle Capois la mort, Cité Blue Hills, 3e Petite Anse, Cap-Haïtien, Commune Cap-Haïtien, Arrondissement de Cap-Haïtien, Département du Nord, HT1113, Ayiti" amenity school 0.001 Ayiti FALSE
+mandon ht Americas Caribbean FALSE 1 2021-02-03 5667738 node "Mandon, Commune Cavaillon, Arrondissement d’Aquin, Département du Sud, Ayiti" place village 0.375 Ayiti FALSE
+time department ht Americas Caribbean FALSE 1 2021-02-03 71519977 node "Break Time Bar Restaurant, 25, Rue Oreste Zamor, Les Lattes, 1re Juanaria, Hinche, Commune Hinche, Arrondissement de Hinche, Département du Centre, 5110, Ayiti" amenity restaurant 0.101 Ayiti FALSE
+brac hr Europe Southern Europe FALSE 1 2021-02-03 258816711 relation "BraÄ<8d>, Splitsko-dalmatinska županija, Hrvatska" place island 0.480082774710875 Hrvatska FALSE
+pag hr Europe Southern Europe FALSE 1 2021-02-03 258305699 relation "Pag, Zadarska županija, Hrvatska" place island 0.559094572124133 Hrvatska FALSE
+university of rijeka hr Europe Southern Europe FALSE 1 2021-02-03 103463556 way "Kampus Trsat, Tome Strižića, MarÄ<8d>i, Mjesni odbor Gornja Vežica, Grad Rijeka, Primorsko-goranska županija, 51216, Hrvatska" amenity university 0.101 Hrvatska FALSE
+university of split hr Europe Southern Europe FALSE 1 2021-02-03 124254987 way "SveuÄ<8d>iliÅ¡te u Splitu, VranÄ<8d>ićeva, Pisano Kame, Split 3, Split, Grad Split, Splitsko-dalmatinska županija, 21111, Hrvatska" amenity university 0.101 Hrvatska FALSE
+caprisa hn Americas Central America FALSE 1 2021-02-03 186241405 way "Caprisa, 4a Calle, Centro de Comayagüela, Comayagüela, Tegucigalpa, Distrito Central, Francisco Morazán, 12101, Honduras" shop yes 0.101 Honduras FALSE
+minister of industry gy Americas South America FALSE 1 2021-02-03 58959117 node "Minister office MOA, Shiv Chanderpaul Drive, Queenstown, City of Georgetown, Plaisance-Industry Local Government, Demerara-Mahaica, 413741, Guyana" office government 0.301 Guyana FALSE
+alexander fleming biomedical sciences research centre gr Europe Southern Europe FALSE 1 2021-02-03 174584668 way "ΕÏ<81>ευνητικό ΚÎντÏ<81>ο ΒιοϊατÏ<81>ικών Επιστημών «ΑλÎξανδÏ<81>ος ΦλÎμιγκ», 34, ΦλÎμινγκ, ΒάÏ<81>κιζα, Κοινότητα ΒάÏ<81>ης, Δημοτική Ενότητα ΒάÏ<81>ης, Δήμος ΒάÏ<81>ης - ΒοÏ<8d>λας - ΒουλιαγμÎνης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Ανατολικής Αττικής, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 16672, Ελλάδα" building office 0.001 Ελλάδα FALSE
+aristotle university of thessaloniki gr Europe Southern Europe FALSE 1 2021-02-03 89323602 way "Τμήμα Ψυχολογίας, ΗÏ<81>ακλείας, ΣαÏ<81>άντα Εκκλησίες, 1ο Δημοτικό ΔιαμÎÏ<81>ισμα Θεσσαλονίκης, Δημοτική Ενότητα Θεσαλονίκης, Δήμος Θεσσαλονίκης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Θεσσαλονίκης, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 546 36, Ελλάδα" amenity university 0.476021686869768 Ελλάδα FALSE
+athena swan gr Europe Southern Europe FALSE 1 2021-02-03 373873 node "Αθήνα, Αθήνα - Θεσσαλονίκη - ΕÏ<8d>ζωνοι, ΤσαλαβοÏ<8d>τα, 4ο Δημοτικό ΔιαμÎÏ<81>ισμα ΠεÏ<81>ιστεÏ<81>ίου, Δήμος ΠεÏ<81>ιστεÏ<81>ίου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΔυτικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 12131, Ελλάδα" highway motorway_junction 0.369728853996096 Ελλάδα FALSE
+bank of greece gr Europe Southern Europe FALSE 1 2021-02-03 258543457 relation "ΤÏ<81>άπεζα της Ελλάδος, Σταδίου, Ακαδημία, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 10561, Ελλάδα" building public 0.439838583226862 Ελλάδα FALSE
+cha gr Europe Southern Europe FALSE 1 2021-02-03 258578670 relation "ΧαÎ, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Ρόδου, ΠεÏ<81>ιφÎÏ<81>εια Î<9d>οτίου Αιγαίου, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αιγαίου, Ελλάδα" place island 0.325 Ελλάδα FALSE
+cyta gr Europe Southern Europe FALSE 1 2021-02-03 59992481 node "Cyta, 15, ΦιλυÏ<81>ών, Κάτω ΗλιοÏ<8d>πολη, ΕÏ<8d>οσμος, Κοινότητα Ευόσμου, Δημοτική Ενότητα Ευόσμου, Δήμος ΚοÏ<81>δελιοÏ<8d> - Ευόσμου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Θεσσαλονίκης, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 56224, Ελλάδα" shop mobile_phone 0.101 Ελλάδα FALSE
+delphi gr Europe Southern Europe FALSE 1 2021-02-03 123422309 way "Δελφοί, Λιβαδειάς - Άμφισσας, Κοινότητα Δελφών, Δημοτική Ενότητα Δελφών, Δήμος Δελφών, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Φωκίδας, ΠεÏ<81>ιφÎÏ<81>εια ΣτεÏ<81>εάς Ελλάδος, ΑποκεντÏ<81>ωμÎνη Διοίκηση Θεσσαλίας - ΣτεÏ<81>εάς Ελλάδος, 33054, Ελλάδα" tourism attraction 0.582802507745551 Ελλάδα FALSE
+earthquake administration gr Europe Southern Europe FALSE 1 2021-02-03 108990987 way "ΕÏ<81>γαστήÏ<81>ιο Αντισεισμικής Τεχνολογίας, ΚοκκινοποÏ<8d>λου, Δήμος ΖωγÏ<81>άφου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 15773, Ελλάδα" amenity laboratory 0.001 Ελλάδα FALSE
+eridani gr Europe Southern Europe FALSE 1 2021-02-03 97771831 way "ΗÏ<81>ιδανοÏ<8d>, Κολωνάκι, Αμπελόκηποι, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 11521, Ελλάδα" highway residential 0.1 Ελλάδα FALSE
+foodini gr Europe Southern Europe FALSE 1 2021-02-03 73698678 node "Foodini, Αμυκλών, ΡιζοÏ<8d>πολη, Συνοικία Ριζουπόλεως, 5º Δημοτικό ΔιαμÎÏ<81>ισμα Αθηνών, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 11142, Ελλάδα" amenity restaurant 0.101 Ελλάδα FALSE
+greek parliament gr Europe Southern Europe FALSE 1 2021-02-03 258491953 relation "Βουλή των Ελλήνων, Πλατεία Αγνώστου ΣτÏ<81>ατιώτου, Κολωνάκι, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, Ελλάδα" tourism attraction 0.520183376106203 Ελλάδα FALSE
+hellenic pasteur institute gr Europe Southern Europe FALSE 1 2021-02-03 258616327 relation "Eλληνικό ΙνστιτοÏ<8d>το ΠαστÎÏ<81>, 127, Ι. Αθανασιάδου, ΚουντουÏ<81>ιώτικα, Αμπελόκηποι, Αθήνα, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 11521, Ελλάδα" amenity research_institute 0.001 Ελλάδα FALSE
+ikaria gr Europe Southern Europe FALSE 1 2021-02-03 258844397 relation "ΙκαÏ<81>ία, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΙκαÏ<81>ίας, ΠεÏ<81>ιφÎÏ<81>εια Î’ÏŒÏ<81>ειου Αιγαίου, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αιγαίου, Ελλάδα" place island 0.454824436051658 Ελλάδα FALSE
+ipsos gr Europe Southern Europe FALSE 1 2021-02-03 17704082 node "Ύψος, Δήμος ΚÎÏ<81>κυÏ<81>ας, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚÎÏ<81>κυÏ<81>ας, ΠεÏ<81>ιφÎÏ<81>εια Ιονίων Î<9d>ήσων, ΑποκεντÏ<81>ωμÎνη Διοίκηση Πελοποννήσου, Δυτικής Ελλάδας και Ιονίου, 49083, Ελλάδα" place village 0.275 Ελλάδα FALSE
+oase gr Europe Southern Europe FALSE 1 2021-02-03 785263 node "Όαση, Δήμος Χανίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Χανίων, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 73100, Ελλάδα" place village 0.275 Ελλάδα FALSE
+republic of macedonia gr Europe Southern Europe FALSE 1 2021-02-03 23115231 node "Republic, ΕλευθεÏ<81>ίου ΒενιζÎλου, Παλιά ΑγοÏ<81>ά, Γιαννιτσά, Δήμος Î Îλλας, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Î Îλλας, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 58100, Ελλάδα" amenity cafe 0.101 Ελλάδα FALSE
+technical university of crete gr Europe Southern Europe FALSE 1 2021-02-03 177964332 way "Πολυτεχνείο ΚÏ<81>ήτης, Cluster A, ΚοÏ<81>ακιÎÏ‚, Δήμος Χανίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Χανίων, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 731 33, Ελλάδα" amenity university 0.001 Ελλάδα FALSE
+university of macedonia gr Europe Southern Europe FALSE 1 2021-02-03 90202405 way "Πανεπιστήμιο Μακεδονίας, 156, Εγνατία, ΜητÏ<81>οπολιτική ΠεÏ<81>ιοχή, 1ο Δημοτικό ΔιαμÎÏ<81>ισμα Θεσσαλονίκης, Δημοτική Ενότητα Θεσαλονίκης, Δήμος Θεσσαλονίκης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Θεσσαλονίκης, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 54636, Ελλάδα" amenity university 0.351947318522272 Ελλάδα FALSE
+university of manchester archaeological unit gr Europe Southern Europe FALSE 1 2021-02-03 631961 node "ΑÏ<81>χαιολογικό Μουσείο, 2, Ξανθουδίδου Στεφ., ΗÏ<81>άκλειο, Δημοτική Κοινότητα ἩÏ<81>ακλείου, Δήμος ΗÏ<81>ακλείου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΗÏ<81>ακλείου, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 71202, Ελλάδα" tourism museum 0.383021208265432 Ελλάδα FALSE
+xoma gr Europe Southern Europe FALSE 1 2021-02-03 115973337 way "xoma, ΜΑΚΡΙΑ ΛΑΧΙΔΙΑ, ΑÏ<81>Ï„Îμιδα, Δήμος Σπάτων - ΑÏ<81>Ï„Îμιδος, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Ανατολικής Αττικής, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 19016, Ελλάδα" highway track 0.21 Ελλάδα FALSE
+faa gn Africa Western Africa FALSE 1 2021-02-03 149031448 way "Faranah Airport, N2, Soléa, Sirakémoya, Faranah, Guinée" aeroway aerodrome 0.278015094618814 Guinée FALSE
+unc gn Africa Western Africa FALSE 1 2021-02-03 201161301 way "UNC, Rue RO. 370, Kaporo, Kaporo Centre, Ratoma, Conakry, BP 5810, Guinée" amenity university 0.258083983169266 Guinée FALSE
+greenland gl Americas Northern America FALSE 1 2021-02-03 258682464 relation Kalaallit Nunaat boundary administrative 0.677424867756203 Kalaallit Nunaat FALSE
+greenland institute of natural resources gl Americas Northern America FALSE 1 2021-02-03 153302829 way "Pinngortitaleriffik, 2, Kivioq, Nuussuaq, Nuuk, Sermersooq, 3905, Kalaallit Nunaat" office research 0.119931111449547 Kalaallit Nunaat FALSE
+pmel gl Americas Northern America FALSE 1 2021-02-03 133289772 way "Fuels Management PMEL, North Street, Kangerlussuaq, Qeqqata, Kalaallit Nunaat" building yes 0.101 Kalaallit Nunaat FALSE
+association of universities gh Africa Western Africa FALSE 1 2021-02-03 59776675 node "Association of African Universities, Trinity Avenue, Accra Metropolitan, Ga East, Greater Accra Region, BOX LG25, Ghana" office ngo 0.581311730611622 Ghana FALSE
+committee on natural resources gh Africa Western Africa FALSE 1 2021-02-03 64828499 node "Presidential Committee on Environment and Natural Resources, 5th Avenue Extension, Kanda Estates, Kokomlemle, Accra Metropolitan, Greater Accra Region, NE2 8AH, Ghana" office government 0.401 Ghana FALSE
+ernst & young gh Africa Western Africa FALSE 1 2021-02-03 183594557 way "Ernst & Young, Airport Residential Area, Accra Metropolitan, Greater Accra Region, Ghana" landuse commercial 0.4 Ghana FALSE
+innovations for poverty action gh Africa Western Africa FALSE 1 2021-02-03 212438214 way "Innovations for Poverty Action, Harun Pegu Avenue, Abouabo, Tamale, Northern Region, 232, Ghana" office ngo 0.401 Ghana FALSE
+national council for tertiary education gh Africa Western Africa FALSE 1 2021-02-03 171308631 way "National Council for Tertiary Education, Trinity Avenue, Accra Metropolitan, Ga East, Greater Accra Region, BOX LG25, Ghana" office government 0.501 Ghana FALSE
+neem gh Africa Western Africa FALSE 1 2021-02-03 164242490 way "Neem, Danyame, Kumasi, Ashanti Region, M9VH+94, Ghana" highway residential 0.2 Ghana FALSE
+noguchi memorial institute for medical research gh Africa Western Africa FALSE 1 2021-02-03 258616093 relation "Noguchi Memorial Institute for Medical Research, Akilagpa Sawyerr Road, Little Legon, East Legon, Accra Metropolitan, Greater Accra Region, BOX LG25, Ghana" building yes 0.601 Ghana FALSE
+university of bamako gh Africa Western Africa FALSE 1 2021-02-03 246851633 way "Knutsford University College, Bamako Avenue, East Legon, Accra Metropolitan, Greater Accra Region, BOX LG25, Ghana" amenity university 0.201 Ghana FALSE
+university of health and allied sciences gh Africa Western Africa FALSE 1 2021-02-03 169051652 way "University of Health and Allied Sciences, Denu - Ho Road, Adaklu, Volta Region, 6803, Ghana" tourism hostel 0.601 Ghana FALSE
+us department of the treasury gh Africa Western Africa FALSE 1 2021-02-03 66802555 node "Department of Feeder Roads (Head Offiice), Treasury Road, Ministries, Accra Metropolitan, Victoriaborg, Greater Accra Region, GA-183-8164, Ghana" office government 0.301 Ghana FALSE
+sarc gg Europe Northern Europe FALSE 1 2021-02-03 84803879 way "Sark, Guernsey" place island 0.487026464500426 Guernsey FALSE
+desi ge Asia Western Asia FALSE 1 2021-02-03 108632894 way "დესი, ქვემáƒ<9d> დესი, ყáƒ<90>ზბეგის მუნიციპáƒ<90>ლიტეტი, მცხეთáƒ<90>-მთიáƒ<90>ნეთი, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" waterway river 0.275 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+eliava institute ge Asia Western Asia FALSE 1 2021-02-03 145502768 way "გიáƒ<9d>რგი ელიáƒ<90>ვáƒ<90>ს სáƒ<90>ხელáƒ<9d>ბის ბáƒ<90>ქტერიáƒ<9d>ფáƒ<90>გიის, მიკრáƒ<9d>ბიáƒ<9d>ლáƒ<9d>გიისáƒ<90> დáƒ<90> ვირუსáƒ<9d>ლáƒ<9d>გიის ინსტიტუტი, 3, ლევáƒ<90>ნ გáƒ<9d>თუáƒ<90>ს ქუჩáƒ<90>, ვეძისი, ვáƒ<90>კე-სáƒ<90>ბურთáƒ<90>ლáƒ<9d>ს რáƒ<90>იáƒ<9d>ნი, თბილისი, 0160, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" amenity hospital 0.001 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+ge ge Asia Western Asia FALSE 1 2021-02-03 257665009 relation სáƒ<90>ქáƒ<90>რთველáƒ<9d> boundary administrative 0.738453797356621 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+irms ge Asia Western Asia FALSE 1 2021-02-03 24118191 node "IRMS, ვáƒ<90>ჟáƒ<90>-ფშáƒ<90>ველáƒ<90>ს გáƒ<90>მზირი, ვáƒ<90>ჟáƒ<90>-ფშáƒ<90>ველáƒ<90>ს კვáƒ<90>რტლები, ვáƒ<90>კე-სáƒ<90>ბურთáƒ<90>ლáƒ<9d>ს რáƒ<90>იáƒ<9d>ნი, თბილისი, 0186, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" place house 0.101 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+mardaleishvili medical center ge Asia Western Asia FALSE 1 2021-02-03 62767859 node "მáƒ<90>რდáƒ<90>ლეიშვილის უნრედის ტექნáƒ<9d>ლáƒ<9d>გიისáƒ<90> დáƒ<90> თერáƒ<90>პიის კლინიკáƒ<90>, 4, ლეáƒ<9d> კვáƒ<90>áƒáƒ<90>ძის ქუჩáƒ<90>, ვáƒ<90>კე-სáƒ<90>ბურთáƒ<90>ლáƒ<9d>ს რáƒ<90>იáƒ<9d>ნი, ქვემáƒ<9d> ლისი, მცხეთის მუნიციპáƒ<90>ლიტეტი, მცხეთáƒ<90>-მთიáƒ<90>ნეთი, 0017, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" amenity hospital 0.001 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+movement for justice ge Asia Western Asia FALSE 1 2021-02-03 15256134 node "მáƒ<9d>ძრáƒ<90>áƒ<9d>ბáƒ<90> სáƒ<90>მáƒ<90>რთლიáƒ<90>ნი სáƒ<90>ქáƒ<90>რთველáƒ<9d>სáƒ<90>თვის (Political Movement ""Justice for Georgia""), ლუკáƒ<90> áƒ<90>სáƒ<90>თიáƒ<90>ნის ქუჩáƒ<90>, ძველი ბáƒ<90>თუმის უბáƒ<90>ნი, ფერიáƒ<90>, ბáƒ<90>თუმი, áƒ<90>დლიáƒ<90>, áƒ<90>áƒáƒ<90>რის áƒ<90>ვტáƒ<9d>ნáƒ<9d>მიური რესპუბლიკáƒ<90>, 6008, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" amenity public_building 0.301 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+red list ge Asia Western Asia FALSE 1 2021-02-03 76324808 node "The Red List of Plants in Georgia, თბილისის ქუჩის მე-5 შეს, სáƒ<90>ხáƒ<90>ლვáƒ<90>შáƒ<9d>, ბáƒ<90>თუმი, áƒ<90>დლიáƒ<90>, áƒ<90>áƒáƒ<90>რის áƒ<90>ვტáƒ<9d>ნáƒ<9d>მიური რესპუბლიკáƒ<90>, 6411, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" tourism information 0.201 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+republic of georgia ge Asia Western Asia FALSE 1 2021-02-03 258029143 relation "Ð<90>бхазиÑ<8f> - Ð<90>Ò§Ñ<81>ны, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" boundary administrative 0.620982812009427 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+university of grenada gd Americas Caribbean FALSE 1 2021-02-03 179679128 way "St George's University Grand Anse Campus, Maurice Bishop Highway, Grand Anse, 1473, Grenada" amenity university 0.489701883147039 Grenada FALSE
+4th circuit gb Europe Northern Europe FALSE 1 2021-02-03 2598024 way "4, The Circuit, Fulshaw Park, Wilmslow, Chorley, Cheshire East, North West England, England, SK9 6DB, United Kingdom" place house 0.101 United Kingdom FALSE
+abcam gb Europe Northern Europe FALSE 1 2021-02-03 64287809 node "Abcam, 200, Cambridge Science Park, Chesterton, Cambridge, Cambridgeshire, East of England, England, CB4 0GZ, United Kingdom" office company 0.101 United Kingdom FALSE
+aberystwyth university gb Europe Northern Europe FALSE 1 2021-02-03 105273952 way "Aberystwyth University, Llanbadarn Campus, Cefn Esgair, Llanbadarn Fawr, Aberystwyth, Ceredigion, Cymru / Wales, SY23 3JG, United Kingdom" amenity university 0.201 United Kingdom FALSE
+ad astra gb Europe Northern Europe FALSE 1 2021-02-03 252844154 way "Ad Astra, Pound Road, Over Wallop, Test Valley, Hampshire, South East, England, SO20 8JG, United Kingdom" building house 0.201 United Kingdom FALSE
+agri-food & biosciences institute gb Europe Northern Europe FALSE 1 2021-02-03 202394885 way "Agri-Food and Biosciences Institute, 50, Houston Road, Crossnacreevy, Belfast, County Down, Northern Ireland, BT6 9SH, United Kingdom" office government 0.401 United Kingdom FALSE
+aic gb Europe Northern Europe FALSE 1 2021-02-03 202294384 way "aic, East Of England Way, Orton Northgate, Orton Waterville, Peterborough, City of Peterborough, East of England, England, PE2 6HA, United Kingdom" building yes 0.111 United Kingdom FALSE
+air vent gb Europe Northern Europe FALSE 1 2021-02-03 145610257 way "Air Vent, Lordship Lane, Hornsey Park, Hornsey, London Borough of Haringey, London, Greater London, England, N22 5JP, United Kingdom" man_made chimney 0.201 United Kingdom FALSE
+alba gb Europe Northern Europe FALSE 1 2021-02-03 257273413 relation "Scotland, United Kingdom" boundary administrative 0.778974525409939 United Kingdom FALSE
+anglia gb Europe Northern Europe FALSE 1 2021-02-03 257775513 relation "England, United Kingdom" boundary administrative 0.838748907051256 United Kingdom FALSE
+armagh observatory gb Europe Northern Europe FALSE 1 2021-02-03 192758084 way "Armagh Observatory, College Hill, Armagh, County Armagh, Northern Ireland, BT61 9DG, United Kingdom" building yes 0.201 United Kingdom FALSE
+ascal gb Europe Northern Europe FALSE 1 2021-02-03 39636306 node "Ascal, Corrard, Belle Isle ED, County Fermanagh, Northern Ireland, BT94 5HY, United Kingdom" place locality 0.225 United Kingdom FALSE
+assembly gb Europe Northern Europe FALSE 1 2021-02-03 119076353 way "Assembly, Temple, Old Market, Bristol, City of Bristol, South West England, England, United Kingdom" landuse construction 0.3 United Kingdom FALSE
+association of the british pharmaceutical industry gb Europe Northern Europe FALSE 1 2021-02-03 122670685 way "Association of the British Pharmaceutical Industry, 12, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2DY, United Kingdom" building yes 0.601 United Kingdom FALSE
+astellas pharma gb Europe Northern Europe FALSE 1 2021-02-03 147148121 way "Astellas Pharma Europe, 2000, Hillswood Drive, Ottershaw, Runnymede, Surrey, South East, England, KT16 0RS, United Kingdom" building yes 0.201 United Kingdom FALSE
+astra zeneca gb Europe Northern Europe FALSE 1 2021-02-03 4552729 node "Astra Zeneca, Bakewell Road, Loughborough, Charnwood, Leicestershire, East Midlands, England, LE11 5TH, United Kingdom" highway bus_stop 0.201 United Kingdom FALSE
+better together gb Europe Northern Europe FALSE 1 2021-02-03 24364444 node "Better Together, Upper Hope Place, Georgian Quarter, Liverpool, North West England, England, L7, United Kingdom" tourism artwork 0.201 United Kingdom FALSE
+betty & gordon moore library gb Europe Northern Europe FALSE 1 2021-02-03 89660043 way "Betty and Gordon Moore Library, Wilberforce Road, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0WD, United Kingdom" amenity library 0.401 United Kingdom FALSE
+biological sciences gb Europe Northern Europe FALSE 1 2021-02-03 125084819 way "Biological Sciences, St Ives Gardens, Queen's Quarter, Belfast, County Antrim, Northern Ireland, BT9 5AD, United Kingdom" building university 0.201 United Kingdom FALSE
+birdlife international gb Europe Northern Europe FALSE 1 2021-02-03 14417131 node "BirdLife International, Wellbrook Way, Girton, South Cambridgeshire, Cambridgeshire, East of England, England, CB3 0GJ, United Kingdom" building yes 0.201 United Kingdom FALSE
+birkbeck college london gb Europe Northern Europe FALSE 1 2021-02-03 96971911 way "Birkbeck College, Malet Street, St Giles, St Pancras, London Borough of Camden, London, Greater London, England, WC1E 7HX, United Kingdom" amenity university 0.773518221802039 United Kingdom FALSE
+blackburn gb Europe Northern Europe FALSE 1 2021-02-03 118886 node "Blackburn, Blackburn with Darwen, North West England, England, BB1 7DP, United Kingdom" place town 0.621773723501146 United Kingdom FALSE
+bournemouth university gb Europe Northern Europe FALSE 1 2021-02-03 112509122 way "Bournemouth University (Talbot Campus), Gillett Road, Talbot Woods, Talbot Village, Bournemouth, Christchurch and Poole, South West England, England, BH3 7DR, United Kingdom" amenity university 0.621665177399236 United Kingdom FALSE
+brain sciences unit gb Europe Northern Europe FALSE 1 2021-02-03 100156548 way "MRC Cognition and Brain Sciences Unit, 15, Chaucer Road, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 7EF, United Kingdom" building university 0.535968355602442 United Kingdom FALSE
+british archaeological trust gb Europe Northern Europe FALSE 1 2021-02-03 135878352 way "Canal & River Trust, Blackwall, London Borough of Tower Hamlets, London, Greater London, England, E14 9ST, United Kingdom" landuse industrial 0.3 United Kingdom FALSE
+british library gb Europe Northern Europe FALSE 1 2021-02-03 84833518 way "British Library, 96, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2DB, United Kingdom" tourism attraction 0.769763707839348 United Kingdom FALSE
+buckinghamshire gb Europe Northern Europe FALSE 1 2021-02-03 258178243 relation "Buckinghamshire, South East, England, United Kingdom" boundary historic 0.696549595581997 United Kingdom FALSE
+building and housing research center gb Europe Northern Europe FALSE 1 2021-02-03 155007660 way "South Northants Housing Trust, Burcote Road, Towcester Research Park, Towcester, South Northamptonshire, Northamptonshire, East Midlands, England, NN12 6AZ, United Kingdom" building commercial 0.301 United Kingdom FALSE
+cambridge crystallographic data centre gb Europe Northern Europe FALSE 1 2021-02-03 119553360 way "Cambridge Crystallographic Data Centre, 12, Union Road, Newtown, Cambridge, Cambridgeshire, East of England, England, CB2 1EZ, United Kingdom" building yes 0.401 United Kingdom FALSE
+cambridge university press gb Europe Northern Europe FALSE 1 2021-02-03 177748716 way "Cambridge University Press, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 8BS, United Kingdom" landuse industrial 0.975395195503227 United Kingdom FALSE
+canterbury gb Europe Northern Europe FALSE 1 2021-02-03 257929986 relation "Canterbury, Kent, South East, England, United Kingdom" boundary administrative 0.689001871311268 United Kingdom FALSE
+centre for science and policy gb Europe Northern Europe FALSE 1 2021-02-03 130406915 way "Centre for Science and Policy, 11-12, Trumpington Street, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 1QA, United Kingdom" building university 0.501 United Kingdom FALSE
+china china gb Europe Northern Europe FALSE 1 2021-02-03 232368687 way "China China, 6, Station Road, Lyminge, Folkestone and Hythe, Kent, South East, England, CT18 8HP, United Kingdom" amenity restaurant 0.201 United Kingdom FALSE
+christian aid gb Europe Northern Europe FALSE 1 2021-02-03 115017495 way "Christian Aid, 35-41, Lower Marsh, Lambeth, London Borough of Lambeth, London, Greater London, England, SE1 7RL, United Kingdom" office ngo 0.201 United Kingdom FALSE
+city university london gb Europe Northern Europe FALSE 1 2021-02-03 4711510 node "Myddleton Street Building, City University London, Myddelton Street, Clerkenwell Green, Clerkenwell, London Borough of Islington, London, Greater London, England, EC1R 1UW, United Kingdom" place house 0.301 United Kingdom FALSE
+civil aviation gb Europe Northern Europe FALSE 1 2021-02-03 109886796 way "Civil Aviation, East Fortune Circuit, Crauchie, East Lothian, Scotland, EH39 5LF, United Kingdom" building yes 0.201 United Kingdom FALSE
+climatic change gb Europe Northern Europe FALSE 1 2021-02-03 99663934 way "Climatic Research Unit (CRU), Chancellors Drive, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" building yes 0.427161274702289 United Kingdom FALSE
+"collins, the nih" gb Europe Northern Europe FALSE 1 2021-02-03 258666253 relation "Collins, Northern Ireland, United Kingdom" boundary administrative 0.45 United Kingdom FALSE
+coventry uk gb Europe Northern Europe FALSE 1 2021-02-03 257209281 relation "Coventry, West Midlands Combined Authority, West Midlands, England, United Kingdom" boundary administrative 0.692751900650216 United Kingdom FALSE
+cowling gb Europe Northern Europe FALSE 1 2021-02-03 153851 node "Cowling, Craven, North Yorkshire, Yorkshire and the Humber, England, BD22 0BX, United Kingdom" place village 0.375 United Kingdom FALSE
+crossrail gb Europe Northern Europe FALSE 1 2021-02-03 236256742 way "Elizabeth Line, Church Manor Way, Abbey Wood, Royal Borough of Greenwich, London, Greater London, England, SE2 9LX, United Kingdom" railway construction 0.365618504568294 United Kingdom FALSE
+csa gb Europe Northern Europe FALSE 1 2021-02-03 112088848 way "Colonsay Airport, B8086, Lower Kilchattan, Scalasaig, Argyll and Bute, Scotland, PA61 7YR, United Kingdom" aeroway aerodrome 0.358888290194715 United Kingdom FALSE
+cse gb Europe Northern Europe FALSE 1 2021-02-03 109879705 way "Computer Science, University of York, Heslington, York, Yorkshire and the Humber, England, YO10 5GH, United Kingdom" building university 0.001 United Kingdom FALSE
+culham centre gb Europe Northern Europe FALSE 1 2021-02-03 688400 node "Culham, South Oxfordshire, Oxfordshire, South East, England, OX14 4LY, United Kingdom" place village 0.375 United Kingdom FALSE
+culham science centre gb Europe Northern Europe FALSE 1 2021-02-03 168790121 way "Culham Science Centre, Clifton Hampden, South Oxfordshire, Oxfordshire, South East, England, United Kingdom" landuse commercial 0.5 United Kingdom FALSE
+daily mail gb Europe Northern Europe FALSE 1 2021-02-03 24473561 node "Daily Mail, Weoley Castle Road, Weoley Castle, Birmingham, West Midlands Combined Authority, West Midlands, England, B29, United Kingdom" shop newsagent 0.201 United Kingdom FALSE
+dartmouth gb Europe Northern Europe FALSE 1 2021-02-03 139925 node "Dartmouth, South Hams, Devon, South West England, England, TQ6 9ES, United Kingdom" place town 0.580540443145906 United Kingdom FALSE
+dcms gb Europe Northern Europe FALSE 1 2021-02-03 54322395 node "Department for Digital, Culture, Media & Sport, 100, Parliament Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 2BQ, United Kingdom" office government 0.408175130056335 United Kingdom FALSE
+de montfort university gb Europe Northern Europe FALSE 1 2021-02-03 102186166 way "De Montfort University, Oxford Street, Bede Island, Leicester, City of Leicester, East Midlands, England, LE1 5XT, United Kingdom" amenity university 0.301 United Kingdom FALSE
+defence ministry gb Europe Northern Europe FALSE 1 2021-02-03 98588582 way "Ministry of Defence, Horse Guards Avenue, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2HB, United Kingdom" military office 0.731875732226719 United Kingdom FALSE
+democrats gb Europe Northern Europe FALSE 1 2021-02-03 23277141 node "Liberal Democrats, 8–10, Great George Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3AE, United Kingdom" office political_party 0.497946206068361 United Kingdom FALSE
+department gb Europe Northern Europe FALSE 1 2021-02-03 88415175 way "The Department, Lawton Street, Ropewalks, Liverpool, North West England, England, L1 1FS, United Kingdom" building yes 0.101 United Kingdom FALSE
+department of business innovation and skills gb Europe Northern Europe FALSE 1 2021-02-03 18987190 node "Department of Business, Innovation and Skills, 1, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1, United Kingdom" office government 0.601 United Kingdom FALSE
+"department of veterinary medicine, university of cambridge" gb Europe Northern Europe FALSE 1 2021-02-03 129270161 way "Department of Veterinary Medicine (Vet School), Conduit Head Road, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0EY, United Kingdom" amenity university 0.601 United Kingdom FALSE
+diabetes center gb Europe Northern Europe FALSE 1 2021-02-03 84497499 way "Diabetes Centre, Heath Road, Rushmere, Ipswich, Suffolk, East of England, England, IP4 5SS, United Kingdom" building hospital 0.101 United Kingdom FALSE
+diamond light source gb Europe Northern Europe FALSE 1 2021-02-03 258557940 relation "Diamond Light Source Synchrotron, Road Five, Chilton, Vale of White Horse, Oxfordshire, South East, England, OX11 0PW, United Kingdom" amenity research_institute 0.301 United Kingdom FALSE
+digital services gb Europe Northern Europe FALSE 1 2021-02-03 68602811 node "Digital Services, 116, Westmead Road, Benhilton, London Borough of Sutton, London, Greater London, England, SM1 4JE, United Kingdom" shop electronics 0.201 United Kingdom FALSE
+dla piper gb Europe Northern Europe FALSE 1 2021-02-03 26548047 node "DLA Piper, 101, Barbirolli Square, City Centre, Manchester, Greater Manchester, North West England, England, M2 3BG, United Kingdom" office lawyer 0.201 United Kingdom FALSE
+dmx gb Europe Northern Europe FALSE 1 2021-02-03 158234190 way "DMX Productions, Unit 2, 14-16, Bissell Street, Digbeth, Highgate, Birmingham, West Midlands Combined Authority, West Midlands, England, B5 7HP, United Kingdom" office company 0.101 United Kingdom FALSE
+earlham institute gb Europe Northern Europe FALSE 1 2021-02-03 153626366 way "Earlham Institute, Rosalind Franklin Road, Colney, Norwich, Norfolk, East of England, England, NR4 7UZ, United Kingdom" amenity research_institute 0.201 United Kingdom FALSE
+eaves gb Europe Northern Europe FALSE 1 2021-02-03 642644 node "Eaves, Wyre, Lancashire, North West England, England, PR4 0BE, United Kingdom" place village 0.375 United Kingdom FALSE
+edge hill university gb Europe Northern Europe FALSE 1 2021-02-03 132503554 way "Edge Hill University, St Helens Road, Ormskirk, West Lancashire, Lancashire, North West England, England, L39 4QP, United Kingdom" amenity university 0.716230582936297 United Kingdom FALSE
+eisai gb Europe Northern Europe FALSE 1 2021-02-03 66344478 node "Eisai, Mosquito Way, Comet Square, Hatfield, Welwyn Hatfield, Hertfordshire, East of England, England, AL10 9SN, United Kingdom" highway bus_stop 0.101 United Kingdom FALSE
+embo gb Europe Northern Europe FALSE 1 2021-02-03 848668 node "Embo, Highland, Scotland, IV25 3PS, United Kingdom" place village 0.510664855391163 United Kingdom FALSE
+emsl gb Europe Northern Europe FALSE 1 2021-02-03 65408688 node "EMSL, Arden Press Way, Phoenix Park Estate, Jubilee Industrial Centre, Norton, North Hertfordshire, Hertfordshire, East of England, England, SG6 1LH, United Kingdom" office yes 0.101 United Kingdom FALSE
+essex gb Europe Northern Europe FALSE 1 2021-02-03 257296477 relation "Essex, England, United Kingdom" boundary ceremonial 0.723732857491298 United Kingdom FALSE
+european centre for medium-range weather forecasts in reading gb Europe Northern Europe FALSE 1 2021-02-03 101206182 way "European Centre for Medium-Range Weather Forecasts, Shinfield, Reading, Wokingham, South East, England, RG2 9AX, United Kingdom" landuse industrial 1.1 United Kingdom FALSE
+faam gb Europe Northern Europe FALSE 1 2021-02-03 240912494 way "Faam, 131, Percy Road, Whitton High Street, Whitton, London Borough of Richmond upon Thames, London, Greater London, England, TW2 6HT, United Kingdom" shop art 0.101 United Kingdom FALSE
+giffords gb Europe Northern Europe FALSE 1 2021-02-03 153526702 way "Giffords, Haverhill Road, Stapleford, South Cambridgeshire, Cambridgeshire, East of England, England, CB22 5BX, United Kingdom" building house 0.101 United Kingdom FALSE
+glasgow university gb Europe Northern Europe FALSE 1 2021-02-03 96372396 way "University of Glasgow, Byres Road, Yorkhill, Dowanhill, Glasgow, Glasgow City, Scotland, G12 8TD, United Kingdom" amenity university 0.762549854310082 United Kingdom FALSE
+global challenges gb Europe Northern Europe FALSE 1 2021-02-03 70067724 node "Global Adventure Challenges Ltd, Hope Street, Lache, City of Chester, Chester, Cheshire West and Chester, North West England, England, CH4 8BU, United Kingdom" shop travel_agency 0.201 United Kingdom FALSE
+goldman sachs gb Europe Northern Europe FALSE 1 2021-02-03 98808694 way "Goldman Sachs, 120, Fleet Street, Blackfriars, City of London, Greater London, England, EC4A 2BE, United Kingdom" office company 0.458218474293395 United Kingdom FALSE
+goonhilly earth station gb Europe Northern Europe FALSE 1 2021-02-03 122363874 way "Goonhilly Satellite Earth Station, Mawgan-in-Meneage, Cornwall, South West England, England, United Kingdom" landuse commercial 0.624352223496241 United Kingdom FALSE
+grantham institute gb Europe Northern Europe FALSE 1 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.472343749103071 United Kingdom FALSE
+grantham museum gb Europe Northern Europe FALSE 1 2021-02-03 144368628 way "Grantham Museum, Saint Peter's Hill, South Kesteven, Lincolnshire, East Midlands, England, NG31 6QA, United Kingdom" tourism museum 0.201 United Kingdom FALSE
+grantham research institute gb Europe Northern Europe FALSE 1 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.572343749103071 United Kingdom FALSE
+graphene engineering innovation centre gb Europe Northern Europe FALSE 1 2021-02-03 184596819 way "Graphene Engineering Innovation Centre, Sackville Street, City Centre, Manchester, Greater Manchester, North West England, England, M1 7DN, United Kingdom" building construction 0.401 United Kingdom FALSE
+green bonds gb Europe Northern Europe FALSE 1 2021-02-03 6339326 node "Bonds, Barnacre-with-Bonds, Garstang, Wyre, Lancashire, North West England, England, PR3 1ZQ, United Kingdom" place hamlet 0.35 United Kingdom FALSE
+greenpeace uk gb Europe Northern Europe FALSE 1 2021-02-03 98060114 way "Greenpeace, Canonbury Villas, Highbury, London Borough of Islington, London, Greater London, England, N1 2PN, United Kingdom" building office 0.101 United Kingdom FALSE
+gryphon gb Europe Northern Europe FALSE 1 2021-02-03 1367040 node "The Gryphon, 9, Vera Avenue, Grange Park, London Borough of Enfield, London, Greater London, England, N21 1RE, United Kingdom" amenity restaurant 0.101 United Kingdom FALSE
+hampshire gb Europe Northern Europe FALSE 1 2021-02-03 258402538 relation "Hampshire, England, United Kingdom" boundary ceremonial 0.725068049293215 United Kingdom FALSE
+health protection agency gb Europe Northern Europe FALSE 1 2021-02-03 17913167 node "Health Protection Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.301 United Kingdom FALSE
+heart foundation gb Europe Northern Europe FALSE 1 2021-02-03 75654553 node "Heart Foundation, Walter Street, Harpurhey, Manchester, Greater Manchester, North West England, England, M9 4DL, United Kingdom" shop charity 0.201 United Kingdom FALSE
+high voltage laboratory gb Europe Northern Europe FALSE 1 2021-02-03 110289562 way "High Voltage Laboratory, University Crescent, Highfield, Southampton, South East, England, SO17 1TR, United Kingdom" building yes 0.301 United Kingdom FALSE
+hilton gb Europe Northern Europe FALSE 1 2021-02-03 6367561 node "Hilton, Inverness, Highland, Scotland, IV2 4PX, United Kingdom" place suburb 0.511602248356457 United Kingdom FALSE
+hli gb Europe Northern Europe FALSE 1 2021-02-03 226710397 way "HLI, Stogursey, Somerset West and Taunton, Somerset, South West England, England, United Kingdom" landuse industrial 0.3 United Kingdom FALSE
+horsham gb Europe Northern Europe FALSE 1 2021-02-03 257416768 relation "Horsham, West Sussex, South East, England, United Kingdom" boundary administrative 0.556493353758773 United Kingdom FALSE
+houses of parliament gb Europe Northern Europe FALSE 1 2021-02-03 258402540 relation "Palace of Westminster, The Terrace, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 0AA, United Kingdom" tourism attraction 0.655970619437777 United Kingdom FALSE
+idq gb Europe Northern Europe FALSE 1 2021-02-03 37948615 node "Idq, Kenyon Street, Jewellery Quarter, Aston, Birmingham, West Midlands Combined Authority, West Midlands, England, B18, United Kingdom" office company 0.101 United Kingdom FALSE
+imperial college london and university college london gb Europe Northern Europe FALSE 1 2021-02-03 301718758 relation "Imperial College London, Exhibition Road, Knightsbridge, City of Westminster, London, Greater London, England, SW7 2AZ, United Kingdom" amenity university 1.09521355701007 United Kingdom FALSE
+independent living gb Europe Northern Europe FALSE 1 2021-02-03 48022150 node "Independent Living, Heworth Road, Heworth, York, Yorkshire and the Humber, England, YO31 0AD, United Kingdom" shop mobility 0.201 United Kingdom FALSE
+information commissioner's office gb Europe Northern Europe FALSE 1 2021-02-03 19001980 node "Information Commissioner's Office, Water Lane, Fulshaw Park, Wilmslow, Cheshire East, North West England, England, SK9 5AF, United Kingdom" amenity office 0.401 United Kingdom FALSE
+innovate uk gb Europe Northern Europe FALSE 1 2021-02-03 176517550 way "Innovate, Chartermark Way, Colburn Business Park, Colburn, Richmondshire, North Yorkshire, Yorkshire and the Humber, England, DL9 4QJ, United Kingdom" building commercial 0.101 United Kingdom FALSE
+institute for fiscal studies gb Europe Northern Europe FALSE 1 2021-02-03 50576944 node "Institute for Fiscal Studies, 7, Store Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7DB, United Kingdom" office ngo 0.70799018260571 United Kingdom FALSE
+institute of development studies gb Europe Northern Europe FALSE 1 2021-02-03 258327927 relation "Institute of Development Studies, Arts Road, Stanmer, Brighton and Hove, South East, England, BN1 9RE, United Kingdom" building university 0.401 United Kingdom FALSE
+institute of hazard gb Europe Northern Europe FALSE 1 2021-02-03 97604219 way "Institute of Hazard and Risk Research, South Road, Houghall, City of Durham, Durham, County Durham, North East England, England, DH1 3TA, United Kingdom" building university 0.301 United Kingdom FALSE
+international animal rescue gb Europe Northern Europe FALSE 1 2021-02-03 62630833 node "International Animal Rescue, 121, High Street, New Town, Uckfield, Wealden, East Sussex, South East, England, TN22 1RE, United Kingdom" office yes 0.301 United Kingdom FALSE
+international institute for strategic studies gb Europe Northern Europe FALSE 1 2021-02-03 112205362 way "International Institute for Strategic Studies, 6, Temple Place, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 2PG, United Kingdom" office research 0.893742367962228 United Kingdom FALSE
+international maritime organization gb Europe Northern Europe FALSE 1 2021-02-03 102541491 way "International Maritime Organization, 4, Albert Embankment, Vauxhall, London Borough of Lambeth, London, Greater London, England, SE1 7SR, United Kingdom" building office 0.301 United Kingdom FALSE
+isc gb Europe Northern Europe FALSE 1 2021-02-03 147374618 way "St Mary's Airport, High Cross Lane, Parting Carn, St Mary's, Old Town, Isles of Scilly, South West England, England, TR21 0NG, United Kingdom" aeroway aerodrome 0.418002769416701 United Kingdom FALSE
+island press gb Europe Northern Europe FALSE 1 2021-02-03 159537 node "Press, North East Derbyshire, Derbyshire, East Midlands, England, S42 6AZ, United Kingdom" place village 0.375 United Kingdom FALSE
+isro satellite centre gb Europe Northern Europe FALSE 1 2021-02-03 54207550 node "The Satellite Centre, Westgate Road, Arthur's Hill, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE4 6AR, United Kingdom" shop yes 0.201 United Kingdom FALSE
+joint committee gb Europe Northern Europe FALSE 1 2021-02-03 117993195 way "WJEC, Western Avenue, Llandaff, Cardiff, Cymru / Wales, CF, United Kingdom" office quango 0.314317004425986 United Kingdom FALSE
+kavli institute for cosmology gb Europe Northern Europe FALSE 1 2021-02-03 108662646 way "Kavli Institute for Cosmology, IoA Path, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0HA, United Kingdom" building university 0.401 United Kingdom FALSE
+kew gb Europe Northern Europe FALSE 1 2021-02-03 114707 node "Kew, London Borough of Richmond upon Thames, London, Greater London, England, TW9 3AB, United Kingdom" place suburb 0.575721107070673 United Kingdom FALSE
+laboratory for molecular biology gb Europe Northern Europe FALSE 1 2021-02-03 85272032 node "MRC Laboratory for Molecular Cell Biology, Malet Place, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0AT, United Kingdom" amenity university 0.401 United Kingdom FALSE
+lancashire gb Europe Northern Europe FALSE 1 2021-02-03 258129935 relation "Lancashire, England, United Kingdom" boundary ceremonial 0.742602820947042 United Kingdom FALSE
+lanner gb Europe Northern Europe FALSE 1 2021-02-03 149878 node "Lanner, Cornwall, South West England, England, TR16 6DW, United Kingdom" place village 0.375 United Kingdom FALSE
+leeds gb Europe Northern Europe FALSE 1 2021-02-03 258136264 relation "Leeds, West Yorkshire, Yorkshire and the Humber, England, United Kingdom" boundary administrative 0.728801062334147 United Kingdom FALSE
+leicester university gb Europe Northern Europe FALSE 1 2021-02-03 162085793 way "University of Leicester, University Road, Highfields, Leicester, City of Leicester, East Midlands, England, LE1 7RH, United Kingdom" amenity university 0.695552033321719 United Kingdom FALSE
+lofar gb Europe Northern Europe FALSE 1 2021-02-03 138863067 way "LOFAR, Chilbolton, Test Valley, Hampshire, South East, England, United Kingdom" landuse observatory 0.47774807032046 United Kingdom FALSE
+london research institute gb Europe Northern Europe FALSE 1 2021-02-03 116604474 way "London Research Institute - Clare Hall Site, South Mimms, Ridge, Hertsmere, Hertfordshire, East of England, England, EN6 3LD, United Kingdom" landuse industrial 0.5 United Kingdom FALSE
+london school of economics and political science gb Europe Northern Europe FALSE 1 2021-02-03 258598818 relation "London School of Economics and Political Science, Houghton Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AE, United Kingdom" amenity university 1.28817687564795 United Kingdom FALSE
+los alamos study group gb Europe Northern Europe FALSE 1 2021-02-03 145794537 way "Study Centre Group Provision, Cheyne Path, Hanwell, London Borough of Ealing, London, Greater London, England, W7, United Kingdom" building school 0.201 United Kingdom FALSE
+loughborough gb Europe Northern Europe FALSE 1 2021-02-03 105872 node "Loughborough, Charnwood, Leicestershire, East Midlands, England, LE11 5BJ, United Kingdom" place town 0.577635896973777 United Kingdom FALSE
+lovell telescope gb Europe Northern Europe FALSE 1 2021-02-03 84170869 way "Lovell Telescope, Bomish Lane, Blackden Heath, Goostrey, Cheshire East, North West England, England, CW4 8FZ, United Kingdom" man_made telescope 0.610900543630094 United Kingdom FALSE
+lse gb Europe Northern Europe FALSE 1 2021-02-03 258598818 relation "London School of Economics and Political Science, Houghton Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AE, United Kingdom" amenity university 0.588176875647945 United Kingdom FALSE
+lshtm gb Europe Northern Europe FALSE 1 2021-02-03 185180502 way "London School of Hygiene and Tropical Medicine, Gower Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7HT, United Kingdom" amenity university 0.441052336501247 United Kingdom FALSE
+malaysia airlines gb Europe Northern Europe FALSE 1 2021-02-03 82530882 node "Malaysia Airlines, 247-249, Cromwell Road, The Boltons, Earl's Court, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW5 9GA, United Kingdom" office company 0.201 United Kingdom FALSE
+medicines and healthcare gb Europe Northern Europe FALSE 1 2021-02-03 17808193 node "Medicines and Healthcare Products Regulatory Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.629555066820797 United Kingdom FALSE
+medium-range weather forecasts in reading gb Europe Northern Europe FALSE 1 2021-02-03 101206182 way "European Centre for Medium-Range Weather Forecasts, Shinfield, Reading, Wokingham, South East, England, RG2 9AX, United Kingdom" landuse industrial 0.8 United Kingdom FALSE
+megaloceros gb Europe Northern Europe FALSE 1 2021-02-03 251919749 way "Megaloceros - Irish Elk (fawn), Thicket Road, Anerley, Crystal Palace, London Borough of Bromley, London, Greater London, England, SE20 8DP, United Kingdom" tourism artwork 0.101 United Kingdom FALSE
+merton college gb Europe Northern Europe FALSE 1 2021-02-03 258811698 relation "Merton College, Grove Passage, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4JF, United Kingdom" amenity university 0.446981559290857 United Kingdom FALSE
+metropolitan police gb Europe Northern Europe FALSE 1 2021-02-03 258571119 relation "Metropolitan Police, Greater London, England, United Kingdom" boundary police 0.516167966338533 United Kingdom FALSE
+middlesex university gb Europe Northern Europe FALSE 1 2021-02-03 97180538 way "Middlesex University, The Burroughs, Hendon Central, London Borough of Barnet, London, Greater London, England, NW4 4LA, United Kingdom" amenity university 0.672198296881392 United Kingdom FALSE
+montefiore medical center gb Europe Northern Europe FALSE 1 2021-02-03 113982822 way "East Cliff Practice, Dumpton Park Drive, East Cliff, Ramsgate, Thanet, Kent, South East, England, CT11 8AD, United Kingdom" amenity doctors 0.001 United Kingdom FALSE
+motorola gb Europe Northern Europe FALSE 1 2021-02-03 23450963 node "Motorola, St. Andrews, Broad Blunsdon, Swindon, South West England, England, SN25 4YF, United Kingdom" place neighbourhood 0.35 United Kingdom FALSE
+mrc cognition and brain sciences unit gb Europe Northern Europe FALSE 1 2021-02-03 100156548 way "MRC Cognition and Brain Sciences Unit, 15, Chaucer Road, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 7EF, United Kingdom" building university 0.835968355602442 United Kingdom FALSE
+mrc institute of hearing research gb Europe Northern Europe FALSE 1 2021-02-03 104741680 way "MRC Institute of Hearing Research, Science Road, Dunkirk, City of Nottingham, East Midlands, England, NG7 2JE, United Kingdom" building yes 0.501 United Kingdom FALSE
+museum of archaeology and anthropology gb Europe Northern Europe FALSE 1 2021-02-03 4139522 node "Museum of Archaeology and Anthropology, Downing Street, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 3DZ, United Kingdom" tourism museum 0.87774807032046 United Kingdom FALSE
+national association of head teachers gb Europe Northern Europe FALSE 1 2021-02-03 64457372 node "National Association of Head Teachers, Boltro Road, Lucastes, Haywards Heath, Mid Sussex, West Sussex, South East, England, RH16 1RG, United Kingdom" office union 0.501 United Kingdom FALSE
+national audit office gb Europe Northern Europe FALSE 1 2021-02-03 115991832 way "National Audit Office, 157-197, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9SP, United Kingdom" office government 0.644585942469205 United Kingdom FALSE
+national institute for advanced studies gb Europe Northern Europe FALSE 1 2021-02-03 156623105 way "Institute for Advanced Studies, 1, University Walk, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS2, United Kingdom" building university 0.401 United Kingdom FALSE
+national institute of agricultural botany gb Europe Northern Europe FALSE 1 2021-02-03 259467768 relation "NIAB (National Institute of Agricultural Botany), Howes Place, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0LD, United Kingdom" building yes 0.501 United Kingdom FALSE
+nec gb Europe Northern Europe FALSE 1 2021-02-03 257864413 relation "National Exhibition Centre, Station Way, Bickenhill and Marston Green, Birmingham, West Midlands Combined Authority, West Midlands, England, B40 1PA, United Kingdom" amenity exhibition_center 0.397362929796699 United Kingdom FALSE
+nestle gb Europe Northern Europe FALSE 1 2021-02-03 152769411 way "Nestle, Dalston, Carlisle, Cumbria, North West England, England, CA5 7NH, United Kingdom" landuse industrial 0.3 United Kingdom FALSE
+newcastle gb Europe Northern Europe FALSE 1 2021-02-03 257800552 relation "Newcastle upon Tyne, Tyne and Wear, North East England, England, United Kingdom" boundary administrative 0.720469585639904 United Kingdom FALSE
+nfu gb Europe Northern Europe FALSE 1 2021-02-03 119235228 way "NFU Mutual, Blackbrook Park Avenue, Blackbrook Business Park, Blackbrook, Ruishton, Somerset West and Taunton, Somerset, South West England, England, TA1 2FU, United Kingdom" office insurance 0.402323854176492 United Kingdom FALSE
+nhs trust gb Europe Northern Europe FALSE 1 2021-02-03 84981127 way "Cambridge Biomedical Campus, Hills Road (cycleway), Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 8QE, United Kingdom" amenity hospital 0.283827688081076 United Kingdom FALSE
+northrup grumman gb Europe Northern Europe FALSE 1 2021-02-03 71896950 node "Northrup Grumman, 118, Burlington Road, West Barnes, London Borough of Merton, London, Greater London, England, KT3, United Kingdom" office company 0.201 United Kingdom FALSE
+northumbria university gb Europe Northern Europe FALSE 1 2021-02-03 4155510 node "Northumbria University, Sandyford Road, Haymarket, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE1 8JG, United Kingdom" highway bus_stop 0.201 United Kingdom FALSE
+northumbria university in newcastle gb Europe Northern Europe FALSE 1 2021-02-03 4155510 node "Northumbria University, Sandyford Road, Haymarket, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE1 8JG, United Kingdom" highway bus_stop 0.401 United Kingdom FALSE
+oc robotics gb Europe Northern Europe FALSE 1 2021-02-03 109463158 way "OC Robotics, Unit 5, Emma-Chris Way, Abbey Wood Business Park, Filton, Bristol, South Gloucestershire, South West England, England, BS34 7JU, United Kingdom" building yes 0.201 United Kingdom FALSE
+office of medical services gb Europe Northern Europe FALSE 1 2021-02-03 174252715 way "Medical Services, Church Road, Aston, Birmingham, West Midlands Combined Authority, West Midlands, England, B6, United Kingdom" building yes 0.201 United Kingdom FALSE
+open data institute gb Europe Northern Europe FALSE 1 2021-02-03 51911699 node "Open Data Institute, 65, Clifton Street, Shoreditch, London Borough of Hackney, London, Greater London, England, EC2A 4JE, United Kingdom" office company 0.301 United Kingdom FALSE
+oxford circus gb Europe Northern Europe FALSE 1 2021-02-03 22497767 node "Oxford Circus, Oxford Street, Fitzrovia, City of Westminster, London, Greater London, England, W1B 2ER, United Kingdom" tourism information 0.685759448486215 United Kingdom FALSE
+oxford university press gb Europe Northern Europe FALSE 1 2021-02-03 94205924 way "Oxford University Press, Jericho, Oxford, Oxfordshire, South East, England, OX2 6DP, United Kingdom" landuse commercial 0.972109324380291 United Kingdom FALSE
+pakefield gb Europe Northern Europe FALSE 1 2021-02-03 148091667 way "Pakefield, Lowestoft, East Suffolk, Suffolk, East of England, England, United Kingdom" place suburb 0.432701719497591 United Kingdom FALSE
+panasonic electric works gb Europe Northern Europe FALSE 1 2021-02-03 193292786 way "Panasonic Electric Works, Sunrise Parkway, Linford Wood, Stantonbury, Milton Keynes, South East, England, MK14 6LS, United Kingdom" building yes 0.301 United Kingdom FALSE
+people's welfare gb Europe Northern Europe FALSE 1 2021-02-03 173813574 way "Old People's Welfare Centre, Nottingham Road, Daybrook, Arnold, City of Nottingham, Nottinghamshire, East Midlands, England, NG5 6JZ, United Kingdom" amenity community_centre 0.301 United Kingdom FALSE
+polar institute gb Europe Northern Europe FALSE 1 2021-02-03 86946864 way "Scott Polar Research Institute (SPRI), Lensfield Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 1ER, United Kingdom" building university 0.609070137722352 United Kingdom FALSE
+public health england gb Europe Northern Europe FALSE 1 2021-02-03 118029905 way "Public Health England, Idmiston, Wiltshire, South West England, England, SP4 0JG, United Kingdom" landuse industrial 0.5 United Kingdom FALSE
+queen's college gb Europe Northern Europe FALSE 1 2021-02-03 93331608 way "The Queen's College, High Street, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4AN, United Kingdom" amenity university 0.76362357530052 United Kingdom FALSE
+reed elsevier gb Europe Northern Europe FALSE 1 2021-02-03 26271747 node "Reed Elsevier, Jamestown Road, Chalk Farm, London Borough of Camden, London, Greater London, England, NW1 7DJ, United Kingdom" office company 0.201 United Kingdom FALSE
+regulatory agency gb Europe Northern Europe FALSE 1 2021-02-03 17808193 node "Medicines and Healthcare Products Regulatory Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.529555066820797 United Kingdom FALSE
+research europe gb Europe Northern Europe FALSE 1 2021-02-03 64980625 node "Toshiba Research Europe, 208, Cambridge Science Park, Chesterton, Cambridge, Cambridgeshire, East of England, England, CB4 0GZ, United Kingdom" office company 0.201 United Kingdom FALSE
+research pathogen gb Europe Northern Europe FALSE 1 2021-02-03 102722066 way "Peter Medawar Building for Pathogen Research, South Parks Road, City Centre, Oxford, Oxfordshire, South East, England, OX1 3RF, United Kingdom" building university 0.201 United Kingdom FALSE
+rothschild gb Europe Northern Europe FALSE 1 2021-02-03 131345270 way "N M Rothschild & Sons, St Swithin's Lane, Bishopsgate, City of London, Greater London, England, EC4N 8AL, United Kingdom" building commercial 0.511834385728338 United Kingdom FALSE
+royal botanic gardens gb Europe Northern Europe FALSE 1 2021-02-03 85407776 way "Royal Botanic Garden Edinburgh, Warriston Drive, Warriston, Stockbridge/Inverleith, City of Edinburgh, Scotland, EH3 5LY, United Kingdom" leisure garden 0.616158624493363 United Kingdom FALSE
+royal centre for defence medicine gb Europe Northern Europe FALSE 1 2021-02-03 192979920 way "Royal Centre for Defence Medicine, Longbridge, Birmingham, West Midlands Combined Authority, West Midlands, England, United Kingdom" landuse residential 0.7 United Kingdom FALSE
+royal college of surgeons gb Europe Northern Europe FALSE 1 2021-02-03 106178821 way "Royal College of Surgeons, 35-43, Portugal Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 3PE, United Kingdom" place house 0.779338672131387 United Kingdom FALSE
+royal courts of justice gb Europe Northern Europe FALSE 1 2021-02-03 258488410 relation "Royal Courts of Justice, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2LL, United Kingdom" amenity courthouse 0.821202519145559 United Kingdom FALSE
+royal dutch shell gb Europe Northern Europe FALSE 1 2021-02-03 18968246 node "Send Shell Petrol Station, Portsmouth Road, Send, Guildford, Surrey, South East, England, GU23 7JY, United Kingdom" amenity fuel 0.101 United Kingdom FALSE
+royal entomological society gb Europe Northern Europe FALSE 1 2021-02-03 99366475 way "Royal Entomological Society, Chiswell Green Lane, St Stephen, Chiswell Green, St Albans, Hertfordshire, East of England, England, AL2 3AJ, United Kingdom" building yes 0.301 United Kingdom FALSE
+royal free gb Europe Northern Europe FALSE 1 2021-02-03 249802441 way "Royal Free Hospital, Haverstock Hill, Belsize Park, London Borough of Camden, London, Greater London, England, NW3 4PT, United Kingdom" amenity hospital 0.583512305679518 United Kingdom FALSE
+royal free hospital gb Europe Northern Europe FALSE 1 2021-02-03 249802441 way "Royal Free Hospital, Haverstock Hill, Belsize Park, London Borough of Camden, London, Greater London, England, NW3 4PT, United Kingdom" amenity hospital 0.683512305679517 United Kingdom FALSE
+royal greenwich observatory gb Europe Northern Europe FALSE 1 2021-02-03 156694701 way "Royal Observatory Greenwich, Blackheath Avenue, East Greenwich, Royal Borough of Greenwich, London, Greater London, England, SE10 8XJ, United Kingdom" tourism museum 0.796673547671832 United Kingdom FALSE
+royal holloway university of london gb Europe Northern Europe FALSE 1 2021-02-03 85234417 way "Royal Holloway, Prune Hill, Ripley Springs, Bakeham House, Stroude, Runnymede, Surrey, South East, England, TW20 9TR, United Kingdom" amenity university 0.661486997579685 United Kingdom FALSE
+royal observatory gb Europe Northern Europe FALSE 1 2021-02-03 156694701 way "Royal Observatory Greenwich, Blackheath Avenue, East Greenwich, Royal Borough of Greenwich, London, Greater London, England, SE10 8XJ, United Kingdom" tourism museum 0.696673547671832 United Kingdom FALSE
+royal society a gb Europe Northern Europe FALSE 1 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.947225834784319 United Kingdom FALSE
+royal society and science gb Europe Northern Europe FALSE 1 2021-02-03 40152391 node "Blue plaque: Royal Society of Chemistry publishing, 290-292, Cambridge Science Park, Milton, South Cambridgeshire, Cambridgeshire, East of England, England, CB4 0FZ, United Kingdom" historic memorial 0.401 United Kingdom FALSE
+royal society b 1 gb Europe Northern Europe FALSE 1 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.947225834784319 United Kingdom FALSE
+royal society for the prevention of cruelty to animals gb Europe Northern Europe FALSE 1 2021-02-03 162454414 way "Scarborough & District RSPCA, Albemarle back Road, The Old Town, Scarborough, North Yorkshire, Yorkshire and the Humber, England, YO11 1YA, United Kingdom" building retail 0.201 United Kingdom FALSE
+royal society for the protection of birds gb Europe Northern Europe FALSE 1 2021-02-03 145438865 way "RSPB South Stack, South Stack Road, Trearddur, Holyhead, Ynys Môn / Isle of Anglesey, Cymru / Wales, LL65 1YH, United Kingdom" tourism attraction 0.101 United Kingdom FALSE
+royal society of edinburgh gb Europe Northern Europe FALSE 1 2021-02-03 19133034 node "Royal Society of Edinburgh, 22-26, George Street, New Town, New Town/Broughton, City of Edinburgh, Scotland, EH2 2PQ, United Kingdom" office charity 0.401 United Kingdom FALSE
+royal society of medicine gb Europe Northern Europe FALSE 1 2021-02-03 100091001 way "Royal Society of Medicine, 1, Wimpole Street, Mayfair, City of Westminster, London, Greater London, England, W1G 8GP, United Kingdom" building yes 0.401 United Kingdom FALSE
+royal statistical society gb Europe Northern Europe FALSE 1 2021-02-03 103932057 way "Royal Statistical Society, 12, Errol Street, Saint Luke's, Finsbury, London Borough of Islington, London, Greater London, England, EC1Y 8LX, United Kingdom" office association 0.301 United Kingdom FALSE
+royal united hospital gb Europe Northern Europe FALSE 1 2021-02-03 101624625 way "Royal United Hospital, Combe Park, Bath, Bath and North East Somerset, South West England, England, BA1 3NG, United Kingdom" amenity hospital 0.56358119422997 United Kingdom FALSE
+saatchi gb Europe Northern Europe FALSE 1 2021-02-03 84638610 way "Saatchi Gallery, King's Road, Hans Town, Chelsea, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW3 4RY, United Kingdom" tourism gallery 0.537540837084501 United Kingdom FALSE
+scarborough gb Europe Northern Europe FALSE 1 2021-02-03 258153305 relation "Scarborough, North Yorkshire, Yorkshire and the Humber, England, United Kingdom" boundary administrative 0.610764750724671 United Kingdom FALSE
+school of biological sciences gb Europe Northern Europe FALSE 1 2021-02-03 132715486 way "School of Biological Sciences, Tyndall Avenue, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS8 1TH, United Kingdom" building university 0.401 United Kingdom FALSE
+school of public health gb Europe Northern Europe FALSE 1 2021-02-03 246254593 way "School of Public Health, White City Estate, London Borough of Hammersmith and Fulham, London, Greater London, England, United Kingdom" landuse construction 0.6 United Kingdom FALSE
+science & technology facilities council gb Europe Northern Europe FALSE 1 2021-02-03 103985987 way "Royal Observatory, Edinburgh, Observatory Road, Blackford Hill, Blackford, City of Edinburgh, Scotland, EH9 3HJ, United Kingdom" tourism attraction 0.360151663261328 United Kingdom FALSE
+science policy centre gb Europe Northern Europe FALSE 1 2021-02-03 130406915 way "Centre for Science and Policy, 11-12, Trumpington Street, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 1QA, United Kingdom" building university 0.301 United Kingdom FALSE
+scott polar research institute gb Europe Northern Europe FALSE 1 2021-02-03 65100696 node "Scott Polar Research Institute, Lensfield Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 1EH, United Kingdom" emergency defibrillator 0.401 United Kingdom FALSE
+scottish crop research institute gb Europe Northern Europe FALSE 1 2021-02-03 243039744 way "Scottish Crop Research Institute, Kingoodie, Invergowrie, Perth and Kinross, Scotland, DD2 5DA, United Kingdom" landuse research 0.6 United Kingdom FALSE
+scottish national party gb Europe Northern Europe FALSE 1 2021-02-03 44686012 node "Scottish National Party, Brothock Bridge, Westport, Arbroath, Angus, Scotland, DD11 1NP, United Kingdom" office political_party 0.301 United Kingdom FALSE
+shaw gb Europe Northern Europe FALSE 1 2021-02-03 142176 node "Shaw, Oldham, Greater Manchester, North West England, England, OL2 7WS, United Kingdom" place town 0.502153233789513 United Kingdom FALSE
+slim jims gb Europe Northern Europe FALSE 1 2021-02-03 11297848 node "Slim Jim's, Whitecross Place, Bishopsgate, City of London, Greater London, England, EC2M 2PF, United Kingdom" leisure sports_centre 0.101 United Kingdom FALSE
+soa gb Europe Northern Europe FALSE 1 2021-02-03 103007279 way "Soa, Argyll and Bute, Scotland, United Kingdom" place island 0.425 United Kingdom FALSE
+socialist party gb Europe Northern Europe FALSE 1 2021-02-03 51925227 node "The Socialist Party, Clapham High Street, Clapham Park, London Borough of Lambeth, London, Greater London, England, SW4 7TY, United Kingdom" office political_party 0.201 United Kingdom FALSE
+soho gb Europe Northern Europe FALSE 1 2021-02-03 164417340 way "Soho, City of Westminster, London, Greater London, England, United Kingdom" place suburb 0.608698314216003 United Kingdom FALSE
+space research centre gb Europe Northern Europe FALSE 1 2021-02-03 104827767 way "Airbus Defence and Space (DMCii), 60, Priestley Road, Surrey Research Park, Worplesdon, Wood Street, Guildford, Surrey, South East, England, GU2 7AG, United Kingdom" office company 0.201 United Kingdom FALSE
+spt gb Europe Northern Europe FALSE 1 2021-02-03 124844971 way "Stockport Railway Station, Grand Central, Portwood, Stockport, Greater Manchester, North West England, England, SK3 9HZ, United Kingdom" building train_station 0.357411994477751 United Kingdom FALSE
+st andrews gb Europe Northern Europe FALSE 1 2021-02-03 114614 node "St Andrews, Fife, Scotland, KY16 9PA, United Kingdom" place town 0.693656743140345 United Kingdom FALSE
+st helens gb Europe Northern Europe FALSE 1 2021-02-03 258010551 relation "St Helens, North West England, England, United Kingdom" boundary administrative 0.675666298352635 United Kingdom FALSE
+st pancras international gb Europe Northern Europe FALSE 1 2021-02-03 45307830 node "London St. Pancras International, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2QS, United Kingdom" railway station 0.798004419460758 United Kingdom FALSE
+strait gb Europe Northern Europe FALSE 1 2021-02-03 220194897 way "The Strait, Windmill Hill, Wartling, Windmill Hill, Wealden, East Sussex, South East, England, BN27 4SB, United Kingdom" highway primary 0.2 United Kingdom FALSE
+surrey gb Europe Northern Europe FALSE 1 2021-02-03 258959916 relation "Surrey, South East, England, United Kingdom" boundary ceremonial 0.732622270075043 United Kingdom FALSE
+surrey satellite technology ltd gb Europe Northern Europe FALSE 1 2021-02-03 42885695 node "Surrey Satellite Technology Ltd, Woolmer Way, Woolmer Trading Estate, Whitehill, Bordon, East Hampshire, Hampshire, South East, England, GU35 9QE, United Kingdom" building industrial 0.401 United Kingdom FALSE
+surrey space centre gb Europe Northern Europe FALSE 1 2021-02-03 11415803 node "Surrey Space Centre, Spine Road, Guildford Park, Guildford, Surrey, South East, England, GU2 7XJ, United Kingdom" office research 0.301 United Kingdom FALSE
+sutton trust gb Europe Northern Europe FALSE 1 2021-02-03 254201689 way "Sutton House, 2 & 4, Homerton High Street, Lower Clapton, Homerton, London Borough of Hackney, London, Greater London, England, E9 6JQ, United Kingdom" tourism attraction 0.429260878198397 United Kingdom FALSE
+tb alliance gb Europe Northern Europe FALSE 1 2021-02-03 244997628 way "Alliance, Mill Lane, City Centre, Castle, Cardiff, Cymru / Wales, CF, United Kingdom" tourism artwork 0.36691348680426 United Kingdom FALSE
+telegram gb Europe Northern Europe FALSE 1 2021-02-03 116623602 way "Greyabbey Road, Ballywalter, County Down, Northern Ireland, BT22 2NT, United Kingdom" highway secondary 0.1 United Kingdom FALSE
+tern gb Europe Northern Europe FALSE 1 2021-02-03 240534072 way "Tern, Tenby, Pembrokeshire, Cymru / Wales, United Kingdom" place neighbourhood 0.35 United Kingdom FALSE
+the pirbright institute gb Europe Northern Europe FALSE 1 2021-02-03 96398766 way "The Pirbright Institute, Pirbright, Guildford, Surrey, South East, England, GU24 0NF, United Kingdom" landuse industrial 0.5 United Kingdom FALSE
+the royal society gb Europe Northern Europe FALSE 1 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.947225834784319 United Kingdom FALSE
+the university of oxford gb Europe Northern Europe FALSE 1 2021-02-03 96249903 way "Oxford University Museum of Natural History, Parks Road, City Centre, Oxford, Oxfordshire, South East, England, OX1 3PW, United Kingdom" tourism museum 0.690225650640271 United Kingdom FALSE
+time team gb Europe Northern Europe FALSE 1 2021-02-03 63776799 node "Castle Hill (Time Team), Liddon Hill, Roundham, West Crewkerne, Crewkerne, South Somerset, Somerset, South West England, England, TA18 8RL, United Kingdom" historic archaeological_site 0.201 United Kingdom FALSE
+tokyo central wholesale market gb Europe Northern Europe FALSE 1 2021-02-03 154165677 way "Wholesale Market, Perry Barr, Birmingham, West Midlands Combined Authority, West Midlands, England, United Kingdom" landuse commercial 0.4 United Kingdom FALSE
+toshiba research europe gb Europe Northern Europe FALSE 1 2021-02-03 64980625 node "Toshiba Research Europe, 208, Cambridge Science Park, Chesterton, Cambridge, Cambridgeshire, East of England, England, CB4 0GZ, United Kingdom" office company 0.301 United Kingdom FALSE
+tree-ring laboratory gb Europe Northern Europe FALSE 1 2021-02-03 50297132 node "Newton's Apple Tree, Bushy Road, National Physical Laboratory, Hampton Hill, London Borough of Richmond upon Thames, London, Greater London, England, TW11 0NL, United Kingdom" natural tree 0.201 United Kingdom FALSE
+trojans gb Europe Northern Europe FALSE 1 2021-02-03 131238608 way "Liverpool Trojans Baseball Club, Bootle, Sefton, North West England, England, United Kingdom" landuse recreation_ground 0.3 United Kingdom FALSE
+u k gb Europe Northern Europe FALSE 1 2021-02-03 258411454 relation United Kingdom boundary administrative 1.07237801328373 United Kingdom FALSE
+ucl hospital gb Europe Northern Europe FALSE 1 2021-02-03 97008546 way "Petrie Museum of Egyptian Archeology, Malet Place, St Pancras, London Borough of Camden, London, Greater London, England, WC1E 6BT, United Kingdom" tourism museum 0.404546165234516 United Kingdom FALSE
+uk academy of medical sciences gb Europe Northern Europe FALSE 1 2021-02-03 223952996 way "Academy of Medical Sciences, 41, Portland Place, Fitzrovia, City of Westminster, London, Greater London, England, W1B 1AE, United Kingdom" office charity 0.401 United Kingdom FALSE
+uk biobank gb Europe Northern Europe FALSE 1 2021-02-03 139565700 way "UK Biobank, Europa Way, Stockport, Greater Manchester, North West England, England, SK3 0SA, United Kingdom" building warehouse 0.201 United Kingdom FALSE
+uk conservative party gb Europe Northern Europe FALSE 1 2021-02-03 150193380 way "Conservative Party, Glenlea Road, Well Hall, Royal Borough of Greenwich, London, Greater London, England, SE9 1DZ, United Kingdom" office political 0.201 United Kingdom FALSE
+uk department of health gb Europe Northern Europe FALSE 1 2021-02-03 139424486 way "Department Of Health, 39, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1, United Kingdom" office government 0.301 United Kingdom FALSE
+uk national graphene institute gb Europe Northern Europe FALSE 1 2021-02-03 301795627 way "National Graphene Institute, Booth Street East, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M13 9EP, United Kingdom" amenity research_institute 0.652151062176819 United Kingdom FALSE
+uk national institute of economic and social research gb Europe Northern Europe FALSE 1 2021-02-03 204474470 way "Institute Of Economic and Social Research, Dean Trench Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3HL, United Kingdom" building yes 0.601 United Kingdom FALSE
+uk space agency gb Europe Northern Europe FALSE 1 2021-02-03 79817723 node "UK Space Agency, North Star Avenue, Gorse Hill, Central Swindon North, Swindon, South West England, England, SN2 1EU, United Kingdom" office government 0.742006417463271 United Kingdom FALSE
+uk treasury gb Europe Northern Europe FALSE 1 2021-02-03 19225787 node "The Treasury, 59-61, High Street, London Borough of Sutton, London, Greater London, England, SM1 1DT, United Kingdom" amenity pub 0.101 United Kingdom FALSE
+uk university and college union gb Europe Northern Europe FALSE 1 2021-02-03 146247548 way "University and College Union, Carlow Street, Somers Town, London Borough of Camden, London, Greater London, England, NW1 7LL, United Kingdom" office trade_union 0.401 United Kingdom FALSE
+uk wellcome trust gb Europe Northern Europe FALSE 1 2021-02-03 165545925 way "Wellcome Trust, 215, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom" building yes 0.630084056292374 United Kingdom FALSE
+ulster university gb Europe Northern Europe FALSE 1 2021-02-03 59072243 node "Ulster University, York Street, Smithfield and Union, Carrick Hill, Belfast, County Antrim, Northern Ireland, BT15 1AS, United Kingdom" highway bus_stop 0.201 United Kingdom FALSE
+university autonomy gb Europe Northern Europe FALSE 1 2021-02-03 118976490 way "University of Salford, Orange, MediaCityUK, Salford Quays, Eccles, Salford, Greater Manchester, North West England, England, M50 2HF, United Kingdom" amenity university 0.101 United Kingdom FALSE
+university college london — gb Europe Northern Europe FALSE 1 2021-02-03 259450693 relation "University College London, Endsleigh Gardens, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0EB, United Kingdom" amenity university 0.615434238632773 United Kingdom FALSE
+university of bradford gb Europe Northern Europe FALSE 1 2021-02-03 107611269 way "University of Bradford, Tumbling Hill Street, Great Horton, Bradford, West Yorkshire, Yorkshire and the Humber, England, BD7 1DJ, United Kingdom" amenity university 0.7633898027116 United Kingdom FALSE
+university of bristol gb Europe Northern Europe FALSE 1 2021-02-03 50251699 node "University of Bristol, Woodland Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS2, United Kingdom" tourism information 0.301 United Kingdom FALSE
+university of buckingham gb Europe Northern Europe FALSE 1 2021-02-03 190534352 way "University of Buckingham, Nelson Street, Buckingham, Buckinghamshire, South East, England, MK18 1DB, United Kingdom" amenity university 0.730883005990736 United Kingdom FALSE
+university of greenwich gb Europe Northern Europe FALSE 1 2021-02-03 605157 node "University of Greenwich, Romney Road, East Greenwich, Royal Borough of Greenwich, London, Greater London, England, SE10 9JW, United Kingdom" amenity university 0.749987257448056 United Kingdom FALSE
+university of huddersfield gb Europe Northern Europe FALSE 1 2021-02-03 258496268 relation "Huddersfield University, Queensgate, Springwood, Aspley, Huddersfield, Kirklees, West Yorkshire, Yorkshire and the Humber, England, HD1 3DH, United Kingdom" amenity university 0.63609907778808 United Kingdom FALSE
+university of lancaster gb Europe Northern Europe FALSE 1 2021-02-03 95263873 way "Lancaster University, Scotforth Road, Lower Burrow, Hala, Bailrigg, Lancaster, Lancashire, North West England, England, LA2 0PH, United Kingdom" amenity university 0.201 United Kingdom FALSE
+university of northampton gb Europe Northern Europe FALSE 1 2021-02-03 175011057 way "The Pavillion, Boughton Green Road, Hill Top, Kingsthorpe, Northampton, Northamptonshire, East Midlands, England, NN2 7AL, United Kingdom" amenity bar 0.101 United Kingdom FALSE
+university of st. andrews gb Europe Northern Europe FALSE 1 2021-02-03 44520497 node "University of St Andrews, North Street, St Andrews, Fife, Scotland, KY16 9AJ, United Kingdom" amenity university 0.967907552390845 United Kingdom FALSE
+university of strathclyde gb Europe Northern Europe FALSE 1 2021-02-03 91823946 way "University of Strathclyde, High Street, Townhead, Glasgow, Glasgow City, Scotland, G4 0QT, United Kingdom" amenity university 0.780337454409521 United Kingdom FALSE
+university oxford gb Europe Northern Europe FALSE 1 2021-02-03 115937498 way "University College, Logic Lane, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4EX, United Kingdom" amenity university 0.683844730994415 United Kingdom FALSE
+us episcopal church gb Europe Northern Europe FALSE 1 2021-02-03 4563113 node "Episcopal Church, Panmure Street, Ashludie Farm, Monifieth, Angus, Scotland, DD5 4EB, United Kingdom" highway bus_stop 0.301 United Kingdom FALSE
+volkswagen gb Europe Northern Europe FALSE 1 2021-02-03 240063450 way "Isaac Agnew VW, Boucher Road, Upper Falls, Windsor, Belfast, County Antrim, Northern Ireland, BT12 6HR, United Kingdom" shop car 0.55042408908923 United Kingdom FALSE
+warwick gb Europe Northern Europe FALSE 1 2021-02-03 258180459 relation "Warwick, Warwickshire, West Midlands, England, United Kingdom" boundary administrative 0.584132173720047 United Kingdom FALSE
+warwickshire gb Europe Northern Europe FALSE 1 2021-02-03 257896615 relation "Warwickshire, West Midlands, England, United Kingdom" boundary administrative 0.685194555348613 United Kingdom FALSE
+washington university genome center gb Europe Northern Europe FALSE 1 2021-02-03 206300612 way "University of East Anglia, Wilberforce Road, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" amenity university 0.604172803149122 United Kingdom FALSE
+washington university medical school gb Europe Northern Europe FALSE 1 2021-02-03 91134371 way "Medical School, Clifton Boulevard, Dunkirk, City of Nottingham, East Midlands, England, NG7 2UH, United Kingdom" amenity university 0.201 United Kingdom FALSE
+wellcome collection gb Europe Northern Europe FALSE 1 2021-02-03 26295657 node "Wellcome Collection, 183, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom" tourism museum 0.573149623765757 United Kingdom FALSE
+wellcome genome campus gb Europe Northern Europe FALSE 1 2021-02-03 84754756 way "Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, United Kingdom" landuse commercial 0.56358119422997 United Kingdom FALSE
+wellcome sanger gb Europe Northern Europe FALSE 1 2021-02-03 259312934 relation "Wellcome Trust Sanger Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SA, United Kingdom" amenity research_institute 0.611524674526993 United Kingdom FALSE
+wellcome trust centre for human genetics gb Europe Northern Europe FALSE 1 2021-02-03 24717265 node "Wellcome Trust Centre for Human Genetics, Roosevelt Drive, Highfield, Lye Valley, Oxford, Oxfordshire, South East, England, OX3 7BN, United Kingdom" place house 0.932422207003221 United Kingdom FALSE
+wellcome trust centre for human genetics in oxford gb Europe Northern Europe FALSE 1 2021-02-03 24717265 node "Wellcome Trust Centre for Human Genetics, Roosevelt Drive, Highfield, Lye Valley, Oxford, Oxfordshire, South East, England, OX3 7BN, United Kingdom" place house 1.13242220700322 United Kingdom FALSE
+wellcome trust uk gb Europe Northern Europe FALSE 1 2021-02-03 165545925 way "Wellcome Trust, 215, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom" building yes 0.630084056292374 United Kingdom FALSE
+whitehall gb Europe Northern Europe FALSE 1 2021-02-03 146097 node "Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2NH, United Kingdom" place locality 0.601129483245782 United Kingdom FALSE
+windsor gb Europe Northern Europe FALSE 1 2021-02-03 94155375 way "Windsor Castle, Thames Street, Clewer New Town, Eton, Windsor and Maidenhead, South East, England, SL4 1PR, United Kingdom" tourism attraction 0.649537394811591 United Kingdom FALSE
+wrexham glyndŵr university gb Europe Northern Europe FALSE 1 2021-02-03 126645813 way "Wrexham Glyndŵr University, Mold Road, Offa, Wrexham, Cymru / Wales, LL11 2AW, United Kingdom" amenity university 0.688219355609235 United Kingdom FALSE
+1752 group fr Europe Western Europe FALSE 1 2021-02-03 26457996 node "Le Group, Larnaldesq, Le Vibal, Millau, Aveyron, Occitanie, France métropolitaine, 12290, France" place locality 0.225 France FALSE
+acmd fr Europe Western Europe FALSE 1 2021-02-03 71917036 node "ACMD Chaudeyrac, D 500, Le Pont du Mont, Saint-Front, Le Puy-en-Velay, Haute-Loire, Auvergne-Rhône-Alpes, France métropolitaine, 43550, France" man_made street_cabinet 0.101 France FALSE
+adc fr Europe Western Europe FALSE 1 2021-02-03 259127644 relation "Agglomération du Choletais, Maine-et-Loire, Pays de la Loire, France métropolitaine, France" boundary local_authority 0.324670737896991 France FALSE
+afp fr Europe Western Europe FALSE 1 2021-02-03 109098482 way "Agence France-Presse, 24, Avenue des Français Libres, Petite Californie, Saint-Hélier, Thabor - Saint-Hélier - Alphonse Guérin, Quartiers Centre, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35000, France" office company 0.592517658210275 France FALSE
+aissa fr Europe Western Europe FALSE 1 2021-02-03 258381645 relation "Aixe-sur-Vienne, Limoges, Haute-Vienne, Nouvelle-Aquitaine, France métropolitaine, 87700, France" boundary administrative 0.492332154360411 France FALSE
+ames fr Europe Western Europe FALSE 1 2021-02-03 257943096 relation "Ames, Béthune, Pas-de-Calais, Hauts-de-France, France métropolitaine, 62190, France" boundary administrative 0.670680037787526 France FALSE
+anais fr Europe Western Europe FALSE 1 2021-02-03 257427833 relation "Anais, Rochefort, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17540, France" boundary administrative 0.635438301112098 France FALSE
+ansa fr Europe Western Europe FALSE 1 2021-02-03 258683808 relation "Ance, Ance-Féas, Oloron-Sainte-Marie, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64570, France" boundary administrative 0.54258541444388 France FALSE
+ansan fr Europe Western Europe FALSE 1 2021-02-03 257452491 relation "Ansan, Auch, Gers, Occitanie, France métropolitaine, 32270, France" boundary administrative 0.630031149843668 France FALSE
+arkema fr Europe Western Europe FALSE 1 2021-02-03 247250195 way "Arkema, Serquigny, Bernay, Eure, Normandie, France métropolitaine, 27470, France" landuse industrial 0.3 France FALSE
+avn fr Europe Western Europe FALSE 1 2021-02-03 102000501 way "Aéroport Avignon Provence, Chemin des Félons, Quartier Agroparc, Avignon, Vaucluse, Provence-Alpes-Côte d'Azur, France métropolitaine, 84000, France" aeroway aerodrome 0.375142530859403 France FALSE
+bains fr Europe Western Europe FALSE 1 2021-02-03 258323998 relation "Bains, Le Puy-en-Velay, Haute-Loire, Auvergne-Rhône-Alpes, France métropolitaine, 43370, France" boundary administrative 0.598308965599252 France FALSE
+barc fr Europe Western Europe FALSE 1 2021-02-03 257946952 relation "Barc, Bernay, Eure, Normandie, France métropolitaine, 27170, France" boundary administrative 0.648166057069124 France FALSE
+bio fr Europe Western Europe FALSE 1 2021-02-03 257951620 relation "Bio, Gourdon, Lot, Occitanie, France métropolitaine, 46500, France" boundary administrative 0.606009666236864 France FALSE
+biotechniques fr Europe Western Europe FALSE 1 2021-02-03 143597040 way "S.E.R.P. / Les Complexes Biotechniques, 3, Chemin de Notre-Dame d'Alem, Lotissement des Chênes, Courbieu, Castelsarrasin, Tarn-et-Garonne, Occitanie, France métropolitaine, 82100, France" building industrial 0.101 France FALSE
+biotropica fr Europe Western Europe FALSE 1 2021-02-03 149863985 way "Biotropica, D 110, Val-de-Reuil, Les Andelys, Eure, Normandie, France métropolitaine, France" tourism zoo 0.101 France FALSE
+bmc biol fr Europe Western Europe FALSE 1 2021-02-03 257271286 relation "Biol, La Tour-du-Pin, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38690, France" boundary administrative 0.63837155629697 France FALSE
+boehringer ingelheim fr Europe Western Europe FALSE 1 2021-02-03 236180040 way "12, Boehringer Ingelheim, Reims, Marne, Grand Est, France métropolitaine, 51100, France" landuse commercial 0.4 France FALSE
+bosc fr Europe Western Europe FALSE 1 2021-02-03 257494857 relation "Le Bosc, Lodève, Hérault, Occitanie, France métropolitaine, 34700, France" boundary administrative 0.613242845306654 France FALSE
+bri fr Europe Western Europe FALSE 1 2021-02-03 257987067 relation "Brie, Laon, Aisne, Hauts-de-France, France métropolitaine, 02870, France" boundary administrative 0.663841846568865 France FALSE
+business gene fr Europe Western Europe FALSE 1 2021-02-03 258579003 relation "Gené, Erdre-en-Anjou, Segré, Maine-et-Loire, Pays de la Loire, France métropolitaine, 49220, France" boundary administrative 0.492852965296036 France FALSE
+camarades fr Europe Western Europe FALSE 1 2021-02-03 82801014 node "Fosse aux Camarades, Saint-Étienne-à -Arnes, Vouziers, Ardennes, Grand Est, France métropolitaine, 08310, France" place locality 0.225 France FALSE
+casac fr Europe Western Europe FALSE 1 2021-02-03 258518811 relation "Cazac, Saint-Gaudens, Haute-Garonne, Occitanie, France métropolitaine, 31230, France" boundary administrative 0.545962513581625 France FALSE
+cavu fr Europe Western Europe FALSE 1 2021-02-03 243007804 way "Cavu, Morticcio Di Cava, Zonza, Sartène, Corse-du-Sud, Corse, France métropolitaine, 20124, France" landuse residential 0.3 France FALSE
+ceaa fr Europe Western Europe FALSE 1 2021-02-03 258116230 relation "Centre d'expertise autisme adulte (C.E.A.A.), Rue François Couhé, Goise, Goise Champommier Champclairot, Niort, Deux-Sèvres, Nouvelle-Aquitaine, France métropolitaine, 79000, France" building hospital 0.001 France FALSE
+center for studies fr Europe Western Europe FALSE 1 2021-02-03 79329921 node "EUISS, 100, Avenue de Suffren, Quartier du Gros-Caillou, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France" office government 0.408257033589149 France FALSE
+cgc fr Europe Western Europe FALSE 1 2021-02-03 258931479 relation "Challans-Gois Communauté, Loire-Atlantique, Pays de la Loire, France métropolitaine, France" boundary local_authority 0.297580560553068 France FALSE
+cgg fr Europe Western Europe FALSE 1 2021-02-03 125620979 way "Galileo - CGG, 27, Avenue Carnot, Atlantis, Massy, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91300, France" office company 0.101 France FALSE
+cgt fr Europe Western Europe FALSE 1 2021-02-03 68123191 node "Confédération Générale du Travail, Rue Léon Jouhaux, Centre Ville - La Fayette - Eblé, Angers, Maine-et-Loire, Pays de la Loire, France métropolitaine, 49100, France" office union 0.462615389253141 France FALSE
+chimie paristech fr Europe Western Europe FALSE 1 2021-02-03 255063606 way "Chimie ParisTech - Université PSL, Rue d'Ulm, Quartier du Val-de-Grâce, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France" amenity university 0.609552900499061 France FALSE
+ciel austral fr Europe Western Europe FALSE 1 2021-02-03 226066521 way "Route du Ciel (R. 66), Port-aux-Français, Terres australes et antarctiques françaises, France" highway tertiary 0.3 France FALSE
+cirad fr Europe Western Europe FALSE 1 2021-02-03 48847329 node "CIRAD, Chemin Grand Canal, La Bretagne, Saint-Denis, La Réunion, 97492, France" amenity university 0.101 France FALSE
+cires fr Europe Western Europe FALSE 1 2021-02-03 258395752 relation "Cirès, Saint-Gaudens, Haute-Garonne, Occitanie, France métropolitaine, 31110, France" boundary administrative 0.539169238495007 France FALSE
+climatic service fr Europe Western Europe FALSE 1 2021-02-03 296453392 node "Climatic, 212, Route de La Seyne, Entre les Horts, Ollioules, Toulon, Var, Provence-Alpes-Côte d'Azur, France métropolitaine, 83190, France" shop appliance 0.101 France FALSE
+codis fr Europe Western Europe FALSE 1 2021-02-03 109262595 way "Codis, Avenue du Douard, Zone industrielle des Paluds, Aubagne, Marseille, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13400, France" building yes 0.101 France FALSE
+continental europe fr Europe Western Europe FALSE 1 2021-02-03 18973745 node "Europe, Rue de Madrid, Quartier de l'Europe, Paris 8e Arrondissement, Paris, Île-de-France, France métropolitaine, 75008, France" railway station 0.508908372801738 France FALSE
+corps fr Europe Western Europe FALSE 1 2021-02-03 258086431 relation "Corps, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38970, France" boundary administrative 0.643147513931235 France FALSE
+cospar fr Europe Western Europe FALSE 1 2021-02-03 80463846 node "Committee on Space Research, 2, Place Maurice Quentin, Quartier des Halles, Quartier Les Halles, Paris 1er Arrondissement, Paris, Île-de-France, France métropolitaine, 75001, France" office research 0.462953287025885 France FALSE
+covidien fr Europe Western Europe FALSE 1 2021-02-03 38712267 node "Covidien, 1, Place de l'Hôpital, La Petite France, Krutenau, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67065, France" office company 0.425302870611459 France FALSE
+cru fr Europe Western Europe FALSE 1 2021-02-03 49528176 node "Le Cru, Lamontélarié, Castres, Tarn, Occitanie, France métropolitaine, 81260, France" place isolated_dwelling 0.3 France FALSE
+csti fr Europe Western Europe FALSE 1 2021-02-03 71480460 node "CSTI, Rampe de Zuoaves, Porette, Faubourg Scarafaglie, Corte, Haute-Corse, Corse, France métropolitaine, 20250, France" office association 0.101 France FALSE
+culture and sport fr Europe Western Europe FALSE 1 2021-02-03 107858191 way "Culture Sport, Rue du Château, Ganges, Lodève, Hérault, Occitanie, France métropolitaine, 34190, France" shop sports 0.201 France FALSE
+defense fr Europe Western Europe FALSE 1 2021-02-03 54227491 node "La Défense, Quartier Gambetta, Courbevoie, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92400, France" place suburb 0.510297600438359 France FALSE
+deme fr Europe Western Europe FALSE 1 2021-02-03 258963489 relation "La Dême, Indre-et-Loire, Centre-Val de Loire, France métropolitaine, France" waterway river 0.3 France FALSE
+dpp fr Europe Western Europe FALSE 1 2021-02-03 53822962 node "DPP, Saint-Leu, Saint-Paul, La Réunion, 97426, France" waterway waterfall 0.35 France FALSE
+dtt fr Europe Western Europe FALSE 1 2021-02-03 25906171 node "dtt, Rue des Provenceaux, Les Pleus, Fontainebleau, Seine-et-Marne, Île-de-France, France métropolitaine, 77300, France" office architect 0.111 France FALSE
+eaa fr Europe Western Europe FALSE 1 2021-02-03 74755684 node "Eaea, Hitiaa, Hitiaa O Te Ra, Îles du Vent, Polynésie Française, 98705, France" place neighbourhood 0.25 France FALSE
+ecw fr Europe Western Europe FALSE 1 2021-02-03 46390846 node "ECW, 309, Avenue Lavoisier, Parc d'activité des Estuaires - Espace du Mortier, Derval, Châteaubriant-Ancenis, Loire-Atlantique, Pays de la Loire, France métropolitaine, 44590, France" office company 0.101 France FALSE
+élysée palace fr Europe Western Europe FALSE 1 2021-02-03 258481424 relation "Palais de l'Élysée, Avenue de Marigny, Quartier de la Madeleine, Paris 8e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75008, France" tourism attraction 0.509937038508179 France FALSE
+ens fr Europe Western Europe FALSE 1 2021-02-03 258700882 relation "Ens, Bagnères-de-Bigorre, Hautes-Pyrénées, Occitanie, France métropolitaine, 65170, France" boundary administrative 0.63322651402867 France FALSE
+epure fr Europe Western Europe FALSE 1 2021-02-03 232595073 way "Epure, Allée Léopold Sédar Senghor, Gerland, Lyon 7e Arrondissement, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69007, France" building office 0.101 France FALSE
+ero fr Europe Western Europe FALSE 1 2021-02-03 258249267 relation "Hérault, Occitanie, France métropolitaine, France" boundary administrative 0.612674328718567 France FALSE
+esrf fr Europe Western Europe FALSE 1 2021-02-03 257718140 relation "European Synchrotron Radiation Facility, A 480, Polygone Scientifique, Secteur 1, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38000, France" building office 0.360151663261328 France FALSE
+european banking authority fr Europe Western Europe FALSE 1 2021-02-03 76900435 node "EBA, 20, Avenue André Prothin, La Défense 4, Quartier Gambetta, Courbevoie, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92927, France" office government 0.410978906513343 France FALSE
+facebook ai research fr Europe Western Europe FALSE 1 2021-02-03 45183919 node "Facebook Artificial Intelligence Research, 108-112, Avenue de Wagram, Quartier des Ternes, Paris 17e Arrondissement, Paris, Île-de-France, France métropolitaine, 75017, France" office company;research 0.301 France FALSE
+floc fr Europe Western Europe FALSE 1 2021-02-03 13960329 node "Floc, Pouillon, Arrondissement de Dax, Landes, Nouvelle-Aquitaine, France métropolitaine, 40350, France" place isolated_dwelling 0.3 France FALSE
+food research initiative fr Europe Western Europe FALSE 1 2021-02-03 61551953 node "Khatmandou, 22, Rue des Boulangers, Quartier Saint-Victor, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France" amenity restaurant 0.001 France FALSE
+fsc fr Europe Western Europe FALSE 1 2021-02-03 102019407 way "Figari - Sud Corse, D 22, Poggiale, Figari, Sartène, Corse-du-Sud, Corse, France métropolitaine, 20114, France" aeroway aerodrome 0.407681409931154 France FALSE
+ge healthcare fr Europe Western Europe FALSE 1 2021-02-03 143374856 way "GE Healthcare, Buc, Versailles, Yvelines, Île-de-France, France métropolitaine, 78530, France" landuse industrial 0.4 France FALSE
+gfp fr Europe Western Europe FALSE 1 2021-02-03 112738340 way "GFP, 2, Rue Joseph Fourier, Zone d'activités Chartres Est Secteur Le Jardin d’Entreprises, Chartres, Eure-et-Loir, Centre-Val de Loire, France métropolitaine, 28000, France" building yes 0.101 France FALSE
+grandes ecoles fr Europe Western Europe FALSE 1 2021-02-03 188423310 way "Grandes Écoles, Metz-Technopôle, Grange-aux-Bois, Grigy, Metz, Moselle, Grand Est, France métropolitaine, France" highway bus_stop 0.2 France FALSE
+greenpeace france fr Europe Western Europe FALSE 1 2021-02-03 66030093 node "GreenPeace France, 13, Rue d'Enghien, Quartier de la Porte-Saint-Denis, Paris 10e Arrondissement, Paris, Île-de-France, France métropolitaine, 75010, France" office ngo 0.201 France FALSE
+group fr Europe Western Europe FALSE 1 2021-02-03 26457996 node "Le Group, Larnaldesq, Le Vibal, Millau, Aveyron, Occitanie, France métropolitaine, 12290, France" place locality 0.225 France FALSE
+grrc fr Europe Western Europe FALSE 1 2021-02-03 64554689 node "Groupe de Réflexion sur la Recherche Cardiovasculaire, Rue des Colonnes du Trône, Quartier de Picpus, Paris 12e Arrondissement, Paris, Île-de-France, France métropolitaine, 75012, France" office foundation 0.001 France FALSE
+hec fr Europe Western Europe FALSE 1 2021-02-03 115502194 way "HEC Paris, Rue Curie, Val d'Albian, Saclay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91400, France" amenity college 0.581992451472996 France FALSE
+hec paris fr Europe Western Europe FALSE 1 2021-02-03 115502194 way "HEC Paris, Rue Curie, Val d'Albian, Saclay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91400, France" amenity college 0.681992451472996 France FALSE
+hermes fr Europe Western Europe FALSE 1 2021-02-03 257935464 relation "Hermes, Beauvais, Oise, Hauts-de-France, France métropolitaine, 60370, France" boundary administrative 0.656526838838103 France FALSE
+hewlett-packard fr Europe Western Europe FALSE 1 2021-02-03 100448886 way "Hewlett Packard, Eybens, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38320, France" landuse industrial 0.4 France FALSE
+huawei technologies fr Europe Western Europe FALSE 1 2021-02-03 57899451 node "Huawei Technologies, Quai du Point du Jour, Point du Jour, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" office company 0.201 France FALSE
+hust fr Europe Western Europe FALSE 1 2021-02-03 258051090 relation "Huest, Évreux, Eure, Normandie, France métropolitaine, 27930, France" boundary administrative 0.552302585820702 France FALSE
+inria fr Europe Western Europe FALSE 1 2021-02-03 258818694 relation "INRIA, 655, Avenue de l'Europe, Innovallée Montbonnot, Montbonnot-Saint-Martin, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38330, France" office research 0.49425812326797 France FALSE
+insa fr Europe Western Europe FALSE 1 2021-02-03 98992110 way "INSA, 135, Avenue de Rangueil, Rangueil, Sauzelong, Pech David, Pouvourville, Toulouse Sud-Est, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31400, France" amenity college 0.528807256594898 France FALSE
+institute for security studies fr Europe Western Europe FALSE 1 2021-02-03 79329921 node "EUISS, 100, Avenue de Suffren, Quartier du Gros-Caillou, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France" office government 0.408257033589149 France FALSE
+international agency for research on cancer fr Europe Western Europe FALSE 1 2021-02-03 106923016 way "Centre international de Recherche sur le Cancer, Cours Albert Thomas, Transvaal, Lyon 8e Arrondissement, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, France" office ngo 0.756343487668219 France FALSE
+interphone fr Europe Western Europe FALSE 1 2021-02-03 71822924 node "Interphone, 83, Avenue Albert Petit, Résidence du Port Galand, Bagneux, Antony, Hauts-de-Seine, Île-de-France, France métropolitaine, 92220, France" amenity internet_cafe 0.101 France FALSE
+interpol fr Europe Western Europe FALSE 1 2021-02-03 106770347 way "Interpol, Quai Charles de Gaulle, Cité Internationale, Lyon 6e Arrondissement, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69006, France" amenity police 0.694215113171225 France FALSE
+ipfm fr Europe Western Europe FALSE 1 2021-02-03 20680313 node "IPFM - CFA régional des métiers et de l'artisanat, 68, Allée des Forges, Les Mouissèques, La Seyne-sur-Mer, Toulon, Var, Provence-Alpes-Côte d'Azur, France métropolitaine, 83500, France" office educational_institution 0.101 France FALSE
+isac fr Europe Western Europe FALSE 1 2021-02-03 258407194 relation "Saint-Pardoux-Isaac, Marmande, Lot-et-Garonne, Nouvelle-Aquitaine, France métropolitaine, 47800, France" boundary administrative 0.507842182728223 France FALSE
+islamic state fr Europe Western Europe FALSE 1 2021-02-03 49429621 node "Islamic, Avenue de Berne, Saint-Maurice, La Rochelle, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17000, France" amenity library 0.101 France FALSE
+issi fr Europe Western Europe FALSE 1 2021-02-03 258465068 relation "Heussé, Le Teilleul, Avranches, Manche, Normandie, France métropolitaine, 50640, France" boundary administrative 0.540896235650295 France FALSE
+kedge business school fr Europe Western Europe FALSE 1 2021-02-03 98027822 way "Kedge Business School, Avenue Pey-Berland, Thouars, Talence, Bordeaux, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33400, France" amenity college 0.624032054467804 France FALSE
+la france insoumise fr Europe Western Europe FALSE 1 2021-02-03 67479137 node "La France Insoumise, 43, Rue de Dunkerque, Quartier Saint-Vincent-de-Paul, Paris 10e Arrondissement, Paris, Île-de-France, France métropolitaine, 75010, France" office political_party 0.301 France FALSE
+le canard enchaîné fr Europe Western Europe FALSE 1 2021-02-03 39428962 node "Le Canard Enchainé, 173, Rue Saint-Honoré, Quartier de la Madeleine, Paris 8e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75008, France" office newspaper 0.657752713427244 France FALSE
+le monde fr Europe Western Europe FALSE 1 2021-02-03 31554000 node "Le Monde, Lamastre, Tournon-sur-Rhône, Ardèche, Auvergne-Rhône-Alpes, France métropolitaine, 07270, France" place hamlet 0.45 France FALSE
+le quéré fr Europe Western Europe FALSE 1 2021-02-03 259354933 relation "La Quère, Coustouges, Céret, Pyrénées-Orientales, Occitanie, France métropolitaine, 66260, France" waterway river 0.4 France FALSE
+le tourneau fr Europe Western Europe FALSE 1 2021-02-03 17540630 node "Tourneau, Martizay, Le Blanc, Indre, Centre-Val de Loire, France métropolitaine, 36220, France" place hamlet 0.45 France FALSE
+lrem fr Europe Western Europe FALSE 1 2021-02-03 5716951 node "Permanance du député LREM Sylvain Waserman, Route de l'Hôpital, Krutenau, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67076, France" office political_party 0.101 France FALSE
+macron fr Europe Western Europe FALSE 1 2021-02-03 72308788 node "Macron, Rue des Pierres du Faing, Sainte-Marguerite, Saint-Dié-des-Vosges, Vosges, Grand Est, France métropolitaine, 88100, France" shop sports 0.101 France FALSE
+mars fr Europe Western Europe FALSE 1 2021-02-03 258293542 relation "Mars, Tournon-sur-Rhône, Ardèche, Auvergne-Rhône-Alpes, France métropolitaine, 07320, France" boundary administrative 0.612054242729639 France FALSE
+mercury fr Europe Western Europe FALSE 1 2021-02-03 258144896 relation "Mercury, Albertville, Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 73200, France" boundary administrative 0.594893283996417 France FALSE
+mgp fr Europe Western Europe FALSE 1 2021-02-03 258784757 relation "Métropole du Grand Paris, Paris, Île-de-France, France métropolitaine, France" boundary local_authority 0.455626604417121 France FALSE
+montpellier fr Europe Western Europe FALSE 1 2021-02-03 257963687 relation "Montpellier, Hérault, Occitanie, France métropolitaine, France" boundary administrative 0.741204187018582 France FALSE
+morgan sheng fr Europe Western Europe FALSE 1 2021-02-03 80011400 node "Morgan, Rue Guillaume Apollinaire, ZAC de Châteaufarine, Chateaufarine, Besançon, Doubs, Bourgogne-Franche-Comté, France métropolitaine, 25000, France" shop clothes 0.328876356713622 France FALSE
+morris minor fr Europe Western Europe FALSE 1 2021-02-03 208273363 way "Rue Morris, La Bergerie, Liffré, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35340, France" highway residential 0.2 France FALSE
+mountain research initiative fr Europe Western Europe FALSE 1 2021-02-03 25249463 node "Initiative pour la Recherche et l'Innovation sur le Logiciel Libre, 4, Place Jussieu, Quartier Saint-Victor, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France" office research 0.281472839091896 France FALSE
+naia fr Europe Western Europe FALSE 1 2021-02-03 7345492 node "Naia, Païta, Province Sud, Nouvelle-Calédonie, France" place suburb 0.375 France FALSE
+national prion clinic fr Europe Western Europe FALSE 1 2021-02-03 297718104 node "Le Prion, Fronville, Saint-Dizier, Haute-Marne, Grand Est, France métropolitaine, 52300, France" place locality 0.225 France FALSE
+neutron science d fr Europe Western Europe FALSE 1 2021-02-03 105884382 way "European Photon and Neutron Science Campus, 71, Avenue des Martyrs, Polygone Scientifique, Secteur 1, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38000, France" amenity research_institute 0.458083983169266 France FALSE
+ob association fr Europe Western Europe FALSE 1 2021-02-03 201036713 way "Robinson, Lac de Maine, La Bijouterie, Angers, Maine-et-Loire, Pays de la Loire, France métropolitaine, France" place island 0.425 France FALSE
+organisation for economic cooperation and development fr Europe Western Europe FALSE 1 2021-02-03 103637552 way "OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" office government 0.669924309656139 France FALSE
+pacific community fr Europe Western Europe FALSE 1 2021-02-03 6458038 node "Communauté du Pacifique, Accès CPS, Anse Vata, Secteur Sud, Nouméa, Province Sud, Nouvelle-Calédonie, 98800, France" office quango 0.001 France FALSE
+pacific marine fr Europe Western Europe FALSE 1 2021-02-03 10446875 node "Pacific Marine, Rue Auguste Bénébig, Les Massanes, Vallée des Colons, Secteur Sud, Nouméa, Province Sud, Nouvelle-Calédonie, 98800, France" shop boat 0.201 France FALSE
+paris descartes university fr Europe Western Europe FALSE 1 2021-02-03 222560238 way "ESIEE Paris, 2, Rond-Point Centre de la Terre, Bois de Grâce, Cité Descartes, Noisy-le-Grand, Torcy, Seine-et-Marne, Île-de-France, France métropolitaine, 93160, France" amenity university 0.568804350670811 France FALSE
+paris diderot university fr Europe Western Europe FALSE 1 2021-02-03 63739364 node "École d'ingénieurs Denis-Diderot, 8, Place Paul Ricœur, Quartier de la Gare, Paris 13e Arrondissement, Paris, Île-de-France, France métropolitaine, 75013, France" amenity university 0.285440647712364 France FALSE
+paris school of economics fr Europe Western Europe FALSE 1 2021-02-03 107920608 way "École d'économie de Paris, 48, Boulevard Jourdan, Quartier du Parc-de-Montsouris, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" amenity university 0.422734482343971 France FALSE
+paris-descartes university fr Europe Western Europe FALSE 1 2021-02-03 222560238 way "ESIEE Paris, 2, Rond-Point Centre de la Terre, Bois de Grâce, Cité Descartes, Noisy-le-Grand, Torcy, Seine-et-Marne, Île-de-France, France métropolitaine, 93160, France" amenity university 0.568804350670811 France FALSE
+paris-nanterre university fr Europe Western Europe FALSE 1 2021-02-03 99926629 way "Université Paris Nanterre, 200, Avenue de la République, Quartier de la République, Nanterre, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92000, France" amenity university 0.674615563538129 France FALSE
+paris-saclay university fr Europe Western Europe FALSE 1 2021-02-03 79902045 node "Institut Pascal de l'université Paris-Saclay, 530, Rue André Rivière, Campus Urbain de Paris-Saclay, Corbeville, Orsay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91405, France" amenity university 0.608908372801738 France FALSE
+paul sabatier university fr Europe Western Europe FALSE 1 2021-02-03 117894361 way "IUT Paul Sabatier, Impasse Marguerite Orcival, Auch, Gers, Occitanie, France métropolitaine, 32000, France" amenity university 0.501865618613023 France FALSE
+pharma fr Europe Western Europe FALSE 1 2021-02-03 65490459 node "La Pharma, Rue de l'Armistice, La Capelle, Vervins, Aisne, Hauts-de-France, France métropolitaine, 02260, France" amenity pharmacy 0.101 France FALSE
+pkp pn fr Europe Western Europe FALSE 1 2021-02-03 206141098 way "Puka Puka Airport, Pukapuka, Tuamotu-Gambier, Polynésie Française, 98774, France" aeroway aerodrome 0.276645429377189 France FALSE
+plos fr Europe Western Europe FALSE 1 2021-02-03 2997221 node "Plos, Murat-sur-Vèbre, Castres, Tarn, Occitanie, France métropolitaine, 81320, France" place hamlet 0.35 France FALSE
+pppl fr Europe Western Europe FALSE 1 2021-02-03 74437071 node "PPPL Paris Pontoise Poids Lourds, Rue Lavoisier, Herblay-sur-Seine, Argenteuil, Val-d'Oise, Île-de-France, France métropolitaine, 95220, France" shop car_repair 0.101 France FALSE
+psa fr Europe Western Europe FALSE 1 2021-02-03 189374806 way "PSA, Saint-Ouen-sur-Seine, Saint-Denis, Seine-Saint-Denis, Île-de-France, France métropolitaine, 93400, France" landuse industrial 0.606493714650957 France FALSE
+quai branly museum fr Europe Western Europe FALSE 1 2021-02-03 93256799 way "Musée du quai Branly - Jacques Chirac, 37, Quai Branly, Quartier de Grenelle, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75007, France" tourism museum 0.658842937598083 France FALSE
+quintiles fr Europe Western Europe FALSE 1 2021-02-03 104302474 way "Quintiles, Rue Jean-Dominique Cassini, Parc d'Innovation Technologique d'Illkirch, Illkirch-Graffenstaden, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67400, France" building yes 0.101 France FALSE
+raphaël paris fr Europe Western Europe FALSE 1 2021-02-03 57440846 node "Raphael, Boulevard de Magenta, Quartier Saint-Vincent-de-Paul, Paris 10e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75010, France" amenity bureau_de_change 0.101 France FALSE
+rff fr Europe Western Europe FALSE 1 2021-02-03 214475334 way "Sous-station RFF de Saint-Marcel, Le Moulin de Saint-Marin, Saint-Marcel, Châteauroux, Indre, Centre-Val de Loire, France métropolitaine, 36200, France" landuse industrial 0.3 France FALSE
+rgi fr Europe Western Europe FALSE 1 2021-02-03 96915278 way "RGI, Boulevard Principal, Rangiroa, Tuamotu-Gambier, Polynésie Française, 98775, France" aeroway aerodrome 0.101 France FALSE
+rin fr Europe Western Europe FALSE 1 2021-02-03 258366255 relation "Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, France" boundary administrative 0.625111737838686 France FALSE
+ruch fr Europe Western Europe FALSE 1 2021-02-03 258043564 relation "Ruch, Langon, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33350, France" boundary administrative 0.638658334123937 France FALSE
+sanofi pasteur fr Europe Western Europe FALSE 1 2021-02-03 100174620 way "Sanofi-Pasteur, Marcy-l'Étoile, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69280, France" landuse industrial 0.4 France FALSE
+science europe fr Europe Western Europe FALSE 1 2021-02-03 105173939 way "Pôle Science, Chemin du Collège, Parc Europe, Marcq-en-Barœul, Lille, Nord, Hauts-de-France, France métropolitaine, 59700, France" building yes 0.201 France FALSE
+sers fr Europe Western Europe FALSE 1 2021-02-03 258412644 relation "Sers, Argelès-Gazost, Hautes-Pyrénées, Occitanie, France métropolitaine, 65120, France" boundary administrative 0.627233681006203 France FALSE
+smap fr Europe Western Europe FALSE 1 2021-02-03 118272814 way "SMAP, 110, Rue des Genêts, Beausoleil, Les Chauveaux, Pons, Jonzac, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17800, France" shop car_parts 0.101 France FALSE
+smrb fr Europe Western Europe FALSE 1 2021-02-03 130132163 way "Scierie Mobile Romagny Bernardini, D 120, Charmoy la Ville, Charmoy, Autun, Saône-et-Loire, Bourgogne-Franche-Comté, France métropolitaine, 71710, France" building yes 0.001 France FALSE
+soas fr Europe Western Europe FALSE 1 2021-02-03 257992695 relation "Soues, Tarbes, Hautes-Pyrénées, Occitanie, France métropolitaine, 65430, France" boundary administrative 0.528176451195692 France FALSE
+un convention fr Europe Western Europe FALSE 1 2021-02-03 310196 node "Convention, Rue de Vaugirard, Quartier Saint-Lambert, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France" railway station 0.504979282964766 France FALSE
+université grenoble alpes fr Europe Western Europe FALSE 1 2021-02-03 44630717 node "Université Grenoble Alpes, Rue de la Piscine, Domaine universitaire de Grenoble, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, France" tourism information 0.301 France FALSE
+université paris-saclay fr Europe Western Europe FALSE 1 2021-02-03 126984936 way "Université Paris-Saclay, Orsay Gare, Corbeville, Orsay, Palaiseau, Essonne, ÃŽle-de-France, France métropolitaine, 91400, France" highway unclassified 0.4 France FALSE
+université paris-sud fr Europe Western Europe FALSE 1 2021-02-03 125512473 way "Université Paris 1 Panthéon-Sorbonne Centre Pierre Mendès-France, 90, Rue de Tolbiac, Cité Florale, Quartier de la Maison-Blanche, Paris 13e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75013, France" amenity university 0.420860870373788 France FALSE
+university grenoble-alpes fr Europe Western Europe FALSE 1 2021-02-03 22506396 node "Gières Gare Univ, Gières - Gare - Universités, Chamandier, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38610, France" amenity bicycle_rental 0.201 France FALSE
+university of bordeaux-montaigne fr Europe Western Europe FALSE 1 2021-02-03 258587883 relation "Université de Bordeaux - Institut d'Administration des Entreprises, Place Pey Berland, Triangle d'Or, Bordeaux Centre, Bordeaux, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33000, France" amenity university 0.101 France FALSE
+university of bourgogne in dijon fr Europe Western Europe FALSE 1 2021-02-03 95205346 way "Université de Bourgogne, Mazen - Sully, Mirande, Montmuzard, Dijon, Côte-d'Or, Bourgogne-Franche-Comté, France métropolitaine, 21000, France" amenity university 0.752513195064787 France FALSE
+university of cergy-pontoise fr Europe Western Europe FALSE 1 2021-02-03 254258149 way "CY Cergy Paris Université - Site de Saint Martin, 2, Avenue François Mitterrand, Saint-Martin, Pontoise, Val-d'Oise, Île-de-France, France métropolitaine, 95302, France" building university 0.201 France FALSE
+university of chiron fr Europe Western Europe FALSE 1 2021-02-03 80237376 node "IAE Savoie Mont Blanc, Chemin de Jacob, Le Biollay, Jacob-Bellecombette, Chambéry, Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 73000, France" amenity university 0.001 France FALSE
+university of franche-comté fr Europe Western Europe FALSE 1 2021-02-03 95205346 way "Université de Bourgogne, Mazen - Sully, Mirande, Montmuzard, Dijon, Côte-d'Or, Bourgogne-Franche-Comté, France métropolitaine, 21000, France" amenity university 0.652513195064787 France FALSE
+university of grenoble fr Europe Western Europe FALSE 1 2021-02-03 22506396 node "Gières Gare Univ, Gières - Gare - Universités, Chamandier, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38610, France" amenity bicycle_rental 0.101 France FALSE
+university of nice fr Europe Western Europe FALSE 1 2021-02-03 174797616 way "Bibliothèque universitaire, Avenue Valrose, Saint-Maurice, Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, 06108, France" amenity library 0.101 France FALSE
+university of paris seine fr Europe Western Europe FALSE 1 2021-02-03 228628229 way "Université René Descartes - Centre Henri Pieron, Avenue Édouard Vaillant, Point du Jour, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" amenity university 0.101 France FALSE
+university of provence fr Europe Western Europe FALSE 1 2021-02-03 174797616 way "Bibliothèque universitaire, Avenue Valrose, Saint-Maurice, Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, 06108, France" amenity library 0.101 France FALSE
+university of reims fr Europe Western Europe FALSE 1 2021-02-03 57788284 node "Campus Cesi / Exia Reims, Avenue Robert Schuman, Croix-Rouge, Reims, Marne, Grand Est, France métropolitaine, 51100, France" amenity university 0.101 France FALSE
+university of reims champagne-ardenne fr Europe Western Europe FALSE 1 2021-02-03 57788284 node "Campus Cesi / Exia Reims, Avenue Robert Schuman, Croix-Rouge, Reims, Marne, Grand Est, France métropolitaine, 51100, France" amenity university 0.101 France FALSE
+university of savoie fr Europe Western Europe FALSE 1 2021-02-03 106618355 way "Abbaye de Talloires, Chemin de la Colombière, Les Granges, Talloires, Talloires-Montmin, Annecy, Haute-Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 74290, France" historic monastery 0.36358119422997 France FALSE
+university paris descartes fr Europe Western Europe FALSE 1 2021-02-03 222560238 way "ESIEE Paris, 2, Rond-Point Centre de la Terre, Bois de Grâce, Cité Descartes, Noisy-le-Grand, Torcy, Seine-et-Marne, Île-de-France, France métropolitaine, 93160, France" amenity university 0.568804350670811 France FALSE
+university paris seine fr Europe Western Europe FALSE 1 2021-02-03 228628229 way "Université René Descartes - Centre Henri Pieron, Avenue Édouard Vaillant, Point du Jour, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" amenity university 0.101 France FALSE
+university paris-saclay fr Europe Western Europe FALSE 1 2021-02-03 259420663 relation "Université Paris-Saclay à Palaiseau, 10;2, Boulevard Thomas Gobert, Rocher de Lozère, Les Taupiniaux, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91120, France" amenity university 0.201 France FALSE
+zte corporation fr Europe Western Europe FALSE 1 2021-02-03 57728490 node "ZTE Corporation, Rue Tony Garnier, Centre Ville, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" office company 0.201 France FALSE
+ictv fm Oceania Micronesia FALSE 1 2021-02-03 43642085 node "ICTV, Kaselehlia, Kolonia, Sapwohn kousapw, Pohnpei, 96941, Micronesia" amenity studio 0.101 Micronesia FALSE
+micronesia fm Oceania Micronesia FALSE 1 2021-02-03 258075744 relation Micronesia boundary administrative 0.707162448380302 Micronesia FALSE
+aaaa fi Europe Northern Europe FALSE 1 2021-02-03 298635624 relation "aaaa, Inari, Pohjois-Lapin seutukunta, Lappi, Lapin aluehallintovirasto, Manner-Suomi, Suomi / Finland" natural water 0.31 Suomi / Finland FALSE
+aalto university fi Europe Northern Europe FALSE 1 2021-02-03 203146197 way "Aalto-yliopisto, 24, Otakaari, Teekkarikylä, Otaniemi, Suur-Tapiola, Espoo, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 02150, Suomi / Finland" amenity university 0.547526724801917 Suomi / Finland FALSE
+auriga fi Europe Northern Europe FALSE 1 2021-02-03 225561228 way "Auriga, Keskusta, Turku, Turun seutukunta, Varsinais-Suomi, Lounais-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" landuse commercial 0.3 Suomi / Finland FALSE
+helsinki fi Europe Northern Europe FALSE 1 2021-02-03 256826686 relation "Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" boundary administrative 0.838500451911677 Suomi / Finland FALSE
+meteorological institute fi Europe Northern Europe FALSE 1 2021-02-03 84585571 node "Ilmatieteen laitos, 1, Erik Palménin aukio, Kumpula, Keskinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00560, Suomi / Finland" amenity research_institute 0.397069208513039 Suomi / Finland FALSE
+state research agency fi Europe Northern Europe FALSE 1 2021-02-03 54517775 node "The Finnish Brain Research and Rehabilitation Center Neuron, Kortesalmi, Kuopio, Kuopion seutukunta, Pohjois-Savo, Itä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" amenity hospital 0.101 Suomi / Finland FALSE
+suomi fi Europe Northern Europe FALSE 1 2021-02-03 257282877 relation Suomi / Finland boundary administrative 0.907327503568528 Suomi / Finland FALSE
+university of eastern finland fi Europe Northern Europe FALSE 1 2021-02-03 94568596 way "Itä-Suomen yliopisto, Siltakatu, Otsola, Joensuu, Joensuun seutukunta, Pohjois-Karjala, Itä-Suomen aluehallintovirasto, Manner-Suomi, 80101, Suomi / Finland" amenity university 0.462945678183792 Suomi / Finland FALSE
+university of oulu fi Europe Northern Europe FALSE 1 2021-02-03 259419685 relation "Oulun yliopisto, Biologintie, Linnanmaa, Oulu, Oulun seutukunta, Pohjois-Pohjanmaa, Pohjois-Suomen aluehallintovirasto, Manner-Suomi, 90575, Suomi / Finland" amenity university 0.563054296170656 Suomi / Finland FALSE
+vtt fi Europe Northern Europe FALSE 1 2021-02-03 127038522 way "VTT, Halssila, Jyväskylä, Jyväskylän seutukunta, Keski-Suomi, Länsi- ja Sisä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" landuse industrial 0.3 Suomi / Finland FALSE
+african union et Africa Eastern Africa FALSE 1 2021-02-03 75704898 node "African Union, Roosevelt Street, ሜáŠáˆ²áŠ®, Addis Ababa / አዲስ አበባ, Kirkos, አዲስ አበባ / Addis Ababa, 7777, ኢትዮጵያ" highway bus_stop 0.201 ኢትዮጵያ FALSE
+awi et Africa Eastern Africa FALSE 1 2021-02-03 258756604 relation "Awi, አማራ áŠáˆ<8d>áˆ<8d> / Amhara, ኢትዮጵያ" boundary administrative 0.6 ኢትዮጵያ FALSE
+blue nile et Africa Eastern Africa FALSE 1 2021-02-03 241758218 way "ዓባዠወንá‹<9d>, South Gonder, አማራ áŠáˆ<8d>áˆ<8d> / Amhara, ኢትዮጵያ" waterway river 0.322734482343971 ኢትዮጵያ FALSE
+desert locust control organization for eastern africa et Africa Eastern Africa FALSE 1 2021-02-03 201488286 way "Desert Locust Control Organization for Eastern Africa, Mann St, Yeka, አዲስ አበባ / Addis Ababa, 12994, ኢትዮጵያ" office ngo 0.701 ኢትዮጵያ FALSE
+hesa et Africa Eastern Africa FALSE 1 2021-02-03 11634819 node "Hesa, Illubabor, ኦሮሚያ áŠáˆ<8d>áˆ<8d> / Oromia, ኢትዮጵያ" place locality 0.225 ኢትዮጵያ FALSE
+nbcs et Africa Eastern Africa FALSE 1 2021-02-03 63661472 node "ሰሜን ደረቅ áŒáŠ<90>ት, GL_08_1609 St., አባዲና አካባቢ, Gulale, አዲስ አበባ / Addis Ababa, 9837, ኢትዮጵያ" office company 0.001 ኢትዮጵያ FALSE
+orcid et Africa Eastern Africa FALSE 1 2021-02-03 54414796 node "Orcid, Ring Road, ለቡ, Nefas Silk, አዲስ አበባ / Addis Ababa, 17979, ኢትዮጵያ" amenity drinking_water 0.101 ኢትዮጵያ FALSE
+sanyo et Africa Eastern Africa FALSE 1 2021-02-03 24120991 node "Sanyo, South Wollo, አማራ áŠáˆ<8d>áˆ<8d> / Amhara, ኢትዮጵያ" place village 0.375 ኢትዮጵያ FALSE
+zemen bank et Africa Eastern Africa FALSE 1 2021-02-03 74362165 node "Zemen Bank, 4, ደብረ ዘá‹á‰µ, Bishoftu, East Shewa, ኦሮሚያ áŠáˆ<8d>áˆ<8d> / Oromia, 1034, ኢትዮጵያ" amenity bank 0.201 ኢትዮጵያ FALSE
+aacr es Europe Southern Europe FALSE 1 2021-02-03 49737503 node "Aacr Museo, Calle Pedro del Toro, Museo, Casco Antiguo, Sevilla, AndalucÃa, 41001, España" tourism hotel 0.101 España FALSE
+anu es Europe Southern Europe FALSE 1 2021-02-03 257798719 relation "Anue, Navarra - Nafarroa, España" boundary administrative 0.606726039533275 España FALSE
+barañao es Europe Southern Europe FALSE 1 2021-02-03 45025401 node "Barañao, Zeberio, Bizkaia, Euskadi, 48148, España" place hamlet 0.35 España FALSE
+barcelona supercomputing centre es Europe Southern Europe FALSE 1 2021-02-03 221612695 way "Barcelona Supercomputing Center, Plaça d'Eusebi Güell, Pedralbes, les Corts, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España" building university 0.502323854176492 España FALSE
+bp oil es Europe Southern Europe FALSE 1 2021-02-03 824247 node "BP OIL, Avenida de Bruselas, Algeciras, Campo de Gibraltar, Cádiz, AndalucÃa, 11204, España" amenity fuel 0.201 España FALSE
+cabells es Europe Southern Europe FALSE 1 2021-02-03 15572882 node "Cabells, Carrer d'Adoberies, Castelló de la Plana, la Plana Alta, Castelló / Castellón, Comunitat Valenciana, 12003, España" shop hairdresser 0.101 España FALSE
+caesar es Europe Southern Europe FALSE 1 2021-02-03 258240062 relation "El Casar, Guadalajara, Castilla-La Mancha, 19170, España" boundary administrative 0.513983450221256 España FALSE
+cajal es Europe Southern Europe FALSE 1 2021-02-03 12607846 node "El Cajal, Villanueva de Sigena, Los Monegros, Huesca, Aragón, España" place locality 0.225 España FALSE
+cerro pachón es Europe Southern Europe FALSE 1 2021-02-03 13167339 node "Cerro Pachón, Montán, l'Alt Millars, Castelló / Castellón, Comunitat Valenciana, 12447, España" place locality 0.325 España FALSE
+cirva es Europe Southern Europe FALSE 1 2021-02-03 258417283 relation "La Cierva, Cuenca, Castilla-La Mancha, España" boundary administrative 0.504190064709064 España FALSE
+dit es Europe Southern Europe FALSE 1 2021-02-03 70175876 node "el Dit, Cocentaina, el Comtat, Alacant / Alicante, Comunitat Valenciana, 03837, España" natural peak 0.4 España FALSE
+edar es Europe Southern Europe FALSE 1 2021-02-03 136344246 way "EDAR, Lagareiros, Carnota, Muros, A Coruña, Galicia, 15293, España" landuse industrial 0.3 España FALSE
+el pais es Europe Southern Europe FALSE 1 2021-02-03 13235441 node "El PaÃs, Alfarp, la Ribera Alta, València / Valencia, Comunitat Valenciana, 46197, España" place locality 0.225 España FALSE
+el país es Europe Southern Europe FALSE 1 2021-02-03 13235441 node "El PaÃs, Alfarp, la Ribera Alta, València / Valencia, Comunitat Valenciana, 46197, España" place locality 0.325 España FALSE
+european space astronomy centre es Europe Southern Europe FALSE 1 2021-02-03 98365761 way "European Space Astronomy Centre, Camino Bajo del Castillo, Villanueva de la Cañada, Cuenca del Guadarrama, Comunidad de Madrid, 28691, España" office research 0.787306266325387 España FALSE
+gmv of tres cantos es Europe Southern Europe FALSE 1 2021-02-03 258419857 relation "GMV, 11, Calle de Isaac Newton, Parque Tecnológico de Madrid, Tres Cantos, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28760, España" building office 0.301 España FALSE
+gran telescopio canarias es Europe Southern Europe FALSE 1 2021-02-03 159943083 way "Gran Telescopio Canarias, Carretera Acceso Observatorios, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España" man_made telescope 0.713959851504786 España FALSE
+gtc es Europe Southern Europe FALSE 1 2021-02-03 159943083 way "Gran Telescopio Canarias, Carretera Acceso Observatorios, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España" man_made telescope 0.413959851504786 España FALSE
+iberia es Europe Southern Europe FALSE 1 2021-02-03 258848049 relation "Iberia, España" place peninsula 0.73620614637597 España FALSE
+institute for integrative biology es Europe Southern Europe FALSE 1 2021-02-03 184476776 way "I2SysBio (Institute for Integrative Systems Biology), Carretera de LlÃria, Lloma Llarga, Paterna, l'Horta Oest, València / Valencia, Comunitat Valenciana, 46100, España" building university 0.401 España FALSE
+la palma es Europe Southern Europe FALSE 1 2021-02-03 258611106 relation "Palma, Illes Balears, España" boundary administrative 0.688150363287611 España FALSE
+las hoyas es Europe Southern Europe FALSE 1 2021-02-03 296339662 node "Las Hoyas, Castro de Filabres, AlmerÃa, AndalucÃa, España" natural peak 0.5 España FALSE
+mar-a-lago es Europe Southern Europe FALSE 1 2021-02-03 99521484 way "El Mar, Real Sitio de San Ildefonso, NavafrÃa, Castilla y León, España" natural water 0.4 España FALSE
+maryland es Europe Southern Europe FALSE 1 2021-02-03 33897926 node "Maryl, Rúa Enrique Mariñas Romero, San Vicenzo de Elviña, Matogrande, Elviña, A Coruña, Galicia, 15071, España" shop hairdresser 0.201 España FALSE
+nasdaq es Europe Southern Europe FALSE 1 2021-02-03 39263438 node "Nasdaq, 8, Calle el Trust, Barrio Quebrantada, Torrelavega, Campuzano, Torrelavega, Besaya, Cantabria, 39300, España" amenity pub 0.101 España FALSE
+observatorio del roque de los muchachos es Europe Southern Europe FALSE 1 2021-02-03 101274983 way "Observatorio del Roque de los Muchachos, Carretera a Fuente Nueva, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España" man_made observatory 1.0016086140509 España FALSE
+polytechnic university of madrid es Europe Southern Europe FALSE 1 2021-02-03 90835017 way "E.T.S. Arquitectura de Madrid, Avenida Juan de Herrera, Moncloa-Aravaca, Madrid, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28001, España" amenity university 0.46926833579344 España FALSE
+rockefellers es Europe Southern Europe FALSE 1 2021-02-03 74533251 node "Rockefeller's, Carrer de Cala Major, Cala Major, Palma, Illes Balears, 07015, España" amenity bar 0.001 España FALSE
+roque de los muchachos es Europe Southern Europe FALSE 1 2021-02-03 144787 node "Roque de los Muchachos, GarafÃa, Santa Cruz de Tenerife, Canarias, España" natural volcano 0.755515463321448 España FALSE
+roque de los muchachos observatory es Europe Southern Europe FALSE 1 2021-02-03 101274983 way "Observatorio del Roque de los Muchachos, Carretera a Fuente Nueva, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España" man_made observatory 0.801608614050897 España FALSE
+sabre es Europe Southern Europe FALSE 1 2021-02-03 30412035 node "el Sabre, el Bruc, Anoia, Barcelona, Catalunya, 08294, España" natural peak 0.4 España FALSE
+saint louis university — madrid campus es Europe Southern Europe FALSE 1 2021-02-03 211810109 way "Saint Louis University - Madrid Campus, Calle Amapola, Vallehermoso, ChamberÃ, Madrid, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28003, España" amenity university 0.501 España FALSE
+tres cantos es Europe Southern Europe FALSE 1 2021-02-03 257968513 relation "Tres Cantos, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28760, España" boundary administrative 0.689287430697433 España FALSE
+universitat oberta de catalunya es Europe Southern Europe FALSE 1 2021-02-03 107594771 way "Universitat Oberta de Catalunya, 156, Rambla del Poblenou, Provençals del Poblenou, Sant MartÃ, Barcelona, Barcelonès, Barcelona, Catalunya, 08018, España" amenity university 0.829969070439296 España FALSE
+university of castilla-la mancha es Europe Southern Europe FALSE 1 2021-02-03 162719450 way "Caseta del Estudiante, Plaza de la Libertad de Expresión, Barrio de San Antón, Cuenca, Castilla-La Mancha, 16002, España" amenity university 0.301 España FALSE
+university of lleida es Europe Southern Europe FALSE 1 2021-02-03 5028721 node "Institut Nacional d'Educació FÃsica de Catalunya, Carrer de Duke Ellington, la Caparrella, Lleida, Segrià , Lleida, Catalunya, 25192, España" amenity university 0.101 España FALSE
+university of santiago de compostela es Europe Southern Europe FALSE 1 2021-02-03 21708159 node "Instituto da Lingua Galega, Praza da Universidade, As Fontiñas, Santiago de Compostela, Santiago, A Coruña, Galicia, ES-15705, España" amenity university 0.301 España FALSE
+valero es Europe Southern Europe FALSE 1 2021-02-03 258259086 relation "Valero, Salamanca, Castilla y León, España" boundary administrative 0.608874521325786 España FALSE
+vespa es Europe Southern Europe FALSE 1 2021-02-03 30945621 node "la Vespa, el Bruc, Anoia, Barcelona, Catalunya, 08294, España" natural peak 0.4 España FALSE
+virgili university es Europe Southern Europe FALSE 1 2021-02-03 119324675 way "Universitat Rovira i Virgili - Campus Catalunya, 33,35, Avinguda de Catalunya, Tarragona, Tarragonès, Tarragona, Catalunya, 43002, España" amenity university 0.500597470725799 España FALSE
+vitae es Europe Southern Europe FALSE 1 2021-02-03 257978618 relation "Vita, Ã<81>vila, Castilla y León, España" boundary administrative 0.510062690742063 España FALSE
+zas es Europe Southern Europe FALSE 1 2021-02-03 15543479 node "Zas, Terra de Soneira, A Coruña, Galicia, 15850, España" place village 0.566457373637731 España FALSE
+eritrea er Africa Eastern Africa FALSE 1 2021-02-03 258214833 relation ኤáˆá‰µáˆ« Eritrea إرتريا boundary administrative 0.761582471804884 ኤáˆá‰µáˆ« Eritrea إرتريا FALSE
+ain shams university eg Africa Northern Africa FALSE 1 2021-02-03 97753625 way "جامعة عين شمس, شارع لطÙ<81>ÙŠ السيد, الدمرداش, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11657, مصر" amenity university 0.001 مصر FALSE
+arab league eg Africa Northern Africa FALSE 1 2021-02-03 96831895 way "جامعة الدول العربية, شارع التØرير, الاسماعيليه, باب اللوق, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11111, مصر" building public 0.001 مصر FALSE
+aswan high dam eg Africa Northern Africa FALSE 1 2021-02-03 85332921 way "السد العالى, أسوان, مصر" waterway dam 0.489725473759381 مصر FALSE
+g77 eg Africa Northern Africa FALSE 1 2021-02-03 71106617 node "G77, كمبوند ليان صبور, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11865, مصر" place house 0.101 مصر FALSE
+imc eg Africa Northern Africa FALSE 1 2021-02-03 34517193 node "IMC مركز تØديث الصناعة Industrial Modernization Center, شارع 276, المعادي الجديدة, القاهرة, Ù…ØاÙ<81>ظة القاهرة, NONE, مصر" office government 0.101 مصر FALSE
+innovation center eg Africa Northern Africa FALSE 1 2021-02-03 300924038 node "Innovation Center, 5B, القرية الذكية, 12677, مصر" place house 0.201 مصر FALSE
+mdrb eg Africa Northern Africa FALSE 1 2021-02-03 245704793 way "مساكن مضرب الأرز, دمنهور, البØيرة, مصر" place neighbourhood 0.25 مصر FALSE
+nile delta eg Africa Northern Africa FALSE 1 2021-02-03 258313988 relation "النيل, ÙƒÙ<81>ر البدارنة, القليوبية, مصر" natural water 0.2 مصر FALSE
+nile university eg Africa Northern Africa FALSE 1 2021-02-03 103600394 way "Nile University, طريق القاهرة, الاسكندرية الصØراوي الجانبي, مدينة السادات وعدنان مدني, مدينة السادات, Ù…ØاÙ<81>ظة المنوÙ<81>ية, 12577, مصر" amenity university 0.201 مصر FALSE
+quess eg Africa Northern Africa FALSE 1 2021-02-03 6642686 node "سهل القس أبو سعيد, الوادي الجديد, مصر" place locality 0.125 مصر FALSE
+zewail city eg Africa Northern Africa FALSE 1 2021-02-03 127163265 way "ميدان اØمد زويل, ØÙŠ شمال, دسوق, مصر" highway primary 0.1 مصر FALSE
+aru co ee Europe Northern Europe FALSE 1 2021-02-03 258517952 relation "Aru küla, Saaremaa vald, Saare maakond, 94245, Eesti" boundary administrative 0.523032671836241 Eesti FALSE
+atla ee Europe Northern Europe FALSE 1 2021-02-03 258103109 relation "Atla küla, Saaremaa vald, Saare maakond, 93322, Eesti" boundary administrative 0.530084056292374 Eesti FALSE
+irta ee Europe Northern Europe FALSE 1 2021-02-03 258424418 relation "Irta küla, Lääneranna vald, Pärnu maakond, 88407, Eesti" boundary administrative 0.422734482343971 Eesti FALSE
+university of tartu ee Europe Northern Europe FALSE 1 2021-02-03 255255542 way "Tartu Ãœlikool, 18, Ãœlikooli, Kesklinn, Tartu linn, Tartu maakond, 50090, Eesti" amenity university 0.63960797450445 Eesti FALSE
+pinta ec Americas South America FALSE 1 2021-02-03 258646339 relation "Isla Pinta, Parroquia Santa Rosa, Cantón Santa Cruz, Galápagos, Ecuador" place island 0.483021208265432 Ecuador FALSE
+al-quds dz Africa Northern Africa FALSE 1 2021-02-03 57263858 node "ØÙŠ القدس, Metlili ⵎⴻⵜâµ<8d>ⵉâµ<8d>ⵉ متليلي, Daïra Metlili Châamba, Ghardaïa ⵜⴰⵖⴻⵔⴷⴰⵢⵜ غرداية, 47200, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" place suburb 0.375 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+esr dz Africa Northern Africa FALSE 1 2021-02-03 180843078 way "escadron de sécurité routière, Øـي الامــل, Biskra ⵜⵉⴱⴻⵙⴽⴻⵔⵜ بسكرة, Daïra Biskra, Biskra ⴱⴻⵙⴽⵔⴰ بسكرة, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" landuse military 0.2 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+hippo dz Africa Northern Africa FALSE 1 2021-02-03 258539007 relation "Annaba ⵄⴻâµ<8d>âµ<8d>ⴰⴲⴰ عنابة, Daïra Annaba, Annaba ⵄⴻâµ<8f>âµ<8f>ⴰⴱⴰ عنابة, 23000, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" boundary administrative 0.516124885138461 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+ivpp dz Africa Northern Africa FALSE 1 2021-02-03 161838236 way "IVPP, Route de Bouchaoui, Ouled Fayet ⵓâµ<8d>ⴻⴷ ⴼⴰⵢⴻⵜ أولاد Ù<81>ايت, Cheraga, Alger, 16094, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" man_made works 0.101 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+ministry of commerce dz Africa Northern Africa FALSE 1 2021-02-03 107081067 way "Ministère du Commerce, Rue Salem Abdelhamid, Cité Zerhouni Mokhtar (Les Bananiers), Lotissement les Mandariniers, Pins Maritimes الصنوبر البØري, Mohammadia ⵎⵓⵃⴻⵎⵎⴰⴷⵢⴰ المØمدية, Dar El Beïda, Alger, 16312, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" office government 0.101 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+aditec do Americas Caribbean FALSE 1 2021-02-03 184873253 way "Aditec, Calle Ludovino Fernandez, Urbanización Fernández, Los Jardines, Santo Domingo de Guzmán, 10130, República Dominicana" office company 0.101 República Dominicana FALSE
+barrick gold do Americas Caribbean FALSE 1 2021-02-03 176507195 way "Barrick Gold, CotuÃ, Sánchez RamÃrez, República Dominicana" landuse industrial 0.4 República Dominicana FALSE
+ross university school of medicine dm Americas Caribbean FALSE 1 2021-02-03 258789693 relation "Ross University School of Medicine, Michael Douglas Boulevard, Picard, Saint John Parish, Dominica" building university 0.501 Dominica FALSE
+aarhus dk Europe Northern Europe FALSE 1 2021-02-03 131516 node "Aarhus, Aarhus Kommune, Region Midtjylland, 8000, Danmark" place city 0.695326566736205 Danmark FALSE
+aarhus university hospital dk Europe Northern Europe FALSE 1 2021-02-03 258651824 relation "Aarhus Universitet, Paludan-Müllers Vej, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8200, Danmark" amenity university 0.616309477187943 Danmark FALSE
+aau dk Europe Northern Europe FALSE 1 2021-02-03 103460471 way "Aalborg Universitet, Fredrik Bajers Vej, Sønder Tranders, Aalborg, Aalborg Kommune, Region Nordjylland, 9220, Danmark" amenity university 0.439098689594578 Danmark FALSE
+bioscience dk Europe Northern Europe FALSE 1 2021-02-03 147018786 way "Bioscience, Ny Munkegade, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8000, Danmark" building college 0.101 Danmark FALSE
+danisco dk Europe Northern Europe FALSE 1 2021-02-03 101179015 way "Danisco, Hammershøis Kaj, Christianshavn, København, Københavns Kommune, Region Hovedstaden, 1402, Danmark" office company 0.101 Danmark FALSE
+european environment agency dk Europe Northern Europe FALSE 1 2021-02-03 10371743 node "EEA, 6, Kongens Nytorv, Frederiksstaden, København, Københavns Kommune, Region Hovedstaden, 1050, Danmark" office government 0.48741287579359 Danmark FALSE
+guinness world records dk Europe Northern Europe FALSE 1 2021-02-03 45101701 node "Guinness World Records, Østergade, Frederiksstaden, København, Københavns Kommune, Region Hovedstaden, 1100, Danmark" tourism museum 0.301 Danmark FALSE
+kongens lyngby dk Europe Northern Europe FALSE 1 2021-02-03 112538 node "Kongens Lyngby, Lyngby-Taarbæk Kommune, Region Hovedstaden, 2800, Danmark" place suburb 0.647005149903199 Danmark FALSE
+odense dk Europe Northern Europe FALSE 1 2021-02-03 135778 node "Odense, Odense Kommune, Region Syddanmark, 5000, Danmark" place city 0.677626182871731 Danmark FALSE
+orion nebula dk Europe Northern Europe FALSE 1 2021-02-03 118205711 way "Orion, Holstebro, Holstebro Kommune, 7500, Danmark" highway residential 0.2 Danmark FALSE
+ted dk Europe Northern Europe FALSE 1 2021-02-03 101596912 way "Thisted Lufthavn, Hjardemålvej, Thisted Kommune, Region Nordjylland, Danmark" aeroway aerodrome 0.412795139465266 Danmark FALSE
+turing dk Europe Northern Europe FALSE 1 2021-02-03 108351430 way "Turing, Helsingforsgade, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8200, Danmark" building college 0.101 Danmark FALSE
+university of aarhus dk Europe Northern Europe FALSE 1 2021-02-03 116534449 way "Aarhus Universitet, N.J. Fjords Gade, Frederiksbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8000, Danmark" amenity university 0.101 Danmark FALSE
+wais dk Europe Northern Europe FALSE 1 2021-02-03 113043336 way "Wais, Stubbæk, Aabenraa Kommune, Region Syddanmark, 6200, Danmark" highway residential 0.2 Danmark FALSE
+aachen university de Europe Western Europe FALSE 1 2021-02-03 56863988 node "Burschenschaft Markomannia Aachen Greifswald, 12, Karl-Marx-Platz, Innenstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" amenity fraternity 0.101 Deutschland FALSE
+ahl de Europe Western Europe FALSE 1 2021-02-03 259336777 relation "Ahl, Bad Soden-Salmünster, Main-Kinzig-Kreis, Hessen, Deutschland" boundary administrative 0.4 Deutschland FALSE
+alcon de Europe Western Europe FALSE 1 2021-02-03 172470569 way "Alcon, Hochdorf, Freiburg im Breisgau, Baden-Württemberg, 79108, Deutschland" landuse industrial 0.3 Deutschland FALSE
+alphago de Europe Western Europe FALSE 1 2021-02-03 81074242 node "alphago, 18, Hauptstraße, Kenten, Bergheim, Rhein-Erft-Kreis, Nordrhein-Westfalen, 50126, Deutschland" shop security 0.111 Deutschland FALSE
+antiproton de Europe Western Europe FALSE 1 2021-02-03 258877064 relation "FAIR, Wixhausen, Darmstadt, Hessen, 64291, Deutschland" landuse construction 0.256321943137092 Deutschland FALSE
+applied space technology and microgravity de Europe Western Europe FALSE 1 2021-02-03 258848507 relation "Zentrum für angewandte Raumfahrttechnologie und Mikrogravitation, 2, Am Fallturm, Lehe, Horn-Lehe, Stadtbezirk Bremen-Ost, Bremen, 28359, Deutschland" office research 0.101 Deutschland FALSE
+awg de Europe Western Europe FALSE 1 2021-02-03 94962156 way "AWG, Zeile, Beiersdorf, Oppach-Beiersdorf, Görlitz, Sachsen, 02736, Deutschland" highway residential 0.2 Deutschland FALSE
+bayer schering pharma de Europe Western Europe FALSE 1 2021-02-03 258846355 relation "178, Bayer Pharma AG, Wedding, Mitte, Berlin, 13353, Deutschland" landuse industrial 0.464431309768303 Deutschland FALSE
+begemann de Europe Western Europe FALSE 1 2021-02-03 243706481 way "Begemann, Stoddartstraße, Pivitsheide V.H., Pivitsheide V. L. Kussel, Detmold, Kreis Lippe, Nordrhein-Westfalen, 32758, Deutschland" amenity shelter 0.101 Deutschland FALSE
+bmas de Europe Western Europe FALSE 1 2021-02-03 258375961 relation "Bundesministerium für Arbeit und Soziales, Mauerstraße, Mitte, Berlin, 10117, Deutschland" building public 0.001 Deutschland FALSE
+bristol-myers squibb de Europe Western Europe FALSE 1 2021-02-03 69556244 node "Bristol-Myers Squibb, 29, Arnulfstraße, Finanzamt München, Maxvorstadt, München, Bayern, 80636, Deutschland" office pharmacy 0.759130436192281 Deutschland FALSE
+center of applied space technology and microgravity de Europe Western Europe FALSE 1 2021-02-03 258848507 relation "Zentrum für angewandte Raumfahrttechnologie und Mikrogravitation, 2, Am Fallturm, Lehe, Horn-Lehe, Stadtbezirk Bremen-Ost, Bremen, 28359, Deutschland" office research 0.101 Deutschland FALSE
+cfi de Europe Western Europe FALSE 1 2021-02-03 40272800 node "Christliche Fachkräfte International e.V., 3B, Wächterstraße, Dobel, Stuttgart-Mitte, Stuttgart, Baden-Württemberg, Deutschland" office ngo 0.181472839091896 Deutschland FALSE
+christian-albrechts university de Europe Western Europe FALSE 1 2021-02-03 258412488 relation "Christian-Albrechts-Universität zu Kiel, Hasseldieksdammer Weg, Schreventeich, Kiel, Schleswig-Holstein, 24116, Deutschland" amenity university 0.739675942498043 Deutschland FALSE
+climate and energy de Europe Western Europe FALSE 1 2021-02-03 5585166 node "Wuppertal Institut für Klima, Umwelt, Energie, 19, Döppersberg, Südstadt, Gemarkung Elberfeld, Wuppertal, Nordrhein-Westfalen, 42103, Deutschland" office research 0.418669334531229 Deutschland FALSE
+danone de Europe Western Europe FALSE 1 2021-02-03 116486470 way "Danone, Kastenau, Rosenheim, Bayern, 83022, Deutschland" landuse industrial 0.3 Deutschland FALSE
+deutsche bank de Europe Western Europe FALSE 1 2021-02-03 101028871 way "Deutsche Bank, 29-41, Lindenallee, Stadtkern, Stadtbezirk I, Essen, Nordrhein-Westfalen, 45127, Deutschland" historic heritage 0.417338060184506 Deutschland FALSE
+dlr german aerospace center de Europe Western Europe FALSE 1 2021-02-03 258165325 relation "Deutsches Zentrum für Luft- und Raumfahrt, Grengel, Porz, Köln, Nordrhein-Westfalen, 51147, Deutschland" landuse industrial 0.419657429852984 Deutschland FALSE
+dpg de Europe Western Europe FALSE 1 2021-02-03 61019793 node "Deutsche Parlamentarische Gesellschaft, 2, Friedrich-Ebert-Platz, Mitte, Berlin, 10117, Deutschland" office association 0.271596680569804 Deutschland FALSE
+dresden university of technology de Europe Western Europe FALSE 1 2021-02-03 258652719 relation "Technische Universität Dresden, Kleinpestitz/Mockritz, Plauen, Dresden, Sachsen, Deutschland" amenity university 0.622496087225507 Deutschland FALSE
+drever de Europe Western Europe FALSE 1 2021-02-03 192099725 way "Drever Siepen, Peddensiepen, Lüdenscheid, Märkischer Kreis, Nordrhein-Westfalen, 58513, Deutschland" waterway stream 0.3 Deutschland FALSE
+dzne de Europe Western Europe FALSE 1 2021-02-03 259082916 relation "Deutsches Zentrum für Neurodegenerative Erkrankungen, 1, Venusberg-Campus, Venusberg, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53127, Deutschland" office research 0.001 Deutschland FALSE
+east germany de Europe Western Europe FALSE 1 2021-02-03 258412985 relation "E, Elstertrebnitz, Pegau, Landkreis Leipzig, Sachsen, Deutschland" landuse residential 0.386379445861941 Deutschland FALSE
+ems de Europe Western Europe FALSE 1 2021-02-03 258521052 relation "Ems, 48291, Deutschland" waterway river 0.550731319596144 Deutschland FALSE
+environment and energy de Europe Western Europe FALSE 1 2021-02-03 5585166 node "Wuppertal Institut für Klima, Umwelt, Energie, 19, Döppersberg, Südstadt, Gemarkung Elberfeld, Wuppertal, Nordrhein-Westfalen, 42103, Deutschland" office research 0.418669334531229 Deutschland FALSE
+eshg de Europe Western Europe FALSE 1 2021-02-03 114126662 way "Evangelisches Studienhaus Göttingen, 30, Obere Karspüle, Theaterstraße, Innenstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland" building residential 0.001 Deutschland FALSE
+european network de Europe Western Europe FALSE 1 2021-02-03 112610344 way "European Network Services, Gewerbestraße, Bergfelde, Hohen Neuendorf, Oberhavel, Brandenburg, 16540, Deutschland" building yes 0.201 Deutschland FALSE
+european research organisation de Europe Western Europe FALSE 1 2021-02-03 229063373 way "Europäische Südsternwarte, 2, Karl-Schwarzschild-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.001 Deutschland FALSE
+evolution institute de Europe Western Europe FALSE 1 2021-02-03 118088771 way "Institut für Evolution und Biodiversität, 1, Hüfferstraße, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland" building university 0.101 Deutschland FALSE
+fdp de Europe Western Europe FALSE 1 2021-02-03 79106534 node "FDP, Kirschgartenstraße, Hofheim am Taunus, Main-Taunus-Kreis, Hessen, 65719, Deutschland" office political_party 0.101 Deutschland FALSE
+federal office for radiation protection de Europe Western Europe FALSE 1 2021-02-03 100961001 way "Bundesamt für Strahlenschutz, 120-130, Köpenicker Allee, Karlshorst, Lichtenberg, Berlin, 10318, Deutschland" amenity research_institute 0.348159836291227 Deutschland FALSE
+flexible solutions de Europe Western Europe FALSE 1 2021-02-03 39749983 node "Randstad, Kuhstraße, Altstadt, Lüneburg, Niedersachsen, 21335, Deutschland" office employment_agency 0.001 Deutschland FALSE
+foreign office de Europe Western Europe FALSE 1 2021-02-03 100405265 way "Auswärtiges Amt, 1, Werderscher Markt, Mitte, Berlin, 10117, Deutschland" office government 0.533666708979672 Deutschland FALSE
+forest degradation de Europe Western Europe FALSE 1 2021-02-03 48683621 node "Entwürdigung, L 3170, Rasdorf, Landkreis Fulda, Hessen, 36169, Deutschland" tourism artwork 0.001 Deutschland FALSE
+forest stewardship council de Europe Western Europe FALSE 1 2021-02-03 78115705 node "Forest Stewardship Council (FSC), 134, Adenauerallee, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" office association 0.301 Deutschland FALSE
+fraunhofer institute de Europe Western Europe FALSE 1 2021-02-03 124413328 way "Fraunhofer-Institute, Heidenhofstraße, Mooswald-Ost, Mooswald, Freiburg im Breisgau, Baden-Württemberg, 79110, Deutschland" amenity parking 0.201 Deutschland FALSE
+friedrich miescher laboratory de Europe Western Europe FALSE 1 2021-02-03 104029631 way "Friedrich-Miescher-Laboratorium, 9, Max-Planck-Ring, Max-Planck-Institut, Schönblick / Winkelwiese, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland" building yes 0.487997652924817 Deutschland FALSE
+ge free de Europe Western Europe FALSE 1 2021-02-03 98138672 way "Freiwillige Feuerwehr Gelting, 45, Geltinger Straße, Gelting, Pliening, Landkreis Ebersberg, Bayern, 85652, Deutschland" amenity fire_station 0.101 Deutschland FALSE
+gebrüder meier de Europe Western Europe FALSE 1 2021-02-03 97290833 way "Gebrüder-Meier-Weg, Edmundsthal-Siemerswalde, Geesthacht, Herzogtum Lauenburg, Schleswig-Holstein, 21502, Deutschland" highway living_street 0.3 Deutschland FALSE
+geomar helmholtz center for ocean research kiel de Europe Western Europe FALSE 1 2021-02-03 92382691 way "GEOMAR Helmholtz Zentrum für Ozeanforschung Kiel, 20, Düsternbrooker Weg, Düsternbrook, Kiel, Schleswig-Holstein, 24105, Deutschland" amenity university 0.401 Deutschland FALSE
+geomar helmholtz centre for ocean research kiel de Europe Western Europe FALSE 1 2021-02-03 92382691 way "GEOMAR Helmholtz Zentrum für Ozeanforschung Kiel, 20, Düsternbrooker Weg, Düsternbrook, Kiel, Schleswig-Holstein, 24105, Deutschland" amenity university 0.401 Deutschland FALSE
+german institute for economic research de Europe Western Europe FALSE 1 2021-02-03 2653124 node "Deutsches Institut für Wirtschaftsforschung, 58, Mohrenstraße, Mitte, Berlin, 10117, Deutschland" office research 0.473725631690798 Deutschland FALSE
+german primate centre de Europe Western Europe FALSE 1 2021-02-03 101999477 way "Deutsches Primatenzentrum GmbH, 7, Hans-Adolf-Krebs-Weg, Weende, Weende / Deppoldshausen, Göttingen, Landkreis Göttingen, Niedersachsen, 37077, Deutschland" building yes 0.101 Deutschland FALSE
+giss de Europe Western Europe FALSE 1 2021-02-03 106040825 way "Giss, Wölfershausen, Heringen, Landkreis Hersfeld-Rotenburg, Hessen, 36266, Deutschland" waterway stream 0.3 Deutschland FALSE
+goethe university of frankfurt de Europe Western Europe FALSE 1 2021-02-03 60505320 node "Goethe Welcome Centre, Theodor-W.-Adorno-Platz, Westend Nord, Innenstadt 2, Frankfurt am Main, Hessen, 60323, Deutschland" amenity university 0.201 Deutschland FALSE
+göttingen state de Europe Western Europe FALSE 1 2021-02-03 258366673 relation "Göttingen, Landkreis Göttingen, Niedersachsen, Deutschland" boundary administrative 0.719432791454798 Deutschland FALSE
+göttingen university de Europe Western Europe FALSE 1 2021-02-03 101743013 way "Mathematische Fakultät, 3-5, Bunsenstraße, Südstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland" building university 0.101 Deutschland FALSE
+guest de Europe Western Europe FALSE 1 2021-02-03 863347 node "Guest, Diedrichshagen, Weitenhagen, Landhagen, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17491, Deutschland" place hamlet 0.35 Deutschland FALSE
+hamburg de Europe Western Europe FALSE 1 2021-02-03 116376 node "Hamburg, 20095, Deutschland" place city 0.825525646308822 Deutschland FALSE
+heidelberg university in germany de Europe Western Europe FALSE 1 2021-02-03 6159717 node "SRH Hochschule, 6, Ludwig-Guttmann-Straße, Wieblingen, Heidelberg, Baden-Württemberg, 69123, Deutschland" amenity university 0.514317004425986 Deutschland FALSE
+heinrich böll foundation de Europe Western Europe FALSE 1 2021-02-03 97689731 way "Heinrich-Böll-Stiftung, 8, Schumannstraße, Mitte, Berlin, 10117, Deutschland" building civic 0.201 Deutschland FALSE
+heinrich heine university de Europe Western Europe FALSE 1 2021-02-03 95164755 way "Heinrich-Heine-Straße, Stadtrandsiedlung, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" highway residential 0.3 Deutschland FALSE
+heinrich-böll foundation de Europe Western Europe FALSE 1 2021-02-03 97689731 way "Heinrich-Böll-Stiftung, 8, Schumannstraße, Mitte, Berlin, 10117, Deutschland" building civic 0.201 Deutschland FALSE
+helmholtz center munich de Europe Western Europe FALSE 1 2021-02-03 106041248 way "Helmholtzstraße, Bezirksteil Marsfeld, Maxvorstadt, München, Bayern, 80636, Deutschland" highway residential 0.2 Deutschland FALSE
+hertie school of governance de Europe Western Europe FALSE 1 2021-02-03 7730086 node "Hertie School of Governance, 180, Friedrichstraße, Mitte, Berlin, 10117, Deutschland" amenity college 0.76173885138595 Deutschland FALSE
+hong kong university de Europe Western Europe FALSE 1 2021-02-03 1222442 node "Hong-Kong, Feldstraße, Südliche Mühlenvorstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" amenity fast_food 0.201 Deutschland FALSE
+human brain project de Europe Western Europe FALSE 1 2021-02-03 152018298 way "The Human Brain Project, 227b, Im Neuenheimer Feld, Neuenheimer Feld, Neuenheim, Heidelberg, Baden-Württemberg, 69120, Deutschland" building yes 0.301 Deutschland FALSE
+icecube de Europe Western Europe FALSE 1 2021-02-03 111332551 way "IceCube, Wasserstraße, Wiemelhausen, Bochum, Nordrhein-Westfalen, 44789, Deutschland" man_made water_works 0.101 Deutschland FALSE
+icp de Europe Western Europe FALSE 1 2021-02-03 67708109 node "ICP, 11, Auf der Breit, Gewerbegebiet Breit, Durlach, Karlsruhe, Baden-Württemberg, 76227, Deutschland" office company 0.101 Deutschland FALSE
+ifom de Europe Western Europe FALSE 1 2021-02-03 106305867 way "Institut für Forschung in der Operativen Medizin, Ostmerheimer Straße, Merheim, Kalk, Köln, Nordrhein-Westfalen, 51109, Deutschland" amenity university 0.001 Deutschland FALSE
+ims de Europe Western Europe FALSE 1 2021-02-03 258521052 relation "Ems, 48291, Deutschland" waterway river 0.450731319596144 Deutschland FALSE
+institute for futures studies de Europe Western Europe FALSE 1 2021-02-03 98779886 way "Institut für Zukunftsstudien und Technologiebewertung (IZT), 26, Schopenhauerstraße, Schlachtensee, Steglitz-Zehlendorf, Berlin, 14129, Deutschland" office research 0.001 Deutschland FALSE
+international mathematical union de Europe Western Europe FALSE 1 2021-02-03 66091109 node "International Mathematical Union, 11A, Hausvogteiplatz, Mitte, Berlin, 10117, Deutschland" office association 0.667391061753173 Deutschland FALSE
+ion research de Europe Western Europe FALSE 1 2021-02-03 258877064 relation "FAIR, Wixhausen, Darmstadt, Hessen, 64291, Deutschland" landuse construction 0.256321943137092 Deutschland FALSE
+jma de Europe Western Europe FALSE 1 2021-02-03 236857200 way "JMA, Jocksdorf, Neiße-Malxetal, Döbern-Land, Spree-Neiße, Brandenburg, 03159, Deutschland" landuse farmyard 0.3 Deutschland FALSE
+karlsruhe university de Europe Western Europe FALSE 1 2021-02-03 127366738 way "Karlshochschule International University, 36-38, Karlstraße, Innenstadt-West Westlicher Teil, Innenstadt-West, Karlsruhe, Baden-Württemberg, 76133, Deutschland" amenity university 0.508817475555606 Deutschland FALSE
+kiel university de Europe Western Europe FALSE 1 2021-02-03 95613087 way "Fachhochschule Kiel, Grenzstraße, Neumühlen-Dietrichsdorf, Kiel, Schleswig-Holstein, 24149, Deutschland" amenity university 0.414691670621569 Deutschland FALSE
+kiost de Europe Western Europe FALSE 1 2021-02-03 17130552 node "Kiost, 59, Ostendstraße, Stuttgart-Ost, Ostheim, Stuttgart-Ost, Stuttgart, Baden-Württemberg, 70188, Deutschland" shop kiosk 0.101 Deutschland FALSE
+lbc de Europe Western Europe FALSE 1 2021-02-03 84509711 way "Flughafen Lübeck-Blankensee, Blankenseer Straße, Blankensee, Sankt Jürgen, Lübeck, Schleswig-Holstein, 23562, Deutschland" aeroway aerodrome 0.412065652038613 Deutschland FALSE
+leda de Europe Western Europe FALSE 1 2021-02-03 257850836 relation "Leda, Landkreis Leer, Niedersachsen, 26789, Deutschland" waterway river 0.401403950541444 Deutschland FALSE
+leibniz institute de Europe Western Europe FALSE 1 2021-02-03 103261509 way "Leibniz-Institut für Astrophysik Potsdam, Rosa-Luxemburg-Straße, Neubabelsberg, Babelsberg Nord, Babelsberg, Potsdam, Brandenburg, 14482, Deutschland" amenity research_institute 0.383208261767925 Deutschland FALSE
+leibniz university de Europe Western Europe FALSE 1 2021-02-03 108957038 way "Leibniz-Institut für Plasmaforschung und Technologie (INP), 2, Felix-Hausdorff-Straße, Nördliche Mühlenvorstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" building yes 0.295871082899258 Deutschland FALSE
+leibniz university of hanover de Europe Western Europe FALSE 1 2021-02-03 97020033 way "Leibniz Universität Hannover, ""Parkhaus"", Appelstraße, Nordstadt, Nord, Hannover, Region Hannover, Niedersachsen, 30167, Deutschland" amenity university 0.594591508955585 Deutschland FALSE
+ludwig-maximilians university de Europe Western Europe FALSE 1 2021-02-03 63038249 node "Ludwig-Maximilians-Universität, 1, Geschwister-Scholl-Platz, Bezirksteil Universität, Maxvorstadt, München, Bayern, 80539, Deutschland" amenity university 0.201 Deutschland FALSE
+machine intelligence de Europe Western Europe FALSE 1 2021-02-03 99945955 way "Munich School of Robotics and Machine Intelligence (MSRM), Technische Universität München, 134, Heßstraße, Bezirksteil Schwere-Reiter-Straße, Schwabing-West, München, Bayern, 80797, Deutschland" building yes 0.201 Deutschland FALSE
+masai mara national reserve de Europe Western Europe FALSE 1 2021-02-03 74900850 node "Masai Mara, Hodenhagen, Samtgemeinde Ahlden, Heidekreis, Niedersachsen, 29693, Deutschland" place locality 0.325 Deutschland FALSE
+max planck institute for informatics de Europe Western Europe FALSE 1 2021-02-03 102150427 way "Max-Planck-Institut für Informatik, E1 4, Campus, Universität, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66123, Deutschland" building university 0.638041195081873 Deutschland FALSE
+max planck institute for mathematics de Europe Western Europe FALSE 1 2021-02-03 4330352 node "Max-Planck-Institut für Mathematik, 7, Vivatsgasse, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53111, Deutschland" amenity university 0.582526166251558 Deutschland FALSE
+max planck institute for molecular biomedicine de Europe Western Europe FALSE 1 2021-02-03 154889269 way "Max-Planck-Institut für molekulare Biomedizin (Eastwing), 54, Von-Esmarch-Straße, Sentruper Höhe, Münster-West, Münster, Nordrhein-Westfalen, 48149, Deutschland" building hospital 0.201 Deutschland FALSE
+max planck institute for nuclear physics de Europe Western Europe FALSE 1 2021-02-03 100288338 way "Max-Planck-Institut für Kernphysik, 1, Saupfercheckweg, Speyererhof, Altstadt, Heidelberg, Baden-Württemberg, 69117, Deutschland" amenity research_institute 0.566268984478359 Deutschland FALSE
+max planck institute for quantum optics de Europe Western Europe FALSE 1 2021-02-03 150324329 way "Max-Planck-Institut für Quantenoptik, 1, Hans-Kopfermann-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.633532730730458 Deutschland FALSE
+max planck institute for the physics of complex systems de Europe Western Europe FALSE 1 2021-02-03 93934599 way "Max-Planck-Institut für Physik komplexer Systeme, 38, Nöthnitzer Straße, Plauen, Dresden, Sachsen, 01187, Deutschland" amenity research_institute 0.201 Deutschland FALSE
+max planck institute for the study of religious and ethnic diversity de Europe Western Europe FALSE 1 2021-02-03 259291204 relation "Max-Planck-Institut zur Erforschung multireligiöser und multiethnischer Gesellschaften, Hermann-Föge-Weg, Oststadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland" amenity university 0.59324803174626 Deutschland FALSE
+max planck institute of neurobiology de Europe Western Europe FALSE 1 2021-02-03 6221673 node "Max-Planck-Institut für Neurobiologie, 18, Am Klopferspitz, Martinsried, Planegg, Landkreis München, Bayern, 82152, Deutschland" amenity university 0.517252435362624 Deutschland FALSE
+max planck institute of plasma physics de Europe Western Europe FALSE 1 2021-02-03 62003775 node "Max-Planck-Institut für Plasmaphysik, 1, Wendelsteinstraße, Koitenhagen, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17491, Deutschland" office research 0.646843791996006 Deutschland FALSE
+max planck unit de Europe Western Europe FALSE 1 2021-02-03 1288676 node "Max Planck, Platanenallee, Stadtfriedhof, Weststadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37081, Deutschland" historic memorial 0.62815879877835 Deutschland FALSE
+max-planck institute for mathematics de Europe Western Europe FALSE 1 2021-02-03 4330352 node "Max-Planck-Institut für Mathematik, 7, Vivatsgasse, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53111, Deutschland" amenity university 0.582526166251558 Deutschland FALSE
+medigene de Europe Western Europe FALSE 1 2021-02-03 80346809 node "Medigene AG, 11, Lochhamer Straße, Martinsried, Planegg, Landkreis München, Bayern, 82152, Deutschland" office company 0.101 Deutschland FALSE
+milan kováč de Europe Western Europe FALSE 1 2021-02-03 3165617 node "Hazienda, 3, Moosdorfstraße, Oberalting, Seefeld, Wörthsee, Landkreis Starnberg, Bayern, 82229, Deutschland" amenity restaurant 0.001 Deutschland FALSE
+milinski de Europe Western Europe FALSE 1 2021-02-03 67441170 node "Milinski, 5, Am Germanenring, Bruchköbel, Main-Kinzig-Kreis, Hessen, 63486, Deutschland" shop car 0.101 Deutschland FALSE
+molecular genetics center de Europe Western Europe FALSE 1 2021-02-03 95773291 way "Max-Planck-Institut für molekulare Zellbiologie und Genetik, 108, Pfotenhauerstraße, Johannstadt-Nord, Johannstadt, Altstadt, Dresden, Sachsen, 01307, Deutschland" office research 0.324670737896991 Deutschland FALSE
+molecular sciences institute de Europe Western Europe FALSE 1 2021-02-03 258455101 relation "Buchmann Institute for Molecular Life Sciences (BMLS), 15, Max-von-Laue-Straße, Niederursel, Nord-West, Frankfurt am Main, Hessen, 60438, Deutschland" building university 0.301 Deutschland FALSE
+mpq de Europe Western Europe FALSE 1 2021-02-03 150324329 way "Max-Planck-Institut für Quantenoptik, 1, Hans-Kopfermann-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.333532730730458 Deutschland FALSE
+msm de Europe Western Europe FALSE 1 2021-02-03 114779520 way "Marineschule Mürwik, Sonwik, Flensburg, Schleswig-Holstein, 24944, Deutschland" landuse military 0.403405604298285 Deutschland FALSE
+national biodiversity institute de Europe Western Europe FALSE 1 2021-02-03 118088771 way "Institut für Evolution und Biodiversität, 1, Hüfferstraße, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland" building university 0.001 Deutschland FALSE
+national centre for biotechnology de Europe Western Europe FALSE 1 2021-02-03 96724133 way "Centrum für Biotechnologie (CeBiTec), 27, Universitätsstraße, Schildesche, Bielefeld, Nordrhein-Westfalen, 33615, Deutschland" amenity university 0.001 Deutschland FALSE
+nature network de Europe Western Europe FALSE 1 2021-02-03 47672659 node "EarthLink e.V. – The People & Nature Network, 14, Frohschammerstraße, Bezirksteil Am Riesenfeld, Milbertshofen-Am Hart, München, Bayern, 80807, Deutschland" club yes 0.201 Deutschland FALSE
+neg de Europe Western Europe FALSE 1 2021-02-03 64853201 node "NEG, 118, Hansastraße, Günnigfeld, Bochum-Wattenscheid, Nordrhein-Westfalen, 44866, Deutschland" shop electronics 0.101 Deutschland FALSE
+nims de Europe Western Europe FALSE 1 2021-02-03 258826114 relation "Nims, Eifelkreis Bitburg-Prüm, Rheinland-Pfalz, 54597, Deutschland" waterway river 0.372343749103071 Deutschland FALSE
+nru de Europe Western Europe FALSE 1 2021-02-03 119195573 way "NRU, 18, Werner-von-Siemens-Straße, Industriepark Saarwellingen, Saarwellingen, Landkreis Saarlouis, Saarland, 66793, Deutschland" building yes 0.101 Deutschland FALSE
+palermo university de Europe Western Europe FALSE 1 2021-02-03 16882978 node "Restaurant Palermo, 11 - 13, Ernst-Thälmann-Ring, Schönwalde II, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17491, Deutschland" amenity restaurant 0.101 Deutschland FALSE
+physics preparatory group de Europe Western Europe FALSE 1 2021-02-03 102405708 way "Fachbereich 11, Physikalisches Institut, 10;10a, Wilhelm-Klemm-Straße, Sentruper Höhe, Münster-West, Münster, Nordrhein-Westfalen, 48149, Deutschland" building university 0.001 Deutschland FALSE
+planck institute de Europe Western Europe FALSE 1 2021-02-03 6750725 node "Max-Planck-Institut für Festkörperforschung, 1, Heisenbergstraße, Max-Planck-Institute, Büsnau, Vaihingen, Stuttgart, Baden-Württemberg, 70569, Deutschland" office research 0.201 Deutschland FALSE
+pricewaterhousecoopers de Europe Western Europe FALSE 1 2021-02-03 135320867 way "PricewaterhouseCoopers, 5, Fuhrberger Straße, Kleefeld, Buchholz-Kleefeld, Hannover, Region Hannover, Niedersachsen, 30625, Deutschland" building yes 0.450501936383412 Deutschland FALSE
+pris de Europe Western Europe FALSE 1 2021-02-03 259252002 relation "Pries, Kiel, Schleswig-Holstein, 24159, Deutschland" boundary administrative 0.306301518086152 Deutschland FALSE
+rankl de Europe Western Europe FALSE 1 2021-02-03 300250708 node "Rankl, 8, Südliche Münchner Straße, Grünwald, Landkreis München, Bayern, 82031, Deutschland" shop window_blind 0.101 Deutschland FALSE
+rbm de Europe Western Europe FALSE 1 2021-02-03 106627798 way "Flugplatz Straubing-Wallmühle, SRs 20, Öberau, Straubing, Bayern, 94315, Deutschland" aeroway aerodrome 0.33674906391142 Deutschland FALSE
+rwe de Europe Western Europe FALSE 1 2021-02-03 94139651 way "92, RWE, Benzelrath, Frechen, Rhein-Erft-Kreis, Nordrhein-Westfalen, 50226, Deutschland" landuse industrial 0.3 Deutschland FALSE
+saarland university de Europe Western Europe FALSE 1 2021-02-03 96695261 way "Universität des Saarlandes, Echohüttenweg, Universität, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66123, Deutschland" amenity university 0.587909367964507 Deutschland FALSE
+saarland university medical center de Europe Western Europe FALSE 1 2021-02-03 96695261 way "Universität des Saarlandes, Echohüttenweg, Universität, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66123, Deutschland" amenity university 0.587909367964507 Deutschland FALSE
+schering de Europe Western Europe FALSE 1 2021-02-03 2932912 node "Schering, Rimsting, Landkreis Rosenheim, Bayern, 83253, Deutschland" place isolated_dwelling 0.3 Deutschland FALSE
+stic de Europe Western Europe FALSE 1 2021-02-03 104228249 way "STIC, Strausberg, Märkisch-Oderland, Brandenburg, 15344, Deutschland" landuse commercial 0.3 Deutschland FALSE
+telegraph de Europe Western Europe FALSE 1 2021-02-03 1217959 node "Telegraph, Döschnitz, Schwarzatal, Landkreis Saalfeld-Rudolstadt, Thüringen, 07429, Deutschland" natural peak 0.4 Deutschland FALSE
+thales alenia de Europe Western Europe FALSE 1 2021-02-03 121548045 way "Thales Alenia Space, Ditzingen, Landkreis Ludwigsburg, Baden-Württemberg, 71254, Deutschland" landuse commercial 0.647092386151836 Deutschland FALSE
+treves de Europe Western Europe FALSE 1 2021-02-03 258446038 relation "Trier, Rheinland-Pfalz, Deutschland" boundary administrative 0.610664693690996 Deutschland FALSE
+united nations university de Europe Western Europe FALSE 1 2021-02-03 211684840 way "Universität der Vereinten Nationen, Hermann-Ehlers-Straße, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.465720786441952 Deutschland FALSE
+university library de Europe Western Europe FALSE 1 2021-02-03 96667358 way "Universitätsbibliothek der Freien Universität Berlin, 39, Garystraße, Dahlem, Steglitz-Zehlendorf, Berlin, 14195, Deutschland" amenity library 0.280014158487789 Deutschland FALSE
+university of augsburg de Europe Western Europe FALSE 1 2021-02-03 130471545 way "Universität, Universitätsstraße, Universitätsviertel, Augsburg, Bayern, 86159, Deutschland" railway platform 0.101 Deutschland FALSE
+university of bonn in germany de Europe Western Europe FALSE 1 2021-02-03 20122302 node "Rheinische Friedrich-Wilhelms-Universität Bonn, Arkadenhof, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.890223294922313 Deutschland FALSE
+university of bonn medical centre de Europe Western Europe FALSE 1 2021-02-03 20122302 node "Rheinische Friedrich-Wilhelms-Universität Bonn, Arkadenhof, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.790223294922313 Deutschland FALSE
+university of duisburg-essen de Europe Western Europe FALSE 1 2021-02-03 127148044 way "Universität Duisburg-Essen, L+M-Bereich, Gneisenaustraße, Einschornsteinsiedlung, Neudorf-Nord, Duisburg-Mitte, Duisburg, Nordrhein-Westfalen, 47057, Deutschland" amenity university 0.201 Deutschland FALSE
+university of dusseldorf de Europe Western Europe FALSE 1 2021-02-03 23771253 node "Wohnanlage Gurlittstraße - Studierendenwerk Düsseldorf, 14 - 18, Gurlittstraße, Bilk, Stadtbezirk 3, Düsseldorf, Nordrhein-Westfalen, 40223, Deutschland" amenity university 0.001 Deutschland FALSE
+university of frankfurt de Europe Western Europe FALSE 1 2021-02-03 84474458 way "Frankfurt University of Applied Sciences, Nibelungenallee, Nordend West, Innenstadt 3, Frankfurt am Main, Hessen, 60318, Deutschland" amenity university 0.612019878936673 Deutschland FALSE
+university of hohenheim de Europe Western Europe FALSE 1 2021-02-03 123666613 way "Universität Hohenheim, Mühlweg, Hohenheim, Plieningen, Stuttgart, Aichtal, Baden-Württemberg, 70599, Deutschland" amenity university 0.54210101824834 Deutschland FALSE
+university of munich de Europe Western Europe FALSE 1 2021-02-03 100982165 way "TU München Institut für Pharmakologie, Dietlindenstraße, Bezirksteil Münchener Freiheit, Schwabing-Freimann, München, Bayern, 80802, Deutschland" amenity university 0.001 Deutschland FALSE
+university of oldenburg de Europe Western Europe FALSE 1 2021-02-03 94259203 way "Carl von Ossietzky Universität Oldenburg, 99, Uhlhornsweg, Haarenfeld, Haarentor, Oldenburg, Niedersachsen, 26129, Deutschland" amenity university 0.537234715266229 Deutschland FALSE
+university of passau de Europe Western Europe FALSE 1 2021-02-03 125831895 way "Universität Passau, Rektor-Karl-Heinz-Pollok-Straße, Hacklberg, Passau, Bayern, 94032, Deutschland" amenity university 0.53059885426854 Deutschland FALSE
+university of rostock de Europe Western Europe FALSE 1 2021-02-03 2247559 node "Agrar- und Umweltwissenschaftliche Fakultät, Justus-von-Liebig-Weg, Südstadt, Ortsbeirat 12 : Südstadt, Rostock, Mecklenburg-Vorpommern, 18059, Deutschland" amenity university 0.101 Deutschland FALSE
+university of trier de Europe Western Europe FALSE 1 2021-02-03 204737708 way "Hochschule Trier, Schneidershof, Pallien, West-Pallien, Trier, Rheinland-Pfalz, 54293, Deutschland" amenity university 0.517252435362624 Deutschland FALSE
+university of veterinary medicine hanover de Europe Western Europe FALSE 1 2021-02-03 97041389 way "Tierärztliche Hochschule Hannover, 15, Schwesternhausstraße, Bult, Südstadt-Bult, Hannover, Region Hannover, Niedersachsen, 30173, Deutschland" amenity university 0.340053860433783 Deutschland FALSE
+ute university de Europe Western Europe FALSE 1 2021-02-03 52416287 node "Physiotherapie Ute Westebbe, 28, Marienstraße, Nördliche Mühlenvorstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" amenity doctors 0.101 Deutschland FALSE
+warf de Europe Western Europe FALSE 1 2021-02-03 81212375 node "Warf, Neuharlingersiel, Samtgemeinde Esens, Landkreis Wittmund, Niedersachsen, 26427, Deutschland" place farm 0.3 Deutschland FALSE
+westfälische wilhelms university de Europe Western Europe FALSE 1 2021-02-03 258955070 relation "Westfälische Wilhelms-Universität, 2, Schlossplatz, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland" amenity university 0.75844573834098 Deutschland FALSE
+brontosaurus cz Europe Eastern Europe FALSE 1 2021-02-03 44738526 node "Brontosaurus, JetÅ™ichovice, okres DÄ›Ä<8d>Ãn, Ústecký kraj, Severozápad, 40716, ÄŒesko" natural peak 0.4 ÄŒesko FALSE
+cas institute of microbiology cz Europe Eastern Europe FALSE 1 2021-02-03 208449178 way "Mikrobiologický ústav AV ČR, v.v.i. (laboratoř gnotobiologie), Doly, Nový Hrádek, okres Náchod, Královéhradecký kraj, Severovýchod, 54922, Česko" amenity research_institute 0.001 Česko FALSE
+cibus cz Europe Eastern Europe FALSE 1 2021-02-03 1243731 node "ÄŒÃbuz, Skalice, okres Hradec Králové, Královéhradecký kraj, Severovýchod, 50303, ÄŒesko" place village 0.275 ÄŒesko FALSE
+ctvt cz Europe Eastern Europe FALSE 1 2021-02-03 108596514 way "Lesnà ČtvÅ¥, Vápenná, okres JesenÃk, Olomoucký kraj, StÅ™ednà Morava, ÄŒesko" landuse residential 0.2 ÄŒesko FALSE
+czech academy of sciences cz Europe Eastern Europe FALSE 1 2021-02-03 97095811 way "Akademie vÄ›d ÄŒeské republiky, DivadelnÃ, Staré MÄ›sto, Hlavnà mÄ›sto Praha, Praha, 11665, ÄŒesko" building yes 0.455436556781574 ÄŒesko FALSE
+der spiegel cz Europe Eastern Europe FALSE 1 2021-02-03 44819975 node "Zrcadlo, Tisá, okres Ústà nad Labem, Ústecký kraj, Severozápad, 40336, Česko" natural peak 0.3 Česko FALSE
+icos cz Europe Eastern Europe FALSE 1 2021-02-03 75655700 node "ICOS, 251, 5. kvÄ›tna, PleÅ¡ivec, ÄŒeský Krumlov, okres ÄŒeský Krumlov, JihoÄ<8d>eský kraj, Jihozápad, 381 01, ÄŒesko" amenity social_facility 0.101 ÄŒesko FALSE
+institute of anatomy cz Europe Eastern Europe FALSE 1 2021-02-03 258199235 relation "Institute of Anatomy, U Nemocnice, Nové Město, Hlavnà město Praha, Praha, 11121, Česko" building civic 0.301 Česko FALSE
+more aqua cz Europe Eastern Europe FALSE 1 2021-02-03 102824192 way "Moře, Rašovy, Turkovice, okres Pardubice, Pardubický kraj, Severovýchod, Česko" natural water 0.2 Česko FALSE
+rcp cz Europe Eastern Europe FALSE 1 2021-02-03 238495840 way "RCP, Florenc, KarlÃn, Hlavnà mÄ›sto Praha, Praha, ÄŒesko" landuse construction 0.3 ÄŒesko FALSE
+sec cz Europe Eastern Europe FALSE 1 2021-02-03 16251886 node "SeÄ<8d>, nám. Prof. ÄŒ. Strouhala, SeÄ<8d>, okres Chrudim, Pardubický kraj, Severovýchod, 53807, ÄŒesko" tourism camp_site;caravan_site;attraction 0.463856464536119 ÄŒesko FALSE
+spiegel cz Europe Eastern Europe FALSE 1 2021-02-03 44819975 node "Zrcadlo, Tisá, okres Ústà nad Labem, Ústecký kraj, Severozápad, 40336, Česko" natural peak 0.3 Česko FALSE
+sprint cz Europe Eastern Europe FALSE 1 2021-02-03 119878029 way "Sprint, Jimramov, SedliÅ¡tÄ›, Jimramov, okres ŽÄ<8f>ár nad Sázavou, Kraj VysoÄ<8d>ina, Jihovýchod, ÄŒesko" landuse industrial 0.3 ÄŒesko FALSE
+troja cz Europe Eastern Europe FALSE 1 2021-02-03 258008039 relation "Troja, Hlavnà město Praha, Praha, 17100, Česko" boundary administrative 0.521401226677294 Česko FALSE
+unicode cz Europe Eastern Europe FALSE 1 2021-02-03 101090349 way "UNICODE Systems, StÅ™Ãtež u TÅ™ebÃÄ<8d>e, StÅ™Ãtež, okres TÅ™ebÃÄ<8d>, Kraj VysoÄ<8d>ina, Jihovýchod, ÄŒesko" landuse industrial 0.3 ÄŒesko FALSE
+wikimedia cz Europe Eastern Europe FALSE 1 2021-02-03 53573639 node "Wikimedia ČR, 1705/21, Slovenská, Vinohrady, Hlavnà město Praha, Praha, 12000, Česko" office ngo 0.101 Česko FALSE
+wine institute cz Europe Eastern Europe FALSE 1 2021-02-03 296282907 node "Wine Institute, 797, Kodaňská, Vršovice, Hlavnà město Praha, Praha, 10100, Česko" shop wine 0.201 Česko FALSE
+cyprus institute cy Asia Western Asia FALSE 1 2021-02-03 236429001 way "The Cyprus Institute, F119, Governor's Beach, Λεμεσός, ΚÏ<8d>Ï€Ï<81>ος, 4524, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs" building yes 0.201 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+international business times cy Asia Western Asia FALSE 1 2021-02-03 172052208 way "Διεθνής ΑεÏ<81>ολιμÎνας Πάφου, E603, Κοινότητα Τίμης, Πάφος, ΚÏ<8d>Ï€Ï<81>ος, 8507, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs" aeroway aerodrome 0.402062797383891 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+olivo labs cy Asia Western Asia FALSE 1 2021-02-03 145941969 way "Labs, Thessalias Street, Lykavitos, Λευκωσία, Δήμος Λευκωσίας, Λευκωσία - LefkoÅŸa, Λευκωσία, ΚÏ<8d>Ï€Ï<81>ος, 1048, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs" amenity university 0.101 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+cu cu Americas Caribbean FALSE 1 2021-02-03 258428385 relation Cuba boundary administrative 0.844839051690795 Cuba FALSE
+precioso cu Americas Caribbean FALSE 1 2021-02-03 74151205 node "Precioso, Varadero, Cárdenas, Matanzas, 42211, Cuba" place hamlet 0.35 Cuba FALSE
+antonio nariño university co Americas South America FALSE 1 2021-02-03 11561601 node "Antonio Nariño, VÃa A Chinchina, Estambul, Comuna La Macarena, Manizales, Centrosur, Caldas, Región Andina, 176002, Colombia" amenity university 0.201 Colombia FALSE
+calipso co Americas South America FALSE 1 2021-02-03 259165216 relation "Calipso, Comuna 13, PerÃmetro Urbano Santiago de Cali, Cali, Sur, Valle del Cauca, PacÃfica, Colombia" boundary administrative 0.4 Colombia FALSE
+dc co Americas South America FALSE 1 2021-02-03 258397765 relation "Bogotá Distrito Capital, Región Andina, 11001, Colombia" boundary administrative 0.683174342915783 Colombia FALSE
+natural products branch co Americas South America FALSE 1 2021-02-03 77766964 node "Madre Sierra productos naturales, Carrera 5, Palomino, Dibulla, La Guajira, Caribe, 446009, Colombia" amenity pharmacy 0.101 Colombia FALSE
+nebula genomics co Americas South America FALSE 1 2021-02-03 12402461 node "GENOMICS, Carrera 42, Tequendama, Comuna 19, PerÃmetro Urbano Santiago de Cali, Cali, Sur, Valle del Cauca, PacÃfica, 76000, Colombia" amenity hospital 0.101 Colombia FALSE
+pva co Americas South America FALSE 1 2021-02-03 101597975 way "Aeropuerto El Embrujo, VÃa Circunvalar de Providencia, Bailey, Rocky Point, Archipiélago de San Andrés, Providencia y Santa Catalina, Colombia" aeroway aerodrome 0.345950553181826 Colombia FALSE
+university of quindío co Americas South America FALSE 1 2021-02-03 191022266 way "Universidad la Gran Colombia - Ciudadela del Saber La Santa MarÃa, Armenia - Aeropuerto, Armenia, Capital, QuindÃo, Región Andina, 630008, Colombia" amenity university 0.101 Colombia FALSE
+aipi cn Asia Eastern Asia FALSE 1 2021-02-03 302227361 node "矮陂, æƒ å·žå¸‚, 广东çœ<81>, ä¸å›½" place village 0.275 ä¸å›½ FALSE
+air cn Asia Eastern Asia FALSE 1 2021-02-03 97128317 way "æ©Ÿå ´ Airport, 翔天路 Sky Plaza Road, 離島å<8d>€ Islands District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" railway station 0.479338672131387 ä¸å›½ FALSE
+anhui cn Asia Eastern Asia FALSE 1 2021-02-03 296043921 relation "安徽çœ<81>, ä¸å›½" boundary administrative 0.659871277196784 ä¸å›½ FALSE
+autodesk research cn Asia Eastern Asia FALSE 1 2021-02-03 156971777 way "欧特克软件ä¸å›½ç ”å<8f>‘ä¸å¿ƒ, 峨山路 91 弄, 花木镇, 浦东新区, 200122, ä¸å›½" building commercial 0.001 ä¸å›½ FALSE
+beijing forestry university cn Asia Eastern Asia FALSE 1 2021-02-03 183393105 way "北京林业大å¦, 白蜡大é<81>“, 八家æ<9d>‘, 海淀区, 北京市, 010-62332281, ä¸å›½" amenity university 0.39975765213835 ä¸å›½ FALSE
+beijing huayi cn Asia Eastern Asia FALSE 1 2021-02-03 131049528 way "Beijing -Chengde Expressway, 郑家庄æ<9d>‘, 怀柔区 / Huairou, 北京市, ä¸å›½" highway motorway 0.2 ä¸å›½ FALSE
+beijing institute of technology cn Asia Eastern Asia FALSE 1 2021-02-03 97776882 way "北京ç<90>†å·¥å¤§å¦, 5, ä¸å…³æ<9d>‘å<8d>—大街, 万柳地区, 海淀区, 北京市, 100872, ä¸å›½" amenity university 0.429216387348702 ä¸å›½ FALSE
+caa cn Asia Eastern Asia FALSE 1 2021-02-03 258898604 relation "ä¸å›½ç¾Žæœ¯å¦é™¢, å<8d>—山路, 清波街é<81>“, 上城区, æ<9d>州市, 浙江çœ<81>, 310002, ä¸å›½" amenity university 0.4192479107425 ä¸å›½ FALSE
+cha university cn Asia Eastern Asia FALSE 1 2021-02-03 114396997 way "茶港路, æ¦æ±‰å¤§å¦, ç<8f>žç<8f>ˆå±±è¡—é<81>“, æ¦æ˜ŒåŒº, 湖北çœ<81>, 430072, ä¸å›½" highway residential 0.1 ä¸å›½ FALSE
+chc cn Asia Eastern Asia FALSE 1 2021-02-03 257605389 relation ä¸å›½ boundary administrative 0.87882659637803 ä¸å›½ FALSE
+china central television cn Asia Eastern Asia FALSE 1 2021-02-03 156562290 way "ä¸å¤®å¹¿æ’电视总å<8f>°å¤<8d>兴路办公区, 海淀区, 北京市, ä¸å›½" landuse commercial 0.543449477148185 ä¸å›½ FALSE
+china geological survey cn Asia Eastern Asia FALSE 1 2021-02-03 74604676 node "China Geological Survey, 一环路北三段, 星辰苑, 人民北路街é<81>“, æˆ<90>都市, å››å·<9d>çœ<81>, 610084, ä¸å›½" office government 0.301 ä¸å›½ FALSE
+china institute of water resources and hydropower research cn Asia Eastern Asia FALSE 1 2021-02-03 72695777 node "China Institute of Water Resources and Hydropower Research, 1, 玉渊æ½å<8d>—è·¯, 海淀区, 北京市, 100038, ä¸å›½" office Institute 0.801 ä¸å›½ FALSE
+china national computer congress cn Asia Eastern Asia FALSE 1 2021-02-03 196797629 way "ä¸å›½å…±äº§å…šç¬¬äºŒæ¬¡å…¨å›½ä»£è¡¨å¤§ä¼šä¼šå<9d>€, 30, 延安高架路, é<9d>™å®‰åŒº, 200070, ä¸å›½" historic memorial 0.259145294756841 ä¸å›½ FALSE
+china national offshore oil corporation cn Asia Eastern Asia FALSE 1 2021-02-03 52352480 node "ä¸å›½æµ·æ²¹ CNOOC, 花城æœ<8d>务区, 花都区, 广州市, 广东çœ<81>, ä¸å›½" amenity fuel 0.001 ä¸å›½ FALSE
+china west normal university cn Asia Eastern Asia FALSE 1 2021-02-03 258825506 relation "å<8d>Žä¸œå¸ˆèŒƒå¤§å¦, 3663, ä¸å±±åŒ—è·¯, é•¿å®<81>区, 200062, ä¸å›½" amenity university 0.470582098448222 ä¸å›½ FALSE
+chinese academy of sciences institute of chemistry cn Asia Eastern Asia FALSE 1 2021-02-03 218888877 way "ä¸å›½ç§‘å¦é™¢åŒ–å¦ç ”究所, ä¸å…³æ<9d>‘北二æ<9d>¡, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" amenity research_institute 0.222549534893346 ä¸å›½ FALSE
+chinese academy of sciences' institute of theoretical physics cn Asia Eastern Asia FALSE 1 2021-02-03 213466451 way "ä¸å›½ç§‘å¦é™¢ç<90>†è®ºç‰©ç<90>†ç ”究所, 55å<8f>·, ä¸å…³æ<9d>‘东路, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" office research 0.001 ä¸å›½ FALSE
+citic securities cn Asia Eastern Asia FALSE 1 2021-02-03 149771411 way "ä¸ä¿¡è¯<81>券大厦, 8å<8f>·, ä¸å¿ƒä¸‰è·¯, å<8d>“越时代广场, ç¦<8f>田区, 深圳市, 广东çœ<81>, 518048, ä¸å›½" building commercial 0.001 ä¸å›½ FALSE
+csns cn Asia Eastern Asia FALSE 1 2021-02-03 209031547 way "CSNS, 大朗镇, 东莞市, 广东çœ<81>, ä¸å›½" highway residential 0.2 ä¸å›½ FALSE
+cuhk cn Asia Eastern Asia FALSE 1 2021-02-03 259201755 relation "香港ä¸æ–‡å¤§å¸ The Chinese University of Hong Kong, å<90><90>露港公路 Tolo Highway, 馬料水 Ma Liu Shui, 馬éž<8d>å±± Ma On Shan, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" amenity university 0.515796938688453 ä¸å›½ FALSE
+department of public security cn Asia Eastern Asia FALSE 1 2021-02-03 149888559 way "深圳市公安局出入境管ç<90>†å¤„, 4016, 解放路, 蔡屋围, æ¡‚å›è¡—é<81>“, 罗湖区, 深圳市, 广东çœ<81>, 518000, ä¸å›½" office government 0.001 ä¸å›½ FALSE
+donghua university cn Asia Eastern Asia FALSE 1 2021-02-03 156972924 way "东å<8d>Žå¤§å¦, 凯旋路, é•¿å®<81>区, 200050, ä¸å›½" amenity university 0.409150861243221 ä¸å›½ FALSE
+dsn cn Asia Eastern Asia FALSE 1 2021-02-03 121641844 way "鄂尔多斯伊金éœ<8d>洛机场, 阿大一级公路, 乌兰木伦镇, 伊金éœ<8d>洛旗, 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½" aeroway aerodrome 0.444828356030634 ä¸å›½ FALSE
+education bureau cn Asia Eastern Asia FALSE 1 2021-02-03 181667938 way "Education Bureau, Bayi Bridge, 水北街é<81>“, 邵æ¦å¸‚, å<8d>—平市, ç¦<8f>建çœ<81>, ä¸å›½" office government 0.201 ä¸å›½ FALSE
+ets cn Asia Eastern Asia FALSE 1 2021-02-03 25065834 node "å°–æ<9d>± East Tsim Sha Tsui, 梳士巴利é<81>“ Salisbury Road, 尖沙咀æ<9d>± East Tsim Sha Tsui, 尖沙咀 Tsim Sha Tsui, 油尖旺å<8d>€ Yau Tsim Mong District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" railway yes 0.40331698832418 ä¸å›½ FALSE
+first affiliated hospital of guangzhou medical university cn Asia Eastern Asia FALSE 1 2021-02-03 199861213 way "广州医科大å¦é™„属第一医院, é<9d>–æµ·è·¯, 人民街é<81>“, 越秀区, 广州市, 广东çœ<81>, 510115, ä¸å›½" amenity hospital 0.158083983169266 ä¸å›½ FALSE
+first affiliated hospital of zhejiang university cn Asia Eastern Asia FALSE 1 2021-02-03 203868614 way "浙江大å¦é™„属第一医院, 庆春路, å°<8f>è<90>¥è¡—é<81>“, 上城区, æ<9d>州市, 浙江çœ<81>, 310003, ä¸å›½" amenity hospital 0.001 ä¸å›½ FALSE
+first affiliated hospital of zhengzhou university cn Asia Eastern Asia FALSE 1 2021-02-03 210240098 way "郑州大å¦ç¬¬ä¸€é™„属医院, 1å<8f>·, 龙湖ä¸çŽ¯è·¯, 金水区, 郑州市, æ²³å<8d>—çœ<81>, 450003, ä¸å›½" amenity hospital 0.001 ä¸å›½ FALSE
+foreign correspondents club cn Asia Eastern Asia FALSE 1 2021-02-03 182742528 way "香港外國記者會 The Foreign Correspondents' Club, Hong Kong, 2, 下亞厘畢é<81>“ Lower Albert Road, SoHo, ä¸ç’° Central, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" building yes 0.301 ä¸å›½ FALSE
+gan cn Asia Eastern Asia FALSE 1 2021-02-03 258491397 relation "江西çœ<81>, ä¸å›½" boundary administrative 0.660896625230364 ä¸å›½ FALSE
+gansu cn Asia Eastern Asia FALSE 1 2021-02-03 257817395 relation "甘肃çœ<81>, ä¸å›½" boundary administrative 0.655464380043053 ä¸å›½ FALSE
+genome biology cn Asia Eastern Asia FALSE 1 2021-02-03 177252901 way "å®¶èš•åŸºå› ç»„å›½å®¶é‡<8d>点实验室, 乡建路, 北碚区, é‡<8d>庆ä¸å¿ƒåŸŽåŒº, é‡<8d>庆市, 400715, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+google china cn Asia Eastern Asia FALSE 1 2021-02-03 67831332 node "Google, 555, 軒尼詩é<81>“ Hennessy Road, 摩利臣山 Morrison Hill, 銅鑼ç<81>£ Causeway Bay, ç<81>£ä»”å<8d>€ Wan Chai District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" office company 0.101 ä¸å›½ FALSE
+guangdong technion israel institute of technology cn Asia Eastern Asia FALSE 1 2021-02-03 204544197 way "广东以色列ç<90>†å·¥å¦é™¢, 241å<8f>·, 大å¦è·¯, 鮀江街é<81>“, 金平区, 汕头市, 广东çœ<81>, 515063, ä¸å›½" amenity university 0.35112554102268 ä¸å›½ FALSE
+guangxi cn Asia Eastern Asia FALSE 1 2021-02-03 257932217 relation "广西壮æ—<8f>自治区, ä¸å›½" boundary administrative 0.653225316203717 ä¸å›½ FALSE
+guangzhou women and children's medical center cn Asia Eastern Asia FALSE 1 2021-02-03 217534561 way "妇儿ä¸å¿ƒ, 金穗路隧é<81>“, ç<8f> 江新城, 冼æ<9d>‘è¡—é<81>“, 天河区, 广州市, 广东çœ<81>, 510623, ä¸å›½" building train_station 0.35609057542022 ä¸å›½ FALSE
+hainan university cn Asia Eastern Asia FALSE 1 2021-02-03 143082445 way "æµ·å<8d>—大å¦, 海甸四西路 - Haidian 4th West Road, 人民路街é<81>“, 海甸岛, 美兰区, æµ·å<8f>£å¸‚, æµ·å<8d>—çœ<81>, 570208, ä¸å›½" amenity university 0.400132318333933 ä¸å›½ FALSE
+hei cn Asia Eastern Asia FALSE 1 2021-02-03 258184662 relation "黑龙江çœ<81>, ä¸å›½" boundary administrative 0.646855260728525 ä¸å›½ FALSE
+high court cn Asia Eastern Asia FALSE 1 2021-02-03 113553479 way "高ç‰æ³•é™¢ The High Court, 金é<90>˜é<81>“ Queensway, ä¸å<8d>Šå±± Mid-Levels Central, 金é<90>˜ Admiralty, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity courthouse 0.557784396815435 ä¸å›½ FALSE
+hohai university cn Asia Eastern Asia FALSE 1 2021-02-03 127543175 way "河海大å¦, 汉å<8f>£è¥¿è·¯, 鼓楼区, å<8d>—京市, 210098, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+hong kong baptist university cn Asia Eastern Asia FALSE 1 2021-02-03 19213852 node "é¦™æ¸¯æµ¸æœƒå¤§å¸ Hong Kong Baptist University, 安明街 On Ming Street, 石門 Shek Mun, 牛皮沙æ<9d>‘ Ngau Pei Sha Village, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" railway subway_entrance 0.401 ä¸å›½ FALSE
+hong kong polytechnic university cn Asia Eastern Asia FALSE 1 2021-02-03 99717473 way "香港ç<90>†å·¥å¤§å¸ The Hong Kong Polytechnic University, 11, 育æ‰<8d>é<81>“ Yuk Choi Road, 紅磡ç<81>£ Hung Hom Bay, 尖沙咀 Tsim Sha Tsui, 油尖旺å<8d>€ Yau Tsim Mong District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" amenity university 0.890914282128039 ä¸å›½ FALSE
+hong kong university of science and technology cn Asia Eastern Asia FALSE 1 2021-02-03 51695244 node "é¦™æ¸¯ç§‘æŠ€å¤§å¸ Hong Kong University of Science and Technology, 大å¸é<81>“ University Road, 碧水新æ<9d>‘ Pik Shui San Tsuen, 大埔仔 Tai Po Tsai, 西貢å<8d>€ Sai Kung District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" highway bus_stop 0.701 ä¸å›½ FALSE
+huashan hospital cn Asia Eastern Asia FALSE 1 2021-02-03 258491124 relation "花山区 (Huashan), 马éž<8d>山市, 243000, ä¸å›½" boundary administrative 0.511447002935904 ä¸å›½ FALSE
+hunan normal university cn Asia Eastern Asia FALSE 1 2021-02-03 71437400 node "æ¹–å<8d>—师大, 木兰路, 长沙市, 岳麓区, 长沙市, æ¹–å<8d>—çœ<81>, 410006, ä¸å›½" railway station 0.001 ä¸å›½ FALSE
+hunan university cn Asia Eastern Asia FALSE 1 2021-02-03 70146415 node "æ¹–å<8d>—大å¦, æ•™å¦1å<8f>·, 长沙市, 岳麓区, 长沙市, æ¹–å<8d>—çœ<81>, 410082, ä¸å›½" railway station 0.20962395537125 ä¸å›½ FALSE
+hupo cn Asia Eastern Asia FALSE 1 2021-02-03 259081826 relation "ç<90>¥ç<8f>€é•‡, 麦积区, 天水市, 甘肃çœ<81>, ä¸å›½" boundary administrative 0.228876356713622 ä¸å›½ FALSE
+icc cn Asia Eastern Asia FALSE 1 2021-02-03 96538994 way "ç’°ç<90>ƒè²¿æ˜“å»£å ´ International Commerce Centre, 1, 柯士甸é<81>“西 Austin Road West, 西ä¹<9d>é¾<8d> West Kowloon, 油麻地 Yau Ma Tei, 油尖旺å<8d>€ Yau Tsim Mong District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" building tower 0.466329902238883 ä¸å›½ FALSE
+ihcc cn Asia Eastern Asia FALSE 1 2021-02-03 96538994 way "ç’°ç<90>ƒè²¿æ˜“å»£å ´ International Commerce Centre, 1, 柯士甸é<81>“西 Austin Road West, 西ä¹<9d>é¾<8d> West Kowloon, 油麻地 Yau Ma Tei, 油尖旺å<8d>€ Yau Tsim Mong District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" building tower 0.466329902238883 ä¸å›½ FALSE
+ihec cn Asia Eastern Asia FALSE 1 2021-02-03 150867020 way "宜春明月山机场, 锦绣大é<81>“, 湖田镇, è¢<81>州区, 宜春市, 江西çœ<81>, ä¸å›½" aeroway aerodrome 0.443317794581981 ä¸å›½ FALSE
+ihu cn Asia Eastern Asia FALSE 1 2021-02-03 258689452 relation "义乌市, 金å<8d>Žå¸‚, 浙江çœ<81>, ä¸å›½" boundary administrative 0.490850025928259 ä¸å›½ FALSE
+institute of atmospheric physics cn Asia Eastern Asia FALSE 1 2021-02-03 228833038 way "ä¸å›½ç§‘å¦é™¢å¤§æ°”物ç<90>†ç ”究所, æœ<9d>阳区, 北京市, ä¸å›½" landuse commercial 0.2 ä¸å›½ FALSE
+institute of biotechnology cn Asia Eastern Asia FALSE 1 2021-02-03 152857882 way "é¦™æ¸¯ç”Ÿç‰©ç§‘æŠ€ç ”ç©¶é™¢ Hong Kong Institute of Biotechnology, 生物科技路 Biotechnology Avenue, 馬料水 Ma Liu Shui, 馬éž<8d>å±± Ma On Shan, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, DD29 1007, ä¸å›½" building yes 0.301 ä¸å›½ FALSE
+institute of geographic sciences and natural resources research cn Asia Eastern Asia FALSE 1 2021-02-03 141475601 way "ä¸å›½ç§‘å¦é™¢åœ°ç<90>†ç§‘å¦ä¸Žèµ„æº<90>ç ”ç©¶æ‰€, 大屯路, 天创世缘, æœ<9d>阳区, 北京市, 100101, ä¸å›½" office research 0.001 ä¸å›½ FALSE
+institute of higher education cn Asia Eastern Asia FALSE 1 2021-02-03 134120775 way "浙江ç»<8f>è´¸è<81>Œä¸šæŠ€æœ¯å¦é™¢, å¦æž—è¡—, 白æ<9d>¨è¡—é<81>“, 钱塘新区, æ<9d>州市, 浙江çœ<81>, 310018, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+jianghan university cn Asia Eastern Asia FALSE 1 2021-02-03 78769329 node "江汉大å¦é™„属医院, 香港路, 西马街é<81>“, 江岸区, 湖北çœ<81>, 430021, ä¸å›½" amenity hospital 0.001 ä¸å›½ FALSE
+jiangxi cn Asia Eastern Asia FALSE 1 2021-02-03 258491397 relation "江西çœ<81>, ä¸å›½" boundary administrative 0.660896625230364 ä¸å›½ FALSE
+king's college cn Asia Eastern Asia FALSE 1 2021-02-03 134145090 way "英皇書院 King's College, 63A, 般咸é<81>“ Bonham Road, 西å<8d>Šå±± Mid-Levels West, 西營盤 Sai Ying Pun, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity school 0.668648909480289 ä¸å›½ FALSE
+kuomintang cn Asia Eastern Asia FALSE 1 2021-02-03 162507523 way "ä¸å›½å›½æ°‘党一大旧å<9d>€, 龙虎墙, 大塘街é<81>“, 越秀区, 广州市, 广东çœ<81>, 510375, ä¸å›½" tourism museum 0.254365194683011 ä¸å›½ FALSE
+lanzhou veterinary research institute cn Asia Eastern Asia FALSE 1 2021-02-03 185815023 way "ä¸å›½å†œä¸šç§‘å¦é™¢å…°å·žå…½åŒ»ç ”究所, 1, å¾<90>家å<9d>ª, ç›<90>场路街é<81>“, 兰州市, 城关区, 兰州市, 甘肃çœ<81>, 730046, ä¸å›½" office research 0.001 ä¸å›½ FALSE
+legislative council cn Asia Eastern Asia FALSE 1 2021-02-03 113505472 way "立法會綜å<90>ˆå¤§æ¨“ Legislative Council Complex, 添美é<81>“ Tim Mei Avenue, ä¸å<8d>Šå±± Mid-Levels Central, 金é<90>˜ Admiralty, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity townhall 0.715868379984702 ä¸å›½ FALSE
+liaocheng university cn Asia Eastern Asia FALSE 1 2021-02-03 169515004 way "è<81>ŠåŸŽå¤§å¦è¥¿æ ¡åŒº, 花å›å<8d>—路辅路, 东昌府区, è<81>ŠåŸŽå¸‚, 山东çœ<81>, 252000, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+nanjing university of science and technology cn Asia Eastern Asia FALSE 1 2021-02-03 258596617 relation "å<8d>—京ç<90>†å·¥å¤§å¦, å…‰å<8d>Žè·¯, 秦淮区, 玄æ¦åŒº, å<8d>—京市, 210012, ä¸å›½" amenity university 0.416302457462662 ä¸å›½ FALSE
+nantong university cn Asia Eastern Asia FALSE 1 2021-02-03 160989544 way "å<8d>—通大å¦, å°<8f>æµ·è¡—é<81>“, å´‡å·<9d>区, å<8d>—通市, 226000, ä¸å›½" leisure park 0.15 ä¸å›½ FALSE
+national astronomical observatories cn Asia Eastern Asia FALSE 1 2021-02-03 48659152 node "国家天文å<8f>°, 北辰西路, æœ<9d>阳区, 北京市, 100012, ä¸å›½" amenity research_institute 0.001 ä¸å›½ FALSE
+national autonomous university cn Asia Eastern Asia FALSE 1 2021-02-03 68277017 node "æ— äººå€¼å®ˆå›¾ä¹¦é¦†, 1088, å¦è‹‘大é<81>“, 深圳大å¦åŸŽ, 桃å›è¡—é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518000, ä¸å›½" amenity library 0.001 ä¸å›½ FALSE
+national institute of biological sciences cn Asia Eastern Asia FALSE 1 2021-02-03 21241550 node "National Institute of Biological Sciences (NIBS), 7, 科å¦å›è·¯, 西å<8d>Šå£<81>店æ<9d>‘, 昌平区, 北京市, 102206, ä¸å›½" building office 0.501 ä¸å›½ FALSE
+nei cn Asia Eastern Asia FALSE 1 2021-02-03 59452923 node "内æ<81>©, å<8d>—å®<81>市, 广西壮æ—<8f>自治区, ä¸å›½" place village 0.275 ä¸å›½ FALSE
+ocean university of china cn Asia Eastern Asia FALSE 1 2021-02-03 203984036 way "ä¸å›½æµ·æ´‹å¤§å¦, 5, 鱼山路, 市å<8d>—区, é<9d>’岛市, 山东çœ<81>, 266001, ä¸å›½" amenity university 0.403405604298285 ä¸å›½ FALSE
+open university of hong kong cn Asia Eastern Asia FALSE 1 2021-02-03 156773961 way "é¦™æ¸¯å…¬é–‹å¤§å¸ The Open University of Hong Kong, 81, å¿ å<9d>è¡— Chung Hau Street, 何文田山 Ho Man Tin Hill, 何文田 Ho Man Tin, ä¹<9d>é¾<8d>城å<8d>€ Kowloon City District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" building university 0.888105956498361 ä¸å›½ FALSE
+people's daily cn Asia Eastern Asia FALSE 1 2021-02-03 52429330 node "人民日报广东分社站②, 黄埔大é<81>“西, 天河å<8d>—è¡—é<81>“, 天河区, 广州市, 广东çœ<81>, 510620, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+political consultative conference cn Asia Eastern Asia FALSE 1 2021-02-03 183739682 way "胶澳总ç<9d>£åºœæ—§å<9d>€ï¼ˆçŽ°é<9d>’岛市人大ã€<81>政å<8d><8f>办公楼), 沂水路, 市å<8d>—区, é<9d>’岛市, 山东çœ<81>, 266001, ä¸å›½" office government 0.001 ä¸å›½ FALSE
+qub cn Asia Eastern Asia FALSE 1 2021-02-03 299390583 way "é°‚éšæ¶Œ Quarry Bay, 896, 英皇é<81>“ King's Road, 七姊妹 Tsat Tsz Mui, é°‚éšæ¶Œ Quarry Bay, æ<9d>±å<8d>€ Eastern District, 香港島 Hong Kong Island, 香港 Hong Kong, ä¸å›½" building train_station 0.398332012645065 ä¸å›½ FALSE
+rac cn Asia Eastern Asia FALSE 1 2021-02-03 21930851 node "é¦¬å ´ Racecourse, 大埔公路ï¼<8d>沙田段 Tai Po Road – Sha Tin, è<90>½è·¯ä¸‹ Lok Lo Ha, ä¹<9d>è‚š Kau To, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" railway station 0.471239527648604 ä¸å›½ FALSE
+renmin university cn Asia Eastern Asia FALSE 1 2021-02-03 4331354 node "人民大å¦, 北三环, 万柳地区, 海淀区, 北京市, 100872, ä¸å›½" railway stop 0.001 ä¸å›½ FALSE
+scarborough shoal cn Asia Eastern Asia FALSE 1 2021-02-03 302688259 way "黄岩岛(民主ç¤<81>) - Scarborough Shoal, 三沙市, æµ·å<8d>—çœ<81>, ä¸å›½" place island 0.633219531977835 ä¸å›½ FALSE
+school of microelectronics cn Asia Eastern Asia FALSE 1 2021-02-03 159138504 way "微电å<90>å¦é™¢, å<8d>—æ´‹å<8d>—è·¯, 紫竹科技å›åŒº, 闵行区, 200240, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+school of pharmacy cn Asia Eastern Asia FALSE 1 2021-02-03 204162763 way "School of Pharmacy, å<8d>—å¦é™¢è¡—, 江å<8d>—大å¦èµ¤é©¬å˜´é<81>—å<9d>€, 滨湖区, æ— é”¡å¸‚, 江è‹<8f>çœ<81>, 214000, ä¸å›½" building yes 0.301 ä¸å›½ FALSE
+second military medical university cn Asia Eastern Asia FALSE 1 2021-02-03 165511350 way "第二军医大å¦, 800, 翔殷路, 五角场街é<81>“, æ<9d>¨æµ¦åŒº, 200433, ä¸å›½" amenity university 0.403582454919981 ä¸å›½ FALSE
+shandong university cn Asia Eastern Asia FALSE 1 2021-02-03 61783127 node "山东大å¦, è“<9d>è°·è·¯, å<8d>³å¢¨åŒº, é<9d>’岛市, 山东çœ<81>, 266200, ä¸å›½" railway station 0.001 ä¸å›½ FALSE
+shenzhen university cn Asia Eastern Asia FALSE 1 2021-02-03 73604974 node "深大, 科技å<8d>—一路, 粤海街é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518000, ä¸å›½" railway station 0.001 ä¸å›½ FALSE
+siae cn Asia Eastern Asia FALSE 1 2021-02-03 119339783 way "机场, 西禹高速, 临潼区 (Chang'an), 西安市, 陕西çœ<81>, ä¸å›½" aeroway aerodrome 0.402243537687533 ä¸å›½ FALSE
+songshan national nature reserve cn Asia Eastern Asia FALSE 1 2021-02-03 226360739 way "北京æ<9d>¾å±±å›½å®¶çº§è‡ªç„¶ä¿<9d>护区, 延庆区, 北京市, ä¸å›½" boundary protected_area 0.298558873147647 ä¸å›½ FALSE
+southern china cn Asia Eastern Asia FALSE 1 2021-02-03 258717462 relation "å<8d>—å<8d>€ Southern District, 香港島 Hong Kong Island, 香港 Hong Kong, ä¸å›½" boundary administrative 0.57805930713623 ä¸å›½ FALSE
+southern medical university cn Asia Eastern Asia FALSE 1 2021-02-03 51886881 node "å<8d>—方医科大å¦ç«™, 沙太北路, 京溪街é<81>“, 白云区, 广州市, 广东çœ<81>, 510515, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+southern university of china cn Asia Eastern Asia FALSE 1 2021-02-03 193573154 way "å<8d>—方科技大å¦, 1088, å¦è‹‘大é<81>“, 深圳大å¦åŸŽ, 桃å›è¡—é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518055, ä¸å›½" amenity university 0.310439474412231 ä¸å›½ FALSE
+state academy of sciences cn Asia Eastern Asia FALSE 1 2021-02-03 52408051 node "科å¦é™¢ç«™, 天æº<90>è·¯, 龙洞街é<81>“, 天河区, 广州市, 广东çœ<81>, 510650, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+state administration of taxation cn Asia Eastern Asia FALSE 1 2021-02-03 181175059 way "State Administration of Taxation, G316, 通泰街é<81>“, 邵æ¦å¸‚, å<8d>—平市, ç¦<8f>建çœ<81>, ä¸å›½" office government 0.401 ä¸å›½ FALSE
+tiangong cn Asia Eastern Asia FALSE 1 2021-02-03 83432983 node "ç”°å…±, å<8d>—å®<81>市, 广西壮æ—<8f>自治区, ä¸å›½" place village 0.275 ä¸å›½ FALSE
+tianhe ii cn Asia Eastern Asia FALSE 1 2021-02-03 258569294 relation "天河区, 广州市, 广东çœ<81>, ä¸å›½" boundary administrative 0.472775653790836 ä¸å›½ FALSE
+tianjin university cn Asia Eastern Asia FALSE 1 2021-02-03 103498362 way "天津大å¦, 湖滨é<81>“, å<8d>—开区 (Nankai), 天津市, 300084, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+tianjin university in china cn Asia Eastern Asia FALSE 1 2021-02-03 144399984 way "ä¸å›½æ°‘航大å¦, 津北公路, 东丽区, 东丽区 (Dongli), 天津市, 300300, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+tibet autonomous region cn Asia Eastern Asia FALSE 1 2021-02-03 296714732 relation "西è—<8f>自治区, ä¸å›½" boundary administrative 0.627670964975274 ä¸å›½ FALSE
+tongji cn Asia Eastern Asia FALSE 1 2021-02-03 58307078 node "童集, å<90>ˆè‚¥å¸‚, ä¸å›½" place village 0.275 ä¸å›½ FALSE
+tongji medical college cn Asia Eastern Asia FALSE 1 2021-02-03 121878064 way "å<8d>Žä¸ç§‘技大å¦å<90>ŒæµŽåŒ»å¦é™¢, 航空路, å®<9d>丰街é<81>“, ç¡šå<8f>£åŒº, 江汉区, 湖北çœ<81>, 430030, ä¸å›½" amenity university 0.3004701084432 ä¸å›½ FALSE
+uiuc cn Asia Eastern Asia FALSE 1 2021-02-03 207804111 way "浙江大å¦ä¼Šåˆ©è¯ºä¼Šå¤§å¦åŽ„å·´çº³é¦™æ§Ÿæ ¡åŒºè<81>”å<90>ˆå¦é™¢, å<8d>—环路, 鹃湖科技城, æµ·å®<81>市, 嘉兴市, 浙江çœ<81>, 314400, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+university of hong kong in china cn Asia Eastern Asia FALSE 1 2021-02-03 258613825 relation "é¦™æ¸¯å¤§å¸ The University of Hong Kong, åˆ—å ¤é “é<81>“ Lyttelton Road, 西å<8d>Šå±± Mid-Levels West, 西營盤 Sai Ying Pun, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity university 1.02967834592939 ä¸å›½ FALSE
+university of macau cn Asia Eastern Asia FALSE 1 2021-02-03 259347553 relation "Universidade de Ciência e Tecnologia de Macau æ¾³é–€ç§‘æŠ€å¤§å¸ Macau University of Science and Technology, é›žé ¸é¦¬è·¯ Estrada da Ponta da Cabrita, 北安 Pac On, å˜‰æ¨¡å ‚å<8d>€ Nossa Senhora do Carmo, 氹仔 Taipa, 澳門 Macau, 999078, ä¸å›½" amenity university 0.666591667934692 ä¸å›½ FALSE
+university of nanjing cn Asia Eastern Asia FALSE 1 2021-02-03 110545344 way "å<8d>—京大å¦, å<8d>«å··, 鼓楼区, 玄æ¦åŒº, å<8d>—京市, 210093, ä¸å›½" amenity university 0.498289975489913 ä¸å›½ FALSE
+university of the chinese academy of sciences cn Asia Eastern Asia FALSE 1 2021-02-03 64279650 node "UCAS, 玉泉路, ç”°æ<9d>‘, 海淀区, 北京市, 100049, ä¸å›½" amenity university 0.385200970199076 ä¸å›½ FALSE
+usi cn Asia Eastern Asia FALSE 1 2021-02-03 258635882 relation "æ— é”¡å¸‚, 214000, ä¸å›½" boundary administrative 0.547775869917964 ä¸å›½ FALSE
+ustc cn Asia Eastern Asia FALSE 1 2021-02-03 156022554 way "ä¸å›½ç§‘å¦æŠ€æœ¯å¤§å¦ ä¸œæ ¡åŒº, 96, 金寨路, ä¸è¡Œå®¿èˆ<8d>, 稻香æ<9d>‘è¡—é<81>“, 蜀山区 (Shushan), å<90>ˆè‚¥å¸‚, 230026, ä¸å›½" amenity university 0.464121550533476 ä¸å›½ FALSE
+xi'an jiaotong-liverpool university cn Asia Eastern Asia FALSE 1 2021-02-03 200616846 way "西交利物浦大å¦, 文景路, 星慧社区, 月亮湾社工委, è‹<8f>州工业å›åŒºç›´å±žé•‡, è‹<8f>州工业å›åŒº, è‹<8f>州市, 215123, ä¸å›½" amenity university 0.397362929796699 ä¸å›½ FALSE
+xinhua news agency cn Asia Eastern Asia FALSE 1 2021-02-03 199853292 way "æ–°è<8f>¯é€šè¨Šç¤¾ Xinhua News Agency, 379-381, 皇å<90>Žå¤§é<81>“æ<9d>± Queen's Road East, 摩利臣山 Morrison Hill, ç<81>£ä»” Wan Chai, ç<81>£ä»”å<8d>€ Wan Chai District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" office newspaper 0.301 ä¸å›½ FALSE
+xinjiang uyghur autonomous region cn Asia Eastern Asia FALSE 1 2021-02-03 257472610 relation "新疆维å<90>¾å°”自治区, ä¸å›½" boundary administrative 0.674183703517689 ä¸å›½ FALSE
+yanbian university cn Asia Eastern Asia FALSE 1 2021-02-03 149934887 way "å»¶è¾¹å¤§å¦ ì—°ë³€ëŒ€í•™, å›å·<9d>è¡— ì›<90>천거리, 延å<90>‰å¸‚ 연길시, å…¬å›è¡—é<81>“, 延å<90>‰å¸‚, 延边æœ<9d>鲜æ—<8f>自治州, å<90>‰æž—çœ<81>, 133000, ä¸å›½" amenity university 0.400690081410952 ä¸å›½ FALSE
+zhejiang gongshang university cn Asia Eastern Asia FALSE 1 2021-02-03 173484760 way "浙江工商大å¦(æ•™å·¥è·¯æ ¡åŒº), 149å<8f>·, 教工路, 西湖区, æ<9d>州市, 浙江çœ<81>, 310012, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+zhejiang university school of medicine cn Asia Eastern Asia FALSE 1 2021-02-03 149415240 way "浙江大å¦åŒ»å¦é™¢, é<81>µä¹‰è·¯, 三墩镇, 西湖区, æ<9d>州市, 浙江çœ<81>, 310058, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+eta cm Africa Middle Africa FALSE 1 2021-02-03 24334914 node "Eta, Ngoyla, Haut-Nyong, Est, Cameroun" place village 0.375 Cameroun FALSE
+mpo cm Africa Middle Africa FALSE 1 2021-02-03 141599632 way "Mpo, Atok, Haut-Nyong, Est, Cameroun" waterway river 0.375 Cameroun FALSE
+ocean cm Africa Middle Africa FALSE 1 2021-02-03 258448571 relation "Océan, Sud, Cameroun" boundary administrative 0.379599826756761 Cameroun FALSE
+southwest cm Africa Middle Africa FALSE 1 2021-02-03 258706250 relation "Southwest, Cameroun" boundary administrative 0.575363976054984 Cameroun FALSE
+university of yaoundé cm Africa Middle Africa FALSE 1 2021-02-03 135385489 way "Université de Yaoundé I, Rue 3.729, Ngoa-Ékélé, Communauté urbaine de Yaoundé, Mfoundi, Centre, 860 YDÃ<8f>¿½, Cameroun" amenity university 0.383208261767925 Cameroun FALSE
+alma cl Americas South America FALSE 1 2021-02-03 36357918 node "Atacama Large Millimeter/submillimeter Array, San Pedro de Atacama, Provincia de El Loa, Región de Antofagasta, Chile" place hamlet 0.448129702072077 Chile FALSE
+atacama cosmology telescope cl Americas South America FALSE 1 2021-02-03 109534275 way "Atacama Cosmology Telescope (ACT), San Pedro de Atacama - Paso Jama, San Pedro de Atacama, Provincia de El Loa, Región de Antofagasta, Chile" man_made telescope 0.626239076957718 Chile FALSE
+cerro paranal cl Americas South America FALSE 1 2021-02-03 13674948 node "Cerro Paranal, Taltal, Provincia de Antofagasta, Región de Antofagasta, Chile" natural peak 0.557411994477751 Chile FALSE
+el sauce observatory cl Americas South America FALSE 1 2021-02-03 54499584 node "Observatorio El Sauce, RÃo Hurtado, Provincia de LimarÃ, Región de Coquimbo, Chile" place locality 0.325 Chile FALSE
+james ax observatory cl Americas South America FALSE 1 2021-02-03 185920082 way "Huan Tran Telescope (James Ax observatory), San Pedro de Atacama - Paso Jama, San Pedro de Atacama, Provincia de El Loa, Región de Antofagasta, Chile" man_made telescope 0.301 Chile FALSE
+juan de fuca cl Americas South America FALSE 1 2021-02-03 94632616 way "Juan de Fuca, Lo Prado, Provincia de Santiago, Región Metropolitana de Santiago, 8980000, Chile" highway living_street 0.4 Chile FALSE
+large synoptic survey telescope cl Americas South America FALSE 1 2021-02-03 171609756 way "Large Synoptic Survey Telescope, El Peñón Peak, Vicuña, Provincia de Elqui, Región de Coquimbo, Chile" landuse construction 0.786844598253808 Chile FALSE
+paranal observatory cl Americas South America FALSE 1 2021-02-03 97009449 way "Paranal Observatory, Acceso Observatorio Paranal, Antofagasta, Provincia de Antofagasta, Región de Antofagasta, Chile" tourism attraction 0.684915797907489 Chile FALSE
+pro-test italia cl Americas South America FALSE 1 2021-02-03 190529016 way "Renault Pro +, 1195, Avenida Irarrázaval, Barrio Italia, Ñuñoa, Provincia de Santiago, Región Metropolitana de Santiago, 7770417, Chile" shop car 0.201 Chile FALSE
+technological university of pereira cl Americas South America FALSE 1 2021-02-03 123708466 way "INACAP, 2519, Nelson Pereira, Rancagua, Provincia de Cachapoal, Región del Libertador General Bernardo O'Higgins, 2850546, Chile" amenity university 0.101 Chile FALSE
+university of la serena cl Americas South America FALSE 1 2021-02-03 109529973 way "Campus Enrique Molina Garmendia (ULS), Ruta 5 Norte, La Serena, Provincia de Elqui, Región de Coquimbo, 17000000, Chile" amenity university 0.201 Chile FALSE
+university of talca cl Americas South America FALSE 1 2021-02-03 113890190 way "Universidad de Talca, Avenida Lircay, Don Enrique, Lircay, Talca, Provincia de Talca, Región del Maule, 346000, Chile" amenity university 0.438041195081873 Chile FALSE
+cook islands ck Oceania Polynesia FALSE 1 2021-02-03 258611909 relation KÅ«ki 'Ä€irani boundary administrative 0.612597091402647 KÅ«ki 'Ä€irani FALSE
+toms ck Oceania Polynesia FALSE 1 2021-02-03 259209070 relation "Tom's, Palmerston, KÅ«ki 'Ä€irani" place islet 0.25 KÅ«ki 'Ä€irani FALSE
+amon ci Africa Western Africa FALSE 1 2021-02-03 38034163 node "Amon, Mé, Lagunes, Côte d’Ivoire" place village 0.375 Côte d’Ivoire FALSE
+cote d'ivoire ci Africa Western Africa FALSE 1 2021-02-03 257869389 relation Côte d’Ivoire boundary administrative 0.903852049188393 Côte d’Ivoire FALSE
+arcadia fund ch Europe Western Europe FALSE 1 2021-02-03 112622320 way "Fund, Canavee, Miglieglia, Circolo di Breno, Distretto di Lugano, Ticino, 6986, Schweiz/Suisse/Svizzera/Svizra" highway footway 0.175 Schweiz/Suisse/Svizzera/Svizra FALSE
+astra ch Europe Western Europe FALSE 1 2021-02-03 44480865 node "ASTRA, 2, Mühlestrasse, Im Park, Worblaufen, Ittigen, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3063, Schweiz/Suisse/Svizzera/Svizra" office government 0.413179143195807 Schweiz/Suisse/Svizzera/Svizra FALSE
+blue brain project ch Europe Western Europe FALSE 1 2021-02-03 37531863 node "Blue Brain Project, Route Cantonale, Ecublens, District de l'Ouest lausannois, Vaud, 1025, Schweiz/Suisse/Svizzera/Svizra" office research 0.702603435932822 Schweiz/Suisse/Svizzera/Svizra FALSE
+caffe ch Europe Western Europe FALSE 1 2021-02-03 6217481 node "La Caffe, Le Fays, Martigny-Combe, Martigny, Valais/Wallis, 1929, Schweiz/Suisse/Svizzera/Svizra" place hamlet 0.35 Schweiz/Suisse/Svizzera/Svizra FALSE
+ch ch Europe Western Europe FALSE 1 2021-02-03 257695656 relation Schweiz/Suisse/Svizzera/Svizra boundary administrative 0.926485171575252 Schweiz/Suisse/Svizzera/Svizra FALSE
+comac ch Europe Western Europe FALSE 1 2021-02-03 10475233 node "Comac, Rue des Terreaux, Neuchâtel, 2001, Schweiz/Suisse/Svizzera/Svizra" shop computer 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+del genio ch Europe Western Europe FALSE 1 2021-02-03 52436434 node "Del Genio, 44, Route de Vissigen, Sion, Valais/Wallis, 1950, Schweiz/Suisse/Svizzera/Svizra" shop butcher 0.201 Schweiz/Suisse/Svizzera/Svizra FALSE
+ecole polytechnique fédérale de lausanne ch Europe Western Europe FALSE 1 2021-02-03 95072766 way "École Polytechnique Fédérale de Lausanne, Route de la Sorge, Quartier Sorge, Ecublens, District de l'Ouest lausannois, Vaud, 1015, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.883095905643059 Schweiz/Suisse/Svizzera/Svizra FALSE
+etzel ch Europe Western Europe FALSE 1 2021-02-03 4383703 node "Etzel, Etzelweg, Einsiedeln, Schwyz, 8840, Schweiz/Suisse/Svizzera/Svizra" tourism viewpoint 0.528982931011336 Schweiz/Suisse/Svizzera/Svizra FALSE
+federal commission of electricity ch Europe Western Europe FALSE 1 2021-02-03 67545483 node "Schweizerische Elektrizitätskommission, Christoffelgasse, Rotes Quartier, Stadtteil I, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3011, Schweiz/Suisse/Svizzera/Svizra" office government 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+ibm zurich ch Europe Western Europe FALSE 1 2021-02-03 61527465 node "IBM, 106, Vulkanstrasse, Werdwies, Altstetten, Kreis 9, Zürich, Bezirk Zürich, Zürich, 8048, Schweiz/Suisse/Svizzera/Svizra" office company 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+institute of evolutionary biology ch Europe Western Europe FALSE 1 2021-02-03 45075228 node "Zoological Institute, Evolutionary Biology, 1, Vesalgasse, Vorstädte, Grossbasel, Basel, Basel-Stadt, 4051, Schweiz/Suisse/Svizzera/Svizra" building university 0.301 Schweiz/Suisse/Svizzera/Svizra FALSE
+international committee ch Europe Western Europe FALSE 1 2021-02-03 96347471 way "Comité International de la Croix-Rouge, 19, Avenue de la Paix, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building yes 0.569349108620761 Schweiz/Suisse/Svizzera/Svizra FALSE
+international telecommunications union ch Europe Western Europe FALSE 1 2021-02-03 109351662 way "Union Internationale des Télécommunications (UIT), Place des Nations, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building yes 0.433228686818865 Schweiz/Suisse/Svizzera/Svizra FALSE
+lausanne university hospital ch Europe Western Europe FALSE 1 2021-02-03 95776304 way "Université de Lausanne, A1a, Quartier Chamberonne, Chavannes-près-Renens, District de l'Ouest lausannois, Vaud, 1022, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.616266928066907 Schweiz/Suisse/Svizzera/Svizra FALSE
+lonza ch Europe Western Europe FALSE 1 2021-02-03 197344166 way "Lonza, Goppenstein, Ferden, Westlich Raron, Valais/Wallis, 3916, Schweiz/Suisse/Svizzera/Svizra" waterway river 0.375 Schweiz/Suisse/Svizzera/Svizra FALSE
+médecins sans frontières ch Europe Western Europe FALSE 1 2021-02-03 145205796 way "Médecins Sans Frontières, 78, Rue de Lausanne, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" office ngo 0.849022542887286 Schweiz/Suisse/Svizzera/Svizra FALSE
+swiss federal institute ch Europe Western Europe FALSE 1 2021-02-03 120741454 way "Eawag: Das Wasserforschungs-Institut des ETH-Bereichs, Seestrasse, Winkel, Kastanienbaum, Horw, Luzern, 6047, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.001 Schweiz/Suisse/Svizzera/Svizra FALSE
+swiss tropical and public health institute ch Europe Western Europe FALSE 1 2021-02-03 225947974 way "Schweizerisches Tropen- und Public Health-Institut, 57, Socinstrasse, Am Ring, Grossbasel, Basel, Basel-Stadt, 4051, Schweiz/Suisse/Svizzera/Svizra" amenity hospital 0.201 Schweiz/Suisse/Svizzera/Svizra FALSE
+the world health organization ch Europe Western Europe FALSE 1 2021-02-03 91298032 way "Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra FALSE
+unhcr ch Europe Western Europe FALSE 1 2021-02-03 95164232 way "Haut Commissariat des Nations Unies pour les Réfugiés, 94, Rue de Montbrillant, Le Petit-Saconnex, Petit-Saconnex et Servette, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" office government 0.415725100553218 Schweiz/Suisse/Svizzera/Svizra FALSE
+university hospital of zurich ch Europe Western Europe FALSE 1 2021-02-03 114961958 way "Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.354152289914814 Schweiz/Suisse/Svizzera/Svizra FALSE
+university hospital zurich ch Europe Western Europe FALSE 1 2021-02-03 114961958 way "Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.354152289914814 Schweiz/Suisse/Svizzera/Svizra FALSE
+university hospital zürich ch Europe Western Europe FALSE 1 2021-02-03 114961958 way "Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.454152289914814 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of freiberg ch Europe Western Europe FALSE 1 2021-02-03 863524 node "Université de Fribourg Pérolles, Chemin du Musée, Pérolles, Fribourg - Freiburg, District de la Sarine, Fribourg/Freiburg, 1705, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.001 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of lugano ch Europe Western Europe FALSE 1 2021-02-03 165141553 way "Franklin University Switzerland, 29, Via Ponte Tresa, Sorengo, Circolo di Vezia, Distretto di Lugano, Ticino, 6924, Schweiz/Suisse/Svizzera/Svizra" building school 0.201 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of neuchâtel ch Europe Western Europe FALSE 1 2021-02-03 239101899 way "HEP-BEJUNE, Rue du 1er-Août, La Chaux-de-Fonds, Neuchâtel, 2300, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+who regional office ch Europe Western Europe FALSE 1 2021-02-03 91298032 way "Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra FALSE
+wyss center ch Europe Western Europe FALSE 1 2021-02-03 115936808 way "Wyss, Bürglen (UR), Uri, 6463, Schweiz/Suisse/Svizzera/Svizra" highway unclassified 0.2 Schweiz/Suisse/Svizzera/Svizra FALSE
+institut pasteur cf Africa Middle Africa FALSE 1 2021-02-03 243797129 way "Institut Pasteur, Avenue de l'Indépendance, Bangî - Bangui, Ködörösêse tî Bêafrîka - République Centrafricaine" amenity hospital 0.201 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+alima cd Africa Middle Africa FALSE 1 2021-02-03 11732216 node "Alima, Mambasa, Ituri, République démocratique du Congo" place village 0.375 République démocratique du Congo FALSE
+defense forces cd Africa Middle Africa FALSE 1 2021-02-03 62153208 node "Collège de Hautes Etudes de Stratégies de Défense Militaire, Avenue des Forces Armées, Haut Commandement, Gombe, Kinshasa, B.P 7955, République démocratique du Congo" amenity college 0.101 République démocratique du Congo FALSE
+gaw cd Africa Middle Africa FALSE 1 2021-02-03 53362850 node "Gaw, Bosobolo, Nord-Ubangi, République démocratique du Congo" place village 0.375 République démocratique du Congo FALSE
+itpr cd Africa Middle Africa FALSE 1 2021-02-03 76683548 node "Ministère des ITPR, Route T.P., Maniema, Tshopo, République démocratique du Congo" office administrative 0.101 République démocratique du Congo FALSE
+ab ca Americas Northern America FALSE 1 2021-02-03 257625587 relation "Alberta, Canada" boundary administrative 0.672431047420852 Canada FALSE
+acadia ca Americas Northern America FALSE 1 2021-02-03 505694 node "Acadia, Calgary, Alberta, T2J 1K6, Canada" place suburb 0.375 Canada FALSE
+acdc ca Americas Northern America FALSE 1 2021-02-03 119675282 way "ACDC, Area A (Egmont/Pender Harbour), Sunshine Coast Regional District, British Columbia, V0N 2H0, Canada" highway track 0.2 Canada FALSE
+ajax ca Americas Northern America FALSE 1 2021-02-03 258370273 relation "Ajax, Durham Region, Golden Horseshoe, Ontario, Canada" boundary administrative 0.542805933283467 Canada FALSE
+alberta energy ca Americas Northern America FALSE 1 2021-02-03 51904882 node "Alberta Energy, Bow River Pathway (South), Sunalta, Scarboro/Sunalta West, Calgary, Alberta, T3C 3N4, Canada" tourism artwork 0.201 Canada FALSE
+amos ca Americas Northern America FALSE 1 2021-02-03 259153297 relation "Amos, Abitibi, Abitibi-Témiscamingue, Québec, Canada" boundary administrative 0.541816779161739 Canada FALSE
+bay area rapid transit ca Americas Northern America FALSE 1 2021-02-03 259098950 relation "Deep Cove, District of North Vancouver, Metro Vancouver Regional District, British Columbia, Canada" natural bay 0.224193162948078 Canada FALSE
+bhp billiton ca Americas Northern America FALSE 1 2021-02-03 187584260 way "BHP Billiton, 130, 3rd Avenue South, Saskatoon, Saskatoon (city), Saskatchewan, S7K 1L3, Canada" office company 0.201 Canada FALSE
+biological sciences research council ca Americas Northern America FALSE 1 2021-02-03 61272197 node "NRC Institute for Biological Sciences, Lathe Drive, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1J 8B5, Canada" office government 0.401 Canada FALSE
+blandford ca Americas Northern America FALSE 1 2021-02-03 259301487 relation "Saint-Louis-de-Blandford, Arthabaska, Centre-du-Québec, Québec, G0Z 1B0, Canada" boundary administrative 0.511911570959931 Canada FALSE
+bmo financial group ca Americas Northern America FALSE 1 2021-02-03 132092034 way "BMO Financial Group, 2194, Lake Shore Boulevard West, Etobicoke—Lakeshore, Etobicoke, Toronto, Golden Horseshoe, Ontario, M8V 4C5, Canada" amenity bank 0.301 Canada FALSE
+bown ca Americas Northern America FALSE 1 2021-02-03 10036098 node "Bown, Bury, Le Haut-Saint-François, Estrie, Québec, Canada" place locality 0.225 Canada FALSE
+brigham ca Americas Northern America FALSE 1 2021-02-03 259057118 relation "Brigham, Brome-Missisquoi, Montérégie, Québec, J2K 4V6, Canada" boundary administrative 0.525122105808463 Canada FALSE
+brock university in st catharines ca Americas Northern America FALSE 1 2021-02-03 242595633 way "Brock University, John Macdonell Street, St. Catharines, Niagara Region, Golden Horseshoe, Ontario, L2V 4T7, Canada" amenity university 0.921862401245526 Canada FALSE
+cae ca Americas Northern America FALSE 1 2021-02-03 258158704 relation Canada boundary administrative 0.866125910965408 Canada FALSE
+calgary university in canada ca Americas Northern America FALSE 1 2021-02-03 15692968 node "University of Calgary Downtown Campus, 906, 8 Avenue SW, Connaught, Downtown West End, Calgary, Alberta, T2P 0P7, Canada" amenity university 0.301 Canada FALSE
+canadian association of university teachers in ottawa ca Americas Northern America FALSE 1 2021-02-03 64284898 node "Canadian Association of University Teachers, 2705, Queensview Drive, Britannia Heights, Bay, Ottawa, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K2B 6B7, Canada" office association 0.601 Canada FALSE
+canadian broadcasting corporation ca Americas Northern America FALSE 1 2021-02-03 129832260 way "Canadian Broadcasting Corporation, 181, Queen Street, Centretown, Somerset, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1P 1K9, Canada" building commercial 0.85799321708887 Canada FALSE
+canadian hydrogen intensity mapping experiment ca Americas Northern America FALSE 1 2021-02-03 210495198 way "Canadian Hydrogen Intensity Mapping Experiment, White Lake Trail - East, Area I (Skaha West/Kaleden/Apex), Regional District of Okanagan-Similkameen, British Columbia, V0H 1R4, Canada" man_made telescope 0.820054390558144 Canada FALSE
+canadian institute of health ca Americas Northern America FALSE 1 2021-02-03 75247073 node "Canadian National Institute of Health, 303, Dalhousie Street, Byward Market, Lowertown, Rideau-Vanier, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1N 7E5, Canada" office educational_institution 0.401 Canada FALSE
+canadian museum of history ca Americas Northern America FALSE 1 2021-02-03 119665756 way "Canadian Museum of History, 100, Rue Laurier, Hull, Gatineau, Gatineau (ville), Outaouais, Québec, K1A 0M8, Canada" tourism museum 0.781650158010506 Canada FALSE
+cancer research institute ca Americas Northern America FALSE 1 2021-02-03 84088132 way "Cancer Research Institute, O'Kill Street, Sydenham, Kingston, Eastern Ontario, Ontario, K7L 2V3, Canada" building university 0.301 Canada FALSE
+cargill ca Americas Northern America FALSE 1 2021-02-03 22319429 node "Cargill, Brockton, Bruce County, Southwestern Ontario, Ontario, Canada" place village 0.375 Canada FALSE
+center for medicine ca Americas Northern America FALSE 1 2021-02-03 191344626 way "Elmwood Court (Silvera for Seniors), 63 Street NW, Bowness, Calgary, Alberta, T3B 1S4, Canada" building yes 0.101 Canada FALSE
+centre for disease control ca Americas Northern America FALSE 1 2021-02-03 110832318 way "Center for Disease Control, 655, West 12th Avenue, Fairview, Vancouver, District of North Vancouver, Metro Vancouver Regional District, British Columbia, V5Z 4B4, Canada" building yes 0.301 Canada FALSE
+cftr ca Americas Northern America FALSE 1 2021-02-03 190485478 way "Centre de formation du transport routier (CFTR), Rue Maple Dale, East-Farnham, Brome-Missisquoi, Montérégie, Québec, J2K 3H8, Canada" amenity college 0.101 Canada FALSE
+cic ca Americas Northern America FALSE 1 2021-02-03 297969507 node "Isachsen Airport (abandoned), á•¿á‘á–…á‘–á“—á’ƒ Qikiqtaaluk Region, ᓄᓇᕗᑦ Nunavut, Canada" aeroway aerodrome 0.294548847777872 Canada FALSE
+cne ca Americas Northern America FALSE 1 2021-02-03 84394987 way "Exhibition Place, Old Toronto, Toronto, Golden Horseshoe, Ontario, M6K 3C3, Canada" place neighbourhood 0.415434381149213 Canada FALSE
+cochrane ca Americas Northern America FALSE 1 2021-02-03 149515 node "Cochrane, Town of Cochrane, Alberta, T4V 2A7, Canada" place town 0.494667642378454 Canada FALSE
+development research center ca Americas Northern America FALSE 1 2021-02-03 129466071 way "Defence Research and Development, 9, Defence Research and Development, Tufts Cove, Dartmouth, Halifax Regional Municipality, Halifax County, Nova Scotia, B3A 3C5, Canada" landuse military 0.4 Canada FALSE
+eastman ca Americas Northern America FALSE 1 2021-02-03 259058432 relation "Eastman, Memphrémagog, Estrie, Québec, Canada" boundary administrative 0.525926152527381 Canada FALSE
+eldonia ca Americas Northern America FALSE 1 2021-02-03 97793667 way "Eldonia Road, Kawartha Lakes, Central Ontario, Ontario, K0M 1B0, Canada" highway residential 0.2 Canada FALSE
+environment canada ca Americas Northern America FALSE 1 2021-02-03 154537614 way "355, Environment Canada, Gloucester, Ottawa, Eastern Ontario, Ontario, Canada" landuse commercial 0.662784569703518 Canada FALSE
+fisheries and oceans canada ca Americas Northern America FALSE 1 2021-02-03 75914304 node "Fisheries and Oceans Canada, John Yeo Drive, City of Charlottetown, Queens County, Prince Edward Island, C1E 3H6, Canada" office government 0.401 Canada FALSE
+free university ca Americas Northern America FALSE 1 2021-02-03 308046 node "Free Times Cafe, 320, College Street, Kensington Market, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5T 1S3, Canada" amenity pub 0.341913844040538 Canada FALSE
+free university of ca Americas Northern America FALSE 1 2021-02-03 308046 node "Free Times Cafe, 320, College Street, Kensington Market, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5T 1S3, Canada" amenity pub 0.341913844040538 Canada FALSE
+fripon ca Americas Northern America FALSE 1 2021-02-03 111997105 way "Lac Fripon, Lac-Saint-Charles, La Haute-Saint-Charles, Québec, Québec (Agglomération), Capitale-Nationale, Québec, Canada" natural water 0.3 Canada FALSE
+general administration of press ca Americas Northern America FALSE 1 2021-02-03 12545243 node "Press, Senneterre (ville), La Vallée-de-l'Or, Abitibi-Témiscamingue, Québec, Canada" place locality 0.225 Canada FALSE
+genome canada ca Americas Northern America FALSE 1 2021-02-03 48279568 node "Genome Dx, 1038, Homer Street, Yaletown, Downtown, Vancouver, District of North Vancouver, Metro Vancouver Regional District, British Columbia, V6B 2W9, Canada" place house 0.201 Canada FALSE
+geological survey of canada ca Americas Northern America FALSE 1 2021-02-03 94424539 way "Geological Survey of Canada, 32 Avenue NW, University Heights, Calgary, Alberta, T2L 2A6, Canada" building yes 0.401 Canada FALSE
+george brown college ca Americas Northern America FALSE 1 2021-02-03 138263548 way "George Brown College, Richmond Street East, Moss Park, Toronto Centre, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5A 4T7, Canada" building yes 0.301 Canada FALSE
+george institute ca Americas Northern America FALSE 1 2021-02-03 100163330 way "George Harvey Collegiate Institute, 1700, Keele Street, Keelesdale, York South—Weston, York, Toronto, Golden Horseshoe, Ontario, M6M 3W5, Canada" amenity school 0.528965278593994 Canada FALSE
+global ca Americas Northern America FALSE 1 2021-02-03 99949181 way "Global, 81, Barber Greene Road, Don Mills, Don Valley East, North York, Toronto, Golden Horseshoe, Ontario, M3C 2C3, Canada" building office 0.586522779384239 Canada FALSE
+group of seven and group ca Americas Northern America FALSE 1 2021-02-03 175104701 way "Group of Seven burial site, Kleinburg, Vaughan, York Region, Golden Horseshoe, Ontario, Canada" landuse cemetery 0.6 Canada FALSE
+iogen ca Americas Northern America FALSE 1 2021-02-03 191517666 way "Iogen, 300, Lindbergh Private, River, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1V 1H7, Canada" building yes 0.101 Canada FALSE
+iris ca Americas Northern America FALSE 1 2021-02-03 296781846 relation "Iris, Kings County, Prince Edward Island, Canada" boundary administrative 0.45 Canada FALSE
+jubilee south ca Americas Northern America FALSE 1 2021-02-03 259354642 relation "Jubilee, Municipality of Victoria County, Victoria County, Nova Scotia, Canada" boundary administrative 0.45 Canada FALSE
+kenn borek air ca Americas Northern America FALSE 1 2021-02-03 113538653 way "Kenn Borek Air Ltd, George Craig Boulevard NE, Pegasus, Calgary, Alberta, T2E 8A5, Canada" building hangar 0.301 Canada FALSE
+knox college ca Americas Northern America FALSE 1 2021-02-03 257189631 relation "Knox College, 59, St George Street, Discovery District, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5T 2Z9, Canada" building university 0.526239076957718 Canada FALSE
+laurentian university ca Americas Northern America FALSE 1 2021-02-03 1347802 node "Laurentian University, University Road, Greater Sudbury, Sudbury District, Northeastern Ontario, Ontario, P3E 2C6, Canada" amenity university 0.636203186595559 Canada FALSE
+ligado networks ca Americas Northern America FALSE 1 2021-02-03 67108376 node "Ligado Networks, 1601, Telesat Court, Beacon Hill-Cyrville, Gloucester, Ottawa, Eastern Ontario, Ontario, K1B 1B1, Canada" office telecommunication 0.201 Canada FALSE
+mcgill university health centre ca Americas Northern America FALSE 1 2021-02-03 113003796 way "MUHC - McGill University Health Centre, Rue Saint-Jacques, Upper Lachine, Côte-des-Neiges–Notre-Dame-de-Grâce, Montréal, Agglomération de Montréal, Montréal (06), Québec, H4C 3C8, Canada" amenity hospital 0.401 Canada FALSE
+mclaren ca Americas Northern America FALSE 1 2021-02-03 22469926 node "McLaren, Eldon No. 471, Saskatchewan, Canada" place locality 0.225 Canada FALSE
+mcmurdo ca Americas Northern America FALSE 1 2021-02-03 222662 node "McMurdo, Area A (Kicking Horse/Kinbasket Lake), Columbia-Shuswap Regional District, British Columbia, V0A 1H7, Canada" place locality 0.225 Canada FALSE
+memorial university ca Americas Northern America FALSE 1 2021-02-03 47197396 node "Queen's College Sign, Long Pond Trail, Memorial University of Newfoundland main campus, St. John's, Newfoundland, Newfoundland and Labrador, A1B 3P7, Canada" tourism information 0.201 Canada FALSE
+mount allison university ca Americas Northern America FALSE 1 2021-02-03 94182360 way "Mount Allison University, Main Street, Sackville, Sackville Parish, Westmorland County, New Brunswick / Nouveau-Brunswick, E4L 4B5, Canada" amenity university 0.301 Canada FALSE
+mount royal university ca Americas Northern America FALSE 1 2021-02-03 87665637 way "Mount Royal University, Richard Road SW, Lincoln Park, Calgary, Alberta, T3E 6L1, Canada" amenity university 0.683999520860011 Canada FALSE
+national research council canada ca Americas Northern America FALSE 1 2021-02-03 259257626 relation "1191, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, Canada" landuse commercial 0.81890455386909 Canada FALSE
+national research nuclear university ca Americas Northern America FALSE 1 2021-02-03 104901648 way "National High Field Nuclear Magnetic Resonance Centre (NANUC), 87 Avenue NW, University of Alberta Neighbourhood, Greater Strathcona, Edmonton, Edmonton (city), Alberta, T6G, Canada" building university 0.301 Canada FALSE
+natural science ca Americas Northern America FALSE 1 2021-02-03 208925680 way "Natural Science, London, Southwestern Ontario, Ontario, N6G 2V4, Canada" highway platform 0.3 Canada FALSE
+nova university ca Americas Northern America FALSE 1 2021-02-03 174886043 way "Public Archives of Nova Scotia, 6016, University Avenue, Marlborough Woods, Halifax, Halifax Regional Municipality, Halifax County, Nova Scotia, B3H 4R2, Canada" tourism museum 0.498071657967153 Canada FALSE
+nrc herzberg ca Americas Northern America FALSE 1 2021-02-03 258668279 relation "NRC Herzberg Institute of Astrophysics, Observatory Road, Saanich, Capital Regional District, British Columbia, V9E 2E7, Canada" building yes 0.201 Canada FALSE
+nrc herzberg institute of astrophysics ca Americas Northern America FALSE 1 2021-02-03 258668279 relation "NRC Herzberg Institute of Astrophysics, Observatory Road, Saanich, Capital Regional District, British Columbia, V9E 2E7, Canada" building yes 0.501 Canada FALSE
+nsf international ca Americas Northern America FALSE 1 2021-02-03 209845746 way "NSF International, 125, Chancellors Way, Edinburgh Village, Guelph, Southwestern Ontario, Ontario, N1G 5K1, Canada" building commercial 0.201 Canada FALSE
+nunavut court of justice ca Americas Northern America FALSE 1 2021-02-03 161170401 way "Nunavut Court of Justice, 510, ᑲá–<8f>á–…, á<90>ƒá–ƒá“—á<90>ƒá‘¦, ᓄᓇᕗᑦ Nunavut, X0A 0H0, Canada" building Office_Building 0.401 Canada FALSE
+ontario ministry of agriculture ca Americas Northern America FALSE 1 2021-02-03 106392829 way "Ontario Ministry of Agriculture, 59, Ministry Drive, Former Kemptville College, Kemptville, North Grenville, Leeds and Grenville Counties, Eastern Ontario, Ontario, K0G 1J0, Canada" office government 0.401 Canada FALSE
+ontario ministry of natural resources ca Americas Northern America FALSE 1 2021-02-03 244730689 way "Ontario Ministry of Natural Resources, Water Street, Downtown Peterborough, Peterborough, Central Ontario, Ontario, K9J 2T6, Canada" office government 0.501 Canada FALSE
+pineapple express ca Americas Northern America FALSE 1 2021-02-03 176947657 way "Pineapple Express, Area F (West Howe Sound), Sunshine Coast Regional District, British Columbia, V0N 1V7, Canada" highway path 0.275 Canada FALSE
+polar environment atmospheric research laboratory ca Americas Northern America FALSE 1 2021-02-03 226391941 way "Polar Environment Atmospheric Research Laboratory, Eureka, á•¿á‘á–…á‘–á“—á’ƒ Qikiqtaaluk Region, ᓄᓇᕗᑦ Nunavut, Canada" office research 0.501 Canada FALSE
+polytechnique montreal ca Americas Northern America FALSE 1 2021-02-03 76938927 node "Polytechnique Montréal, 2500, Chemin de Polytechnique, Édouard-Montpetit, Côte-des-Neiges–Notre-Dame-de-Grâce, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3T 1J4, Canada" amenity university 0.101 Canada FALSE
+population health research institute ca Americas Northern America FALSE 1 2021-02-03 132818887 way "Population Health Research Institute, 237, Copeland Avenue, Beasley, Hamilton, Golden Horseshoe, Ontario, L8L 2X2, Canada" building yes 0.401 Canada FALSE
+prince edward island ca Americas Northern America FALSE 1 2021-02-03 258567254 relation "Prince Edward Island, Canada" place island 0.893570880226373 Canada FALSE
+public health canada ca Americas Northern America FALSE 1 2021-02-03 76182419 node "Public Health, Mivvik Avenue, ᑲá–<8f>á•¿á“‚á–… Rankin inlet / Kangiqtiniq, ᑲá–<8f>á•¿á“‚á–… Rankin Inlet, á‘ᕙᓪᓕᖅ Kivalliq Region, ᓄᓇᕗᑦ Nunavut, Canada" amenity clinic 0.301 Canada FALSE
+research and innovation ca Americas Northern America FALSE 1 2021-02-03 232469918 way "Research Innovation, Christie Lane, Guelph, Southwestern Ontario, Ontario, N1G 0A9, Canada" building university 0.201 Canada FALSE
+research in motion ca Americas Northern America FALSE 1 2021-02-03 99144888 way "Scotiabank, Mississauga, Peel Region, Golden Horseshoe, Ontario, Canada" landuse commercial 0.2 Canada FALSE
+royal navy ca Americas Northern America FALSE 1 2021-02-03 89924668 way "Royal Military College, Navy Way, Kingston, Eastern Ontario, Ontario, K7K 7B4, Canada" amenity university 0.651709632190723 Canada FALSE
+royal roads university ca Americas Northern America FALSE 1 2021-02-03 258736258 relation "Royal Roads University, 2005, Sooke Road, Colwood, Capital Regional District, British Columbia, V9B 5Y2, Canada" amenity university 0.681016725925367 Canada FALSE
+saint mary's university ca Americas Northern America FALSE 1 2021-02-03 84577948 way "St Mary's University, Robie Street, Marlborough Woods, Halifax, Halifax Regional Municipality, Halifax County, Nova Scotia, B3H 3B4, Canada" amenity university 0.713959851504786 Canada FALSE
+saskatchewan university ca Americas Northern America FALSE 1 2021-02-03 171622787 way "Saskatchewan Drive NW, River Valley Walterdale, Greater Strathcona, Edmonton, Edmonton (city), Alberta, T6G 2G9, Canada" highway tertiary 0.2 Canada FALSE
+scarbo ca Americas Northern America FALSE 1 2021-02-03 258831502 relation "Scarbo Lake, Unorganized North Algoma, Algoma District, Northeastern Ontario, Ontario, Canada" natural water 0.3 Canada FALSE
+shellard ca Americas Northern America FALSE 1 2021-02-03 133044417 way "Shellard Forest, Brantford, Southwestern Ontario, Ontario, Canada" landuse forest 0.3 Canada FALSE
+south florida shark club ca Americas Northern America FALSE 1 2021-02-03 198593200 way "Shark Club, West Hunt Club Road, Knoxdale-Merivale, Nepean, Ottawa, Eastern Ontario, Ontario, K2E 0B7, Canada" amenity restaurant 0.201 Canada FALSE
+southern hemisphere ca Americas Northern America FALSE 1 2021-02-03 77358035 node "Southern Hemisphere, 5251, Oak Street, South Cambie, Vancouver, District of North Vancouver, Metro Vancouver Regional District, British Columbia, V6M, Canada" leisure garden 0.201 Canada FALSE
+st. francis xavier university in antigonish ca Americas Northern America FALSE 1 2021-02-03 120193265 way "St. Francis Xavier University, 5005, Chapel Square, Antigonish, Town of Antigonish, Municipality of the County of Antigonish, Nova Scotia, B2G 2W5, Canada" amenity university 0.918973378442822 Canada FALSE
+sustainable forestry initiative ca Americas Northern America FALSE 1 2021-02-03 65825393 node "Sustainable Forestry Initiative, 1306, Wellington Street West, Wellington Village Shopping Area, Hintonburg, Kitchissippi, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1Y 3A8, Canada" office association 0.301 Canada FALSE
+tb drug development ca Americas Northern America FALSE 1 2021-02-03 6242511 node "Shoppers Drug Mart, 8th Street East, Grosvenor Park, Nutana Suburban Development Area, Saskatoon, Saskatoon (city), Saskatchewan, S7H 5J6, Canada" amenity pharmacy 0.201 Canada FALSE
+universities canada ca Americas Northern America FALSE 1 2021-02-03 123425762 way "Ontario Universities' Application Centre, Research Lane, Research Park, Guelph, Southwestern Ontario, Ontario, N1H 8J7, Canada" building office 0.201 Canada FALSE
+university health network ca Americas Northern America FALSE 1 2021-02-03 117777424 way "London Hall, Western Road, London, Southwestern Ontario, Ontario, N6G 5K8, Canada" amenity university 0.001 Canada FALSE
+university of northern british columbia ca Americas Northern America FALSE 1 2021-02-03 189703056 way "University of Northern British Columbia, Residence Court, Prince George, Regional District of Fraser-Fort George, British Columbia, V2N 4Z9, Canada" amenity university 0.878415816823755 Canada FALSE
+university of quebec ca Americas Northern America FALSE 1 2021-02-03 113982632 way "Concordia University (SGW Campus), Rue Saint-Mathieu, Montagne, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3H 2P4, Canada" amenity university 0.592769930727231 Canada FALSE
+university of saskatchewan ca Americas Northern America FALSE 1 2021-02-03 188955577 way "University of Saskatchewan, 33rd Street East, Saskatoon, Saskatoon (city), Saskatchewan, S7K 3H9, Canada" amenity university 0.789594387429839 Canada FALSE
+uwc ca Americas Northern America FALSE 1 2021-02-03 259171836 relation "Pearson College UWC, Pearson College Drive, Metchosin, Capital Regional District, British Columbia, V9C 4H1, Canada" amenity college 0.382582546755277 Canada FALSE
+victoria university ca Americas Northern America FALSE 1 2021-02-03 57466240 node "Victoria University, Charles Street West, Bloor Street Culture Corridor, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5S 1S3, Canada" tourism information 0.201 Canada FALSE
+viking ca Americas Northern America FALSE 1 2021-02-03 225115 node "Viking, Town of Viking, Alberta, T0B 4N0, Canada" place town 0.4 Canada FALSE
+zealandia ca Americas Northern America FALSE 1 2021-02-03 296584586 relation "Zealandia, Saskatchewan, Canada" boundary administrative 0.55 Canada FALSE
+chan hol bz Americas Central America FALSE 1 2021-02-03 296831087 node "Hol Chan Vista, Boca Ciega, San Pedro Town, Belize District, BELIZE, Belize" place neighbourhood 0.45 Belize FALSE
+national university of cordoba bz Americas Central America FALSE 1 2021-02-03 46348836 node "National, George Price Highway, Saint Martin de Porres, Belize City, Belize District, 1021, Belize" office yes 0.101 Belize FALSE
+national university of córdoba bz Americas Central America FALSE 1 2021-02-03 46348836 node "National, George Price Highway, Saint Martin de Porres, Belize City, Belize District, 1021, Belize" office yes 0.101 Belize FALSE
+san francisco public utilities commission bz Americas Central America FALSE 1 2021-02-03 154587331 way "Public Utilities Commission, 41, Gabourel Lane, Fort George, King's Park, Belize City, Belize District, SUITE 205, Belize" office government 0.301 Belize FALSE
+cna by Europe Eastern Europe FALSE 1 2021-02-03 259097233 relation "Цна, СмолевичÑ<81>кий район, МинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, 211736, БеларуÑ<81>ÑŒ" waterway river 0.3 БеларуÑ<81>ÑŒ FALSE
+executive committee by Europe Eastern Europe FALSE 1 2021-02-03 94968267 way "МингориÑ<81>полком, 8, проÑ<81>пект Ð<9d>езавиÑ<81>имоÑ<81>ти, РомановÑ<81>каÑ<8f> Слобода, МоÑ<81>ковÑ<81>кий район, МинÑ<81>к, 220030, БеларуÑ<81>ÑŒ" office government 0.0854406477123641 БеларуÑ<81>ÑŒ FALSE
+kfc by Europe Eastern Europe FALSE 1 2021-02-03 84378852 node "KFC, 5, улица Петра Глебки, Тивали, Медвежино, ФрунзенÑ<81>кий район, МинÑ<81>к, 220121, БеларуÑ<81>ÑŒ" amenity fast_food 0.636510016719008 БеларуÑ<81>ÑŒ FALSE
+new journal of physics by Europe Eastern Europe FALSE 1 2021-02-03 72965668 node "Инженерно-физичеÑ<81>кий журнал, 38, улица Платонова, ПервомайÑ<81>кий район, МинÑ<81>к, 220023, БеларуÑ<81>ÑŒ" office newspaper 0.001 БеларуÑ<81>ÑŒ FALSE
+center for applied research bw Africa Southern Africa FALSE 1 2021-02-03 37633699 node "Centre for Applied Research, 74769, P G Matante Drive, Central Business District, Gaborone, South-East District, 502733, Botswana" office company 0.301 Botswana FALSE
+bhutan bt Asia Southern Asia FALSE 1 2021-02-03 257894181 relation འབྲུག་ཡུལ་ boundary administrative 0.658755532801197 འབྲུག་ཡུལ་ FALSE
+admx br Americas South America FALSE 1 2021-02-03 68823596 node "Adrenalina - ADMX, 1590, Rua João Negrão, Rebouças, Vila Torres, Curitiba, Região Geográfica Imediata de Curitiba, Região Metropolitana de Curitiba, Região Geográfica Intermediária de Curitiba, Paraná, Região Sul, 80230-150, Brasil" shop motorcycle_repair 0.101 Brasil FALSE
+aeta br Americas South America FALSE 1 2021-02-03 257664729 relation "Araçatuba, Região Imediata de Araçatuba, Região Geográfica Intermediária de Araçatuba, São Paulo, Região Sudeste, Brasil" boundary administrative 0.527221804640549 Brasil FALSE
+artemis br Americas South America FALSE 1 2021-02-03 258436873 relation "Artemis, Piracicaba, Região Imediata de Piracicaba, Região Geográfica Intermediária de Campinas, São Paulo, Região Sudeste, Brasil" boundary administrative 0.4 Brasil FALSE
+bayer cropscience br Americas South America FALSE 1 2021-02-03 252681789 way "Bayer CropScience, São Sebastião, Paracatu, Microrregião Paracatu, Região Geográfica Intermediária de Patos de Minas, Minas Gerais, Região Sudeste, Brasil" landuse industrial 0.4 Brasil FALSE
+biomed central 1 br Americas South America FALSE 1 2021-02-03 53650511 node "BioMed, 761, Rua Venâncio Aires, Centro Histórico, Centro, Cruz Alta, Região Geográfica Imediata de Cruz Alta, Região Geográfica Intermediária de Passo Fundo, Rio Grande do Sul, Região Sul, 98005-020, Brasil" shop yes 0.201 Brasil FALSE
+blm br Americas South America FALSE 1 2021-02-03 257895089 relation "Belém, Região Geográfica Imediata de Belém, Região Geográfica Intermediária de Belém, Pará, Região Norte, Brasil" boundary administrative 0.560480042057943 Brasil FALSE
+brazilian federal police br Americas South America FALSE 1 2021-02-03 66249623 node "Presidency of the Brazilian Republic, N1 Leste, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70000-000, Brasil" office government 0.201 Brasil FALSE
+brazilian space agency br Americas South America FALSE 1 2021-02-03 121542097 way "Agência Espacial Brasileira, Acesso Coberto, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70660655, Brasil" office government 0.001 Brasil FALSE
+business ethanol br Americas South America FALSE 1 2021-02-03 60782840 node "Ethanol, Rua Mármore, Santa Tereza, Regional Leste, Belo Horizonte, Microrregião Belo Horizonte, Região Metropolitana de Belo Horizonte, Minas Gerais, Região Sudeste, 31010-230, Brasil" amenity pub 0.101 Brasil FALSE
+cabo frio br Americas South America FALSE 1 2021-02-03 258346198 relation "Cabo Frio, Região Geográfica Imediata de Cabo Frio, Região Geográfica Intermediária de Macaé-Rio das Ostras-Cabo Frio, Rio de Janeiro, Região Sudeste, Brasil" boundary administrative 0.677953726983006 Brasil FALSE
+cdu/csu br Americas South America FALSE 1 2021-02-03 92204695 way "Carandiru, 2487, Avenida Cruzeiro do Sul, Santana, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 02031-000, Brasil" railway station 0.343659122005759 Brasil FALSE
+confap br Americas South America FALSE 1 2021-02-03 3453158 node "Confap, Comodoro, Microrregião de Parecis, Região Geográfica Intermediária de Cáceres, Mato Grosso, Região Centro-Oeste, Brasil" place hamlet 0.35 Brasil FALSE
+csu br Americas South America FALSE 1 2021-02-03 160040000 way "Aeroporto de Santa Cruz do Sul, Avenida Prefeito Orlando Oscár Baumhardt, Linha Santa Cruz, Sede Municipal, Santa Cruz do Sul, Região Geográfica Imediata de Santa Cruz do Sul, Região Geográfica Intermediária de Santa Cruz do Sul - Lajeado, Rio Grande do Sul, Região Sul, 96820-290, Brasil" aeroway aerodrome 0.275949010675047 Brasil FALSE
+eca br Americas South America FALSE 1 2021-02-03 126584998 way "Escola de Comunicações e Artes, 443, Avenida Professor Lúcio Martins Rodrigues, Butantã, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05508-010, Brasil" amenity college 0.365781769297865 Brasil FALSE
+el universal br Americas South America FALSE 1 2021-02-03 45711233 node "Universal, Branquinha, Espigão, Viamão, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 94460-530, Brasil" place neighbourhood 0.35 Brasil FALSE
+etec br Americas South America FALSE 1 2021-02-03 228049262 way "ETEC, Val-de-Cães, Entroncamento, Belém, Região Geográfica Imediata de Belém, Região Geográfica Intermediária de Belém, Pará, Região Norte, Brasil" landuse industrial 0.3 Brasil FALSE
+federal university of espirito santo br Americas South America FALSE 1 2021-02-03 190158758 way "Universidade Federal do EspÃrito Santo, 514, Avenida Fernando Ferrari, Mata da Praia, Goiabeiras, Vitória, Região Geográfica Imediata de Vitória, Região Metropolitana da Grande Vitória, Região Geográfica Intermediária de Vitória, EspÃrito Santo, Região Sudeste, 29075-910, Brasil" amenity university 0.596675389924706 Brasil FALSE
+federal university of paraná br Americas South America FALSE 1 2021-02-03 159113576 way "UTFPR - Universidade Tecnológica Federal do Paraná, 330, Rua Doutor Washington Subtil Chueire, Jardim Carvalho, Ponta Grossa, Região Geográfica Imediata de Ponta Grossa, Região Geográfica Intermediária de Ponta Grossa, Paraná, Região Sul, 84017-220, Brasil" amenity university 0.611447002935904 Brasil FALSE
+federal university of santa catarina br Americas South America FALSE 1 2021-02-03 258910798 relation "Universidade Federal da Fronteira Sul, Rodovia Balseiros do Rio Uruguai, Mezomo, Distrito Sede de Guatambu, Guatambu, Região Geográfica Imediata de Chapecó, Região Geográfica Intermediária de Chapecó, Santa Catarina, Região Sul, 89815-899, Brasil" amenity university 0.625302870611459 Brasil FALSE
+federal university of são carlos br Americas South America FALSE 1 2021-02-03 131256389 way "UNIVASF - Campus Juazeiro, 510, Avenida Antônio Carlos Magalhaes, Bairro Alto da Maravilha, Bairro Maringa, Juazeiro, Microrregião de Juazeiro, BR, Região Geográfica Intermediária de Juazeiro, Bahia, Região Nordeste, 48902-300, Brasil" amenity university 0.469728853996096 Brasil FALSE
+federal university of são paulo br Americas South America FALSE 1 2021-02-03 160694761 way "Universidade Federal do ABC, Campus São Bernardo do Campo, S/N, Alameda da Universidade, Parque Anchieta, Anchieta, São Bernardo do Campo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 09606-045, Brasil" amenity university 0.679989495490236 Brasil FALSE
+federal university of uberlândia br Americas South America FALSE 1 2021-02-03 128423073 way "Universidade Federal de Uberlândia - Campus Educa, Rua Ana Carneiro, Nossa Senhora Aparecida, Setor Central, Uberlândia, Microrregião Uberlândia, Região Geográfica Intermediária de Uberlândia, Minas Gerais, Região Sudeste, 38405-142, Brasil" amenity university 0.201 Brasil FALSE
+hifi br Americas South America FALSE 1 2021-02-03 83900249 node "Hifi, Avenida Manoel Dias da Silva, Pituba, Salvador, Região Geográfica Imediata de Salvador, Região Metropolitana de Salvador, Região Geográfica Intermediária de Salvador, Bahia, Região Nordeste, 41810-225, Brasil" shop hifi 0.101 Brasil FALSE
+ico br Americas South America FALSE 1 2021-02-03 258073026 relation "Icó, Microrregião de Iguatu, Região Geográfica Intermediária de Iguatu, Ceará, Região Nordeste, 63430-000, Brasil" boundary administrative 0.459452277129228 Brasil FALSE
+isad br Americas South America FALSE 1 2021-02-03 71911703 node "ISAD, 542, Rua José do PatrocÃnio, São Pedro, Governador Valadares, Microrregião Governador Valadares, Região Geográfica Intermediária de Governador Valadares, Minas Gerais, Região Sudeste, 35020-280, Brasil" amenity place_of_worship 0.101 Brasil FALSE
+itp br Americas South America FALSE 1 2021-02-03 10615106 node "Aeroporto Regional de Itaperuna Ernani do Amaral Peixoto, Avenida Ernani do Amaral Peixoto, Itaperuna, Região Geográfica Imediata de Itaperuna, Região Geográfica Intermediária de Campos dos Goytacazes, Rio de Janeiro, Região Sudeste, 28300-000, Brasil" aeroway aerodrome 0.181472839091896 Brasil FALSE
+itu br Americas South America FALSE 1 2021-02-03 257754909 relation "Itu, Região Imediata de Sorocaba, Região Metropolitana de Sorocaba, Região Geográfica Intermediária de Sorocaba, São Paulo, Região Sudeste, Brasil" boundary administrative 0.621055921429882 Brasil FALSE
+museum of natural sciences br Americas South America FALSE 1 2021-02-03 139974775 way "Museu de Ciências Naturais, 1427, Rua Doutor Salvador França, Jardim Botânico, Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 90690-000, Brasil" tourism museum 0.256321943137092 Brasil FALSE
+national health surveillance agency br Americas South America FALSE 1 2021-02-03 70330829 node "Agência Nacional de Vigilância Sanitária, 3000, Avenida Senador Carlos Jereissati, Aeroporto, Fortaleza, Microrregião de Fortaleza, Região Geográfica Intermediária de Fortaleza, Ceará, Região Nordeste, 60741-200, Brasil" office government 0.001 Brasil FALSE
+ossos br Americas South America FALSE 1 2021-02-03 59989122 node "Ossos, Centro, Armação dos Búzios, Região Geográfica Imediata de Cabo Frio, Região Geográfica Intermediária de Macaé-Rio das Ostras-Cabo Frio, Rio de Janeiro, Região Sudeste, 28950-000, Brasil" place quarter 0.35 Brasil FALSE
+petrobras br Americas South America FALSE 1 2021-02-03 111587897 way "Petrobras, Aruanda, Aracaju, Região Geográfica Imediata de Aracaju, Região Geográfica Intermediária de Aracaju, Sergipe, Região Nordeste, Brasil" landuse industrial 0.625082792846645 Brasil FALSE
+pmdb br Americas South America FALSE 1 2021-02-03 235391112 way "PMDB, Avenida Pátria, Formosa / Maria Regina, Alvorada, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 94814-510, Brasil" office political_party 0.101 Brasil FALSE
+porto alegre br Americas South America FALSE 1 2021-02-03 258417526 relation "Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, Brasil" boundary administrative 0.833208007806445 Brasil FALSE
+prata br Americas South America FALSE 1 2021-02-03 257892156 relation "Nova Prata, Região Geográfica Imediata de Nova Prata - Guaporé, Região Geográfica Intermediária de Caxias do Sul, Rio Grande do Sul, Região Sul, 95320-000, Brasil" boundary administrative 0.583724566403079 Brasil FALSE
+regional university of cariri br Americas South America FALSE 1 2021-02-03 23600017 node "Universidade Regional do Cariri - URCA, 1161, Rua Coronel Antônio Luiz, Pimenta, Crato, Microrregião de Cariri, Região Geográfica Intermediária de Juazeiro do Norte, Ceará, Região Nordeste, 63100-000, Brasil" amenity university 0.539805842395376 Brasil FALSE
+sci-hub br Americas South America FALSE 1 2021-02-03 168984790 way "Sport Club Internacional, 891, Avenida Padre Cacique, Praia de Belas, Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 90810-240, Brasil" leisure sports_centre 0.512779160464413 Brasil FALSE
+siberian branch br Americas South America FALSE 1 2021-02-03 48916343 node "Siberian, 1540, Avenida Coronel Fernando Ferreira Leite, Jardim Califórnia, Ribeirão Preto, Região Imediata de Ribeirão Preto, Região Metropolitana de Ribeirão Preto, Região Geográfica Intermediária de Ribeirão Preto, São Paulo, Região Sudeste, 14026-020, Brasil" shop clothes 0.101 Brasil FALSE
+ssri br Americas South America FALSE 1 2021-02-03 209994140 way "Ilhota dos Coqueiros, Avenida Beira Mar, Salvador, Região Geográfica Imediata de Salvador, Região Metropolitana de Salvador, Região Geográfica Intermediária de Salvador, Bahia, Região Nordeste, Brasil" aeroway helipad 0.001 Brasil FALSE
+state university of maringá br Americas South America FALSE 1 2021-02-03 121913292 way "Universidade Estadual de Maringá, 5790, Avenida Colombo, Jardim Ipiranga, Zona 09, Maringá, Região Geográfica Imediata de Maringá, Região Geográfica Intermediária de Maringá, Paraná, Região Sul, 87020-900, Brasil" amenity university 0.478149585742943 Brasil FALSE
+supreme federal court br Americas South America FALSE 1 2021-02-03 101158663 way "Supremo Tribunal Federal, S2 Leste, Setor de Autarquias Sul, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70046900, Brasil" amenity courthouse 0.58051510608517 Brasil FALSE
+syngenta seeds br Americas South America FALSE 1 2021-02-03 159731731 way "Syngenta Seeds, Formosa, Microrregião do Entorno de BrasÃlia, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária de Luziânia-Ã<81>guas Lindas de Goiás, Goiás, Região Centro-Oeste, Brasil" landuse industrial 0.4 Brasil FALSE
+tgf br Americas South America FALSE 1 2021-02-03 28625398 node "TGF, Rua ComandaÃ, Centro, Santa Rosa, Região Geográfica Imediata de Santa Rosa, Região Geográfica Intermediária de Ijui, Rio Grande do Sul, Região Sul, Brasil" office financial 0.101 Brasil FALSE
+tmd br Americas South America FALSE 1 2021-02-03 50056220 node "TamanduateÃ, Rua Guamiranga, Vila Prudente, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 03153-001, Brasil" railway station 0.368648909480289 Brasil FALSE
+tupperware br Americas South America FALSE 1 2021-02-03 163507943 way "Tupperware, Guaratiba, Zona Oeste do Rio de Janeiro, Rio de Janeiro, Região Geográfica Imediata do Rio de Janeiro, Região Metropolitana do Rio de Janeiro, Região Geográfica Intermediária do Rio de Janeiro, Rio de Janeiro, Região Sudeste, Brasil" landuse industrial 0.3 Brasil FALSE
+ucb br Americas South America FALSE 1 2021-02-03 150896841 way "Universidade Católica de BrasÃlia, W5 Norte / SGAN 916, HCGN 716, Setor Noroeste, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70770-535, Brasil" amenity university 0.348376470606964 Brasil FALSE
+unifesp br Americas South America FALSE 1 2021-02-03 138935040 way "UNIFESP, Rua Jorge Chamas, Vila Clementino, Vila Mariana, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 04015-051, Brasil" amenity university 0.549107677186954 Brasil FALSE
+university of mato grosso br Americas South America FALSE 1 2021-02-03 194788101 way "Instituto Federal de Mato Grosso, Campus Lucas do Rio Verde, 1600W, Avenida Universitária, Parque das Emas, Lucas do Rio Verde, Microrregião de Alto Teles Pires, Região Geográfica Intermediária de Sinop, Mato Grosso, Região Centro-Oeste, 78455000, Brasil" amenity university 0.201 Brasil FALSE
+university of são paolo br Americas South America FALSE 1 2021-02-03 71037590 node "polo do curso de licenciatura em ciencias, Rua Prof. Polycarpo do Amaral, São Dimas, Piracicaba, Região Imediata de Piracicaba, Região Geográfica Intermediária de Campinas, São Paulo, Região Sudeste, 13416-230, Brasil" amenity university 0.201 Brasil FALSE
+ayoreo bo Americas South America FALSE 1 2021-02-03 54221446 node "Ayoreo, Puerto Suárez, Germán Busch, Santa Cruz, Bolivia" place hamlet 0.35 Bolivia FALSE
+first department bo Americas South America FALSE 1 2021-02-03 51887484 node "First, Calle Arenales, Santa Cruz de la Sierra, Municipio Santa Cruz de la Sierra, Provincia Andrés Ibáñez, Santa Cruz, 3212, Bolivia" shop jewelry 0.101 Bolivia FALSE
+los angeles police department bo Americas South America FALSE 1 2021-02-03 193771011 way "Los Angeles, Provincia Warnes, Santa Cruz, Bolivia" place village 0.475 Bolivia FALSE
+pluspetrol bo Americas South America FALSE 1 2021-02-03 62171848 node "Pluspetrol, Calle Las Palmas, Mac Petrol, Santa Cruz de la Sierra, Municipio Santa Cruz de la Sierra, Provincia Andrés Ibáñez, Santa Cruz, 2236, Bolivia" office company 0.101 Bolivia FALSE
+bermuda institute of ocean sciences bm Americas Northern America FALSE 1 2021-02-03 134000033 way "Bermuda Institute of Ocean Sciences, Biological Station, Saint George's, GE03, Bermuda" amenity university 0.787418940697571 Bermuda FALSE
+lter bg Europe Eastern Europe FALSE 1 2021-02-03 46481769 node "@лма @лтер, 15, бул. Цар ОÑ<81>вободител, ж.к. Яворов, Средец, Столична, СофиÑ<8f>-град, 1504, БългaриÑ<8f>" amenity theatre 0.23461374284578 БългaриÑ<8f> FALSE
+orela bg Europe Eastern Europe FALSE 1 2021-02-03 151202736 way "Орела, кв. Момина банÑ<8f>, ХиÑ<81>арÑ<8f>, Пловдив, 4180, БългaриÑ<8f>" highway residential 0.1 БългaриÑ<8f> FALSE
+sofia university bg Europe Eastern Europe FALSE 1 2021-02-03 161691937 way "СофийÑ<81>ки универÑ<81>итет “Св. Климент ОхридÑ<81>ки"", 15, бул. Цар ОÑ<81>вободител, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1504, БългaриÑ<8f>" amenity university 0.515352144677718 БългaриÑ<8f> FALSE
+space technologies research institute bg Europe Eastern Europe FALSE 1 2021-02-03 118423296 way "ИнÑ<81>титут за КоÑ<81>мичеÑ<81>ки ИзÑ<81>ледваниÑ<8f> и Технологии, бл.1, Ð<90>кад. Георги Бончев, БÐ<90>Ð<9d> IV км., СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1113, БългaриÑ<8f>" office research 0.001 БългaриÑ<8f> FALSE
+university of sofia bg Europe Eastern Europe FALSE 1 2021-02-03 161691937 way "СофийÑ<81>ки универÑ<81>итет “Св. Климент ОхридÑ<81>ки"", 15, бул. Цар ОÑ<81>вободител, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1504, БългaриÑ<8f>" amenity university 0.515352144677718 БългaриÑ<8f> FALSE
+zamfir bg Europe Eastern Europe FALSE 1 2021-02-03 784595 node "Замфир, Лом, Монтана, БългaриÑ<8f>" place village 0.275 БългaриÑ<8f> FALSE
+zoe global bg Europe Eastern Europe FALSE 1 2021-02-03 189794797 way "Global, Димитровград, ХаÑ<81>ково, БългaриÑ<8f>" landuse commercial 0.3 БългaриÑ<8f> FALSE
+bhf bf Africa Western Africa FALSE 1 2021-02-03 258453504 relation Burkina Faso boundary administrative 0.680491224481489 Burkina Faso FALSE
+bureau of science be Europe Western Europe FALSE 1 2021-02-03 101902801 way "Bureau Greisch, 25, Allée des Noisetiers, Liège Science-Park, Angleur, Liège, Wallonie, 4031, België / Belgique / Belgien" building office 0.201 België / Belgique / Belgien FALSE
+center for cosmology be Europe Western Europe FALSE 1 2021-02-03 55302255 node "Centre for Cosmology, Particle Physics and Phenomenology (CP3), 2, Chemin du Cyclotron, Parc Einstein, Louvain-la-Neuve, Ottignies-Louvain-la-Neuve, Nivelles, Brabant wallon, Wallonie, 1348, België / Belgique / Belgien" office research 0.201 België / Belgique / Belgien FALSE
+chevron be Europe Western Europe FALSE 1 2021-02-03 6507688 node "Chevron, Stoumont, Verviers, Liège, Wallonie, 4987, België / Belgique / Belgien" place village 0.37381125651268 België / Belgique / Belgien FALSE
+erasmus university medical centre be Europe Western Europe FALSE 1 2021-02-03 314840 node "Erasme - Erasmus, Route de Lennik - Lennikse Baan, Anderlecht, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1070, België / Belgique / Belgien" railway station 0.444585942469205 België / Belgique / Belgien FALSE
+european defence agency be Europe Western Europe FALSE 1 2021-02-03 149946671 way "EDA, 17-23, Rue des Drapiers - Lakenweversstraat, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1050, België / Belgique / Belgien" office government 0.427022409876486 België / Belgique / Belgien FALSE
+european research council executive agency be Europe Western Europe FALSE 1 2021-02-03 73122812 node "ERCEA, 16, Place Charles Rogier - Karel Rogierplein, Saint-Josse-ten-Noode - Sint-Joost-ten-Node, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1210, België / Belgique / Belgien" office government 0.429911496965354 België / Belgique / Belgien FALSE
+genencor be Europe Western Europe FALSE 1 2021-02-03 112225638 way "43, Genencor International, Brugge-Centrum, Brugge, West-Vlaanderen, Vlaanderen, 8000, België / Belgique / Belgien" landuse industrial 0.3 België / Belgique / Belgien FALSE
+hal be Europe Western Europe FALSE 1 2021-02-03 258188555 relation "Halle, Halle-Vilvoorde, Vlaams-Brabant, Vlaanderen, België / Belgique / Belgien" boundary administrative 0.581694829650187 België / Belgique / Belgien FALSE
+harvard's church be Europe Western Europe FALSE 1 2021-02-03 49985626 node "Harvard's, Place de l'Accueil, Lauzelle, Louvain-la-Neuve, Ottignies-Louvain-la-Neuve, Nivelles, Brabant wallon, Wallonie, 1348, België / Belgique / Belgien" shop clothes 0.201 België / Belgique / Belgien FALSE
+initiative for medicines be Europe Western Europe FALSE 1 2021-02-03 80748719 node "IMI 2 JU, 56-60, Avenue de la Toison d'Or - Gulden-Vlieslaan, Saint-Gilles - Sint-Gillis, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1060, België / Belgique / Belgien" office yes 0.001 België / Belgique / Belgien FALSE
+jaspers be Europe Western Europe FALSE 1 2021-02-03 5512569 node "Jaspers, 159, Bloemendallaan, Strombeek, Strombeek-Bever, Grimbergen, Halle-Vilvoorde, Vlaams-Brabant, Vlaanderen, 1853, België / Belgique / Belgien" amenity pharmacy 0.101 België / Belgique / Belgien FALSE
+liège university be Europe Western Europe FALSE 1 2021-02-03 123758853 way "HEC Liège, Rue Reynier, Saint-Laurent, Glain, Liège, Wallonie, 4000, België / Belgique / Belgien" amenity university 0.101 België / Belgique / Belgien FALSE
+maastricht university be Europe Western Europe FALSE 1 2021-02-03 72718419 node "Maastricht University, 153, Avenue de Tervueren - Tervurenlaan, Woluwe-Saint-Pierre - Sint-Pieters-Woluwe, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1150, België / Belgique / Belgien" amenity university 0.201 België / Belgique / Belgien FALSE
+ortho be Europe Western Europe FALSE 1 2021-02-03 4044828 node "Ortho, La Roche-en-Ardenne, Marche-en-Famenne, Luxembourg, Wallonie, 6983, België / Belgique / Belgien" place village 0.375 België / Belgique / Belgien FALSE
+oxfam international be Europe Western Europe FALSE 1 2021-02-03 76889245 node "Oxfam, 405, Bredabaan, Wuustwezel, Antwerpen, Vlaanderen, 2990, België / Belgique / Belgien" shop shop=charity 0.101 België / Belgique / Belgien FALSE
+planck be Europe Western Europe FALSE 1 2021-02-03 157290 node "De Plank, Sint-Martens-Voeren, Voeren, Tongeren, Limburg, Vlaanderen, 3790, België / Belgique / Belgien" place hamlet 0.235968355602442 België / Belgique / Belgien FALSE
+plant systems biology be Europe Western Europe FALSE 1 2021-02-03 80891989 node "VIB-UGent Center for Plant Systems Biology, 71, Technologiepark-Zwijnaarde, Zwijnaarde, Gent, Oost-Vlaanderen, Vlaanderen, 9052, België / Belgique / Belgien" office research 0.301 België / Belgique / Belgien FALSE
+royal belgian institute for space aeronomy be Europe Western Europe FALSE 1 2021-02-03 98368678 way "Institut royal d'Aéronomie Spatiale de Belgique (IASB) - Koninklijk Belgisch Instituut voor Ruimte-Aeronomie (BIRA), 3, Avenue Circulaire - Ringlaan, Uccle - Ukkel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1180, België / Belgique / Belgien" building yes 0.101 België / Belgique / Belgien FALSE
+spa be Europe Western Europe FALSE 1 2021-02-03 258353734 relation "Spa, Verviers, Liège, Wallonie, 4900, België / Belgique / Belgien" boundary administrative 0.630842855879195 België / Belgique / Belgien FALSE
+spanish national research council be Europe Western Europe FALSE 1 2021-02-03 63415508 node "CSIC Delegation, 62, Rue du Trône - Troonstraat, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1050, België / Belgique / Belgien" office government 0.001 België / Belgique / Belgien FALSE
+université catholique de louvain be Europe Western Europe FALSE 1 2021-02-03 125108490 way "Musée L, 3, Place des Sciences, Biéreau, Louvain-la-Neuve, Ottignies-Louvain-la-Neuve, Nivelles, Brabant wallon, Wallonie, 1348, België / Belgique / Belgien" tourism museum 0.514317004425986 België / Belgique / Belgien FALSE
+university of ghent be Europe Western Europe FALSE 1 2021-02-03 114264163 way "Universiteit Gent Vakgroep Textielkunde, 70A, Technologiepark-Zwijnaarde, Wetenschapspark Ardoyen, Zwijnaarde, Gent, Oost-Vlaanderen, Vlaanderen, 9052, België / Belgique / Belgien" building yes 0.513953996266395 België / Belgique / Belgien FALSE
+university of pierre be Europe Western Europe FALSE 1 2021-02-03 72718419 node "Maastricht University, 153, Avenue de Tervueren - Tervurenlaan, Woluwe-Saint-Pierre - Sint-Pieters-Woluwe, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1150, België / Belgique / Belgien" amenity university 0.301 België / Belgique / Belgien FALSE
+vlti be Europe Western Europe FALSE 1 2021-02-03 176905194 way "Speelplaats VLTI, Goede Herder, Torhout, Brugge, West-Vlaanderen, Vlaanderen, 8820, België / Belgique / Belgien" highway footway 0.175 België / Belgique / Belgien FALSE
+vrije universiteit brussel be Europe Western Europe FALSE 1 2021-02-03 51922595 node "Vrije Universiteit Brussel, 2, Boulevard de la Plaine - Pleinlaan, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1050, België / Belgique / Belgien" tourism information 0.301 België / Belgique / Belgien FALSE
+wikimedia commons be Europe Western Europe FALSE 1 2021-02-03 126001376 way "https://commons.wikimedia.org/wiki/File:Den Bonten Hannen, 34, Mgr. Cardijnstraat, Kasterlee, Turnhout, Antwerpen, Vlaanderen, 2460, België / Belgique / Belgien" building house 0.201 België / Belgique / Belgien FALSE
+bangladesh agricultural research institute bd Asia Southern Asia FALSE 1 2021-02-03 218321267 way "Bangladesh Agricultural Research institute, বগà§<81>ড়া, বগà§<81>ড়া জেলা, রাজশাহী বিà¦à¦¾à¦—, বাংলাদেশ" landuse farmyard 0.6 বাংলাদেশ FALSE
+bangladesh university of engineering and technology bd Asia Southern Asia FALSE 1 2021-02-03 239326225 way "Bangladesh University of Engineering & Technology, Dhakeswari Road, বাবà§<81> বাজার, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1211, বাংলাদেশ" amenity university 0.867072547352423 বাংলাদেশ FALSE
+chandra x-ray center bd Asia Southern Asia FALSE 1 2021-02-03 148177740 way "Sharat Chandra Chakraborty Road, সিদà§<8d>দিক বাজার, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1100, বাংলাদেশ" highway tertiary 0.2 বাংলাদেশ FALSE
+ford model t bd Asia Southern Asia FALSE 1 2021-02-03 191227884 way "Ford Workshop, ঢাকা-ময়মনসিংহ মহাসড়ক, Sector 9, Uttara, Dhaka, Bangladesh, উতà§<8d>তরা, ঢাকা, Chanpara Bazar, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1230, বাংলাদেশ" building commercial 0.201 বাংলাদেশ FALSE
+institute of science and technology bd Asia Southern Asia FALSE 1 2021-02-03 28348367 node "Institute of Science and Technology, Road 15/A, ধানমনà§<8d>ডি আ/à¦<8f>, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 12, বাংলাদেশ" building university 0.778015094618814 বাংলাদেশ FALSE
+one health institute bd Asia Southern Asia FALSE 1 2021-02-03 176103509 way "Health Institute, Dumki - Bauphal - Dashmina - Galachipa Highway, পটà§<81>য়াখালী সদর উপজেলা, পটà§<81>য়াখালী জেলা, বরিশাল বিà¦à¦¾à¦—, 8602, বাংলাদেশ" building yes 0.201 বাংলাদেশ FALSE
+pdb bd Asia Southern Asia FALSE 1 2021-02-03 184556254 way "PDB, রংপà§<81>র, রংপà§<81>র জেলা, 5400, বাংলাদেশ" highway living_street 0.2 বাংলাদেশ FALSE
+statistical research center bd Asia Southern Asia FALSE 1 2021-02-03 149441305 way "Institute of Statistical Research and Training, Mokarrom Building Road, সিদà§<8d>দিক বাজার, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1000, বাংলাদেশ" building yes 0.43461374284578 বাংলাদেশ FALSE
+tobacco control bd Asia Southern Asia FALSE 1 2021-02-03 38585207 node "National Tobacco Control Comission, তোপখানা রোড, ফকিরাপà§<81>ল, পলà§<8d>টন, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1000, বাংলাদেশ" office government 0.201 বাংলাদেশ FALSE
+university of development bd Asia Southern Asia FALSE 1 2021-02-03 43508783 node "University of Development (UODA), Dhanmondi 9/A, পশà§<8d>চিম ধানমনà§<8d>ডি, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, DHAKA-1209, বাংলাদেশ" amenity university 0.301 বাংলাদেশ FALSE
+bosnia and herzegovina ba Europe Southern Europe FALSE 1 2021-02-03 258531774 relation Bosna i Hercegovina / БоÑ<81>на и Херцеговина boundary administrative 0.743972985444669 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+cobe ba Europe Southern Europe FALSE 1 2021-02-03 24161088 node "ÄŒobe, Općina Maglaj, ZeniÄ<8d>ko-dobojski kanton, Federacija Bosne i Hercegovine, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" place village 0.300938798149577 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+icmp ba Europe Southern Europe FALSE 1 2021-02-03 36728774 node "ICMP - International Commission on Missing Persons, Bosne Srebrene, Mejdan, Tuzla, Grad Tuzla, Tuzlanski kanton, Federacija Bosne i Hercegovine, 75000, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" office company 0.101 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+lav ba Europe Southern Europe FALSE 1 2021-02-03 13949201 node "Lav, M-4, Novakovići, Залужани, Banja Luka, Grad Banja Luka, Република СрпÑ<81>ка / Republika Srpska, 78000, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" amenity bar 0.101 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+pliva ba Europe Southern Europe FALSE 1 2021-02-03 172671795 way "Pliva, Pijavice, Jajce, Općina Jajce, Srednjobosanski kanton / Županija SrediÅ¡nja Bosna, Federacija Bosne i Hercegovine, 70101, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" waterway river 0.375 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+azerbaijan az Asia Western Asia FALSE 1 2021-02-03 257577722 relation Azərbaycan boundary administrative 0.740930969969447 Azərbaycan FALSE
+dst az Asia Western Asia FALSE 1 2021-02-03 561986 node "Dəstə, Ordubad rayonu, Naxçıvan Muxtar Respublikası, Azərbaycan" place village 0.321073131097349 Azərbaycan FALSE
+aqc au Oceania Australia and New Zealand FALSE 1 2021-02-03 116982466 way "AQC carpark, Oban Road, Mount Isa, Mount Isa City, Queensland, 4825, Australia" amenity parking 0.101 Australia FALSE
+aurora australis au Oceania Australia and New Zealand FALSE 1 2021-02-03 207551621 way "Aurora, Kembla Street, Wollongong, Wollongong City Council, New South Wales, 2500, Australia" building yes 0.101 Australia FALSE
+australia national university au Oceania Australia and New Zealand FALSE 1 2021-02-03 43175627 node "Janefield Drive LPO, Janefield Drive, University Hill Precinct, Bundoora, Mill Park, City of Whittlesea, Victoria, 3082, Australia" amenity post_office 0.201 Australia FALSE
+australia telescope compact array au Oceania Australia and New Zealand FALSE 1 2021-02-03 6458901 node "CSIRO Australia Telescope Compact Array, Heliograph Track, Narrabri, Narrabri Shire Council, New South Wales, 2390, Australia" tourism attraction 0.401 Australia FALSE
+australian archaeological association au Oceania Australia and New Zealand FALSE 1 2021-02-03 136959246 way "Australian Local Government Association, 8, Geils Court, Deakin, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" building yes 0.201 Australia FALSE
+australian broadcasting corporation au Oceania Australia and New Zealand FALSE 1 2021-02-03 154556170 way "Australian Broadcasting Corporation, 114, Grey Street, South Bank, South Brisbane, Brisbane City, Queensland, 4101, Australia" building yes 0.889492484386201 Australia FALSE
+australian capital territory au Oceania Australia and New Zealand FALSE 1 2021-02-03 258363989 relation "Australian Capital Territory, Australia" boundary administrative 0.860942226859498 Australia FALSE
+australian institute for bioengineering au Oceania Australia and New Zealand FALSE 1 2021-02-03 95576953 way "Australian Institute for Bioengineering and Nanotechnology, Old Cooper Road, St Lucia, Brisbane City, Queensland, 4072, Australia" building university 0.401 Australia FALSE
+australian institute of health and welfare au Oceania Australia and New Zealand FALSE 1 2021-02-03 115890715 way "Australian Institute of Health and Welfare, Belconnen Bikeway, Bruce, District of Belconnen, Australian Capital Territory, 2617, Australia" building yes 0.601 Australia FALSE
+australian museum au Oceania Australia and New Zealand FALSE 1 2021-02-03 89870859 way "Australian Museum, Cross City Tunnel, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia" tourism museum 0.644873557645695 Australia FALSE
+axl au Oceania Australia and New Zealand FALSE 1 2021-02-03 195087476 way "Alexandria Homestead Airport, Ranken Road, Connells Lagoon, Nicholson, Barkly Region, Northern Territory, Australia" aeroway aerodrome 0.001 Australia FALSE
+barmah forest au Oceania Australia and New Zealand FALSE 1 2021-02-03 258530660 relation "Barmah, Shire of Moira, Victoria, Australia" boundary administrative 0.378015094618814 Australia FALSE
+bureau of meteorology au Oceania Australia and New Zealand FALSE 1 2021-02-03 147830484 way "Bureau Of Meteorology, Kent Town, Adelaide, The City of Norwood Payneham and St Peters, South Australia, 5067, Australia" landuse industrial 0.5 Australia FALSE
+centre for medical research & innovation au Oceania Australia and New Zealand FALSE 1 2021-02-03 151744793 way "Centre for Medical Research, Royal Parade, Melbourne Innovation District, Parkville, Melbourne, City of Melbourne, Victoria, 3000, Australia" building yes 0.501 Australia FALSE
+cfs au Oceania Australia and New Zealand FALSE 1 2021-02-03 114833255 way "Coffs Harbour Regional Airport, Hogbin Drive, Coffs Harbour, Coffs Harbour City Council, New South Wales, 2450, Australia" aeroway aerodrome 0.350918373098637 Australia FALSE
+charles darwin university au Oceania Australia and New Zealand FALSE 1 2021-02-03 126921964 way "Charles Darwin University, Ellengowen Drive, Brinkin, Darwin, City of Darwin, Northern Territory, 0800, Australia" amenity university 0.690444593674683 Australia FALSE
+chinese nationalist party au Oceania Australia and New Zealand FALSE 1 2021-02-03 59443609 node "The Chinese Nationalist Party of Australia, Ultimo Road, Haymarket, Sydney, Council of the City of Sydney, New South Wales, 2000, Australia" office political_party 0.301 Australia FALSE
+cns au Oceania Australia and New Zealand FALSE 1 2021-02-03 193921262 way "Cairns Airport, Airport Avenue, Aeroglen, Cairns, Cairns Regional, Queensland, 4870, Australia" aeroway aerodrome 0.436307119840041 Australia FALSE
+colless au Oceania Australia and New Zealand FALSE 1 2021-02-03 229106860 way "Colless Warrambool, Wingadee, Coonamble Shire Council, New South Wales, 2829, Australia" waterway stream 0.3 Australia FALSE
+commonwealth bank of australia au Oceania Australia and New Zealand FALSE 1 2021-02-03 17320127 node "Commonwealth Bank of Australia, 208-214, Kingaroy Street, Kingaroy, South Burnett Regional, Queensland, 4610, Australia" amenity bank 0.401 Australia FALSE
+csl au Oceania Australia and New Zealand FALSE 1 2021-02-03 97475392 way "CSL, Parkville, City of Melbourne, Victoria, 3052, Australia" landuse industrial 0.3 Australia FALSE
+darwin au Oceania Australia and New Zealand FALSE 1 2021-02-03 16499368 node "Darwin, City of Darwin, Northern Territory, 0800, Australia" place city 0.679885767346348 Australia FALSE
+department of immigration and citizenship au Oceania Australia and New Zealand FALSE 1 2021-02-03 157090843 way "Department of Immigration and Citizenship, 76, Thomas Street, Dandenong, City of Greater Dandenong, Victoria, 3175, Australia" building office 0.501 Australia FALSE
+department of marine sciences au Oceania Australia and New Zealand FALSE 1 2021-02-03 99862102 way "Department of Earth and Marine Sciences, Linnaeus Way, Acton, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia" building university 0.401 Australia FALSE
+doherty institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 119889961 way "Peter Doherty Institute, Grattan Street, Melbourne Innovation District, Melbourne, City of Melbourne, Victoria, 3000, Australia" building yes 0.201 Australia FALSE
+fairley house au Oceania Australia and New Zealand FALSE 1 2021-02-03 259508544 relation "Fairley, Shire of Gannawarra, Victoria, Australia" boundary administrative 0.35 Australia FALSE
+federal circuit au Oceania Australia and New Zealand FALSE 1 2021-02-03 118947152 way "German Embassy, 119, Empire Circuit, Yarralumla, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" office diplomatic 0.36851441835616 Australia FALSE
+fisheries au Oceania Australia and New Zealand FALSE 1 2021-02-03 50756594 node "The Fisheries, Coles Bay, Glamorgan-Spring Bay, Tasmania, 7251, Australia" place neighbourhood 0.35 Australia FALSE
+forensic institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 162032267 way "Victorian Institute of Forensic Medicine, 65, Kavanagh Street, Southbank, City of Melbourne, Victoria, 3006, Australia" office research 0.201 Australia FALSE
+fss au Oceania Australia and New Zealand FALSE 1 2021-02-03 30204607 node "Flinders Street, Melbourne, City of Melbourne, Victoria, 3000, Australia" railway station 0.427742562950671 Australia FALSE
+garvan institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 212333308 way "Garvan Institute of Medical Research, Chaplin Street, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia" building yes 0.491360254031496 Australia FALSE
+geolink au Oceania Australia and New Zealand FALSE 1 2021-02-03 62868078 node "Geolink, 103, Faulkner Street, North Hill, Armidale, Armidale Regional Council, New South Wales, 2350, Australia" office engineers 0.101 Australia FALSE
+gold coast au Oceania Australia and New Zealand FALSE 1 2021-02-03 259463504 relation "Gold Coast City, Queensland, Australia" boundary administrative 0.770120034131775 Australia FALSE
+grattan institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 101841158 way "Grattan Institute, Russell Park Lane, Melbourne Innovation District, Carlton, City of Melbourne, Victoria, 3053, Australia" building yes 0.201 Australia FALSE
+griffith university in nathan au Oceania Australia and New Zealand FALSE 1 2021-02-03 95356693 way "Griffith University Nathan Campus, Griffith Road, Nathan, Brisbane City, Queensland, 4111, Australia" amenity university 0.301 Australia FALSE
+inquisition au Oceania Australia and New Zealand FALSE 1 2021-02-03 38185509 node "Inquisition Hill, Shoalhaven City Council, New South Wales, Australia" natural peak 0.4 Australia FALSE
+irvine city council au Oceania Australia and New Zealand FALSE 1 2021-02-03 258831478 relation "Mount Irvine, Blue Mountains City Council, New South Wales, 2786, Australia" boundary administrative 0.55 Australia FALSE
+james cook university in australia au Oceania Australia and New Zealand FALSE 1 2021-02-03 183284314 way "Curtin University Sydney, Regent Street, Chippendale, Sydney, Council of the City of Sydney, New South Wales, 2008, Australia" amenity university 0.301 Australia FALSE
+jewish general hospital au Oceania Australia and New Zealand FALSE 1 2021-02-03 223245688 way "Zee Germans, Cessnock, Cessnock City Council, New South Wales, Australia" highway path 0.075 Australia FALSE
+keane au Oceania Australia and New Zealand FALSE 1 2021-02-03 66988458 node "Keane, Moorine Rock, Shire Of Yilgarn, Western Australia, Australia" place locality 0.225 Australia FALSE
+leviathan au Oceania Australia and New Zealand FALSE 1 2021-02-03 303895 node "Leviathan, Inverell Shire Council, New South Wales, Australia" place locality 0.225 Australia FALSE
+marine conservation group au Oceania Australia and New Zealand FALSE 1 2021-02-03 164392010 way "Great Barrier Reef Coast Marine Park - Herbet Creek, The Percy Group, Isaac Regional, Queensland, Australia" landuse conservation 0.4 Australia FALSE
+maurice blackburn au Oceania Australia and New Zealand FALSE 1 2021-02-03 75072947 node "Maurice Blackburn, Rostella Way, Melbourne, City of Melbourne, Victoria, 3000, Australia" office lawyer 0.201 Australia FALSE
+molonglo observatory synthesis telescope au Oceania Australia and New Zealand FALSE 1 2021-02-03 178337614 way "Molonglo Observatory Synthesis Telescope, Hoskinstown Road, Hoskinstown, Bungendore, Queanbeyan-Palerang Regional Council, New South Wales, 2621, Australia" man_made antenna 0.401 Australia FALSE
+murchison widefield array au Oceania Australia and New Zealand FALSE 1 2021-02-03 215884568 way "Murchison Widefield Array, Beringarra-Pindar Road, South Murchison, Shire Of Murchison, Western Australia, Australia" man_made telescope 0.301 Australia FALSE
+murdoch children's research institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 82024678 node "Murdoch Children's Research Institute, Flemington Road, Parkville, North Melbourne, City of Melbourne, Victoria, 3052, Australia" amenity research_institute 0.501 Australia FALSE
+murdoch childrens research institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 82024678 node "Murdoch Children's Research Institute, Flemington Road, Parkville, North Melbourne, City of Melbourne, Victoria, 3052, Australia" amenity research_institute 0.301 Australia FALSE
+national ocean council au Oceania Australia and New Zealand FALSE 1 2021-02-03 258808648 relation "Ocean Shores, Byron Shire Council, New South Wales, 2483, Australia" boundary administrative 0.45 Australia FALSE
+national press club au Oceania Australia and New Zealand FALSE 1 2021-02-03 125056817 way "National Press Club, National Circuit, Barton, South Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" building office 0.567719150556049 Australia FALSE
+national research alliance au Oceania Australia and New Zealand FALSE 1 2021-02-03 88815095 way "Accident Research Centre, 21, Alliance Lane, Clayton, City of Monash, Victoria, 3800, Australia" building yes 0.201 Australia FALSE
+national space workshop au Oceania Australia and New Zealand FALSE 1 2021-02-03 209490340 way "Space, Turner, North Canberra, District of Canberra Central, Australian Capital Territory, 2612, Australia" landuse residential 0.3 Australia FALSE
+nature research au Oceania Australia and New Zealand FALSE 1 2021-02-03 158110702 way "Pauline Toner Butterfly Nature Conservation Reserve, Woodridge, Eltham, Shire of Nillumbik, Victoria, 3095, Australia" natural wood 0.3 Australia FALSE
+nsw au Oceania Australia and New Zealand FALSE 1 2021-02-03 258358609 relation "New South Wales, Australia" boundary administrative 0.700850708194693 Australia FALSE
+nsw forestry corporation au Oceania Australia and New Zealand FALSE 1 2021-02-03 196058557 way "Banksia Picnic Area, Strickland Falls Trail, Somersby, Gosford, Central Coast Council, New South Wales, 2250, Australia" tourism picnic_site 0.001 Australia FALSE
+nuffield council au Oceania Australia and New Zealand FALSE 1 2021-02-03 131986368 way "Nuffield Park, Victoria Square, Zetland, Sydney, Council of the City of Sydney, New South Wales, 2017, Australia" leisure park 0.35 Australia FALSE
+occator au Oceania Australia and New Zealand FALSE 1 2021-02-03 200702038 way "Occator Way, Falcon, Mandurah, City Of Mandurah, Western Australia, Australia" highway residential 0.2 Australia FALSE
+open research au Oceania Australia and New Zealand FALSE 1 2021-02-03 301252280 node "Research, Shire of Nillumbik, Victoria, 3095, Australia" place town 0.4 Australia FALSE
+parliament house au Oceania Australia and New Zealand FALSE 1 2021-02-03 21288197 node "Parliament House, Parliament Drive, Capital Hill, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" tourism attraction 0.620468394176642 Australia FALSE
+professionals association au Oceania Australia and New Zealand FALSE 1 2021-02-03 60049003 node "Victorian Allied Health Professionals Association, William Street, West Melbourne, Melbourne, City of Melbourne, Victoria, 3000, Australia" office ngo 0.201 Australia FALSE
+r/v falkor au Oceania Australia and New Zealand FALSE 1 2021-02-03 255379377 way "Falkor Road, Arcadia Estate, Officer, Shire of Cardinia, Victoria, 3809, Australia" highway proposed 0.4 Australia FALSE
+royal tasmanian botanical gardens au Oceania Australia and New Zealand FALSE 1 2021-02-03 105955035 way "Royal Tasmanian Botanical Gardens, Queens Domain, Hobart, City of Hobart, Tasmania, Australia" leisure park 0.691360254031496 Australia FALSE
+school of information science and technology au Oceania Australia and New Zealand FALSE 1 2021-02-03 114559341 way "Information Science & Technology, Second floor access bridge between Earth Sciences and IST, Bedford Park, Adelaide, City of Mitcham, South Australia, 5042, Australia" building yes 0.501 Australia FALSE
+science council au Oceania Australia and New Zealand FALSE 1 2021-02-03 113885956 way "Science, Funda Close, Bellingen, Bellingen Shire Council, New South Wales, 2454, Australia" building school 0.201 Australia FALSE
+sea council au Oceania Australia and New Zealand FALSE 1 2021-02-03 48813444 node "Sea Life Center, Pier 26, Darling Quarter, Sydney, Council of the City of Sydney, New South Wales, 2000, Australia" tourism attraction 0.572421960066799 Australia FALSE
+southern cross university in lismore au Oceania Australia and New Zealand FALSE 1 2021-02-03 162934407 way "Southern Cross University, Highfield Terrace, Goonellabah, Lismore City Council, New South Wales, 2480, Australia" amenity university 0.401 Australia FALSE
+tepco au Oceania Australia and New Zealand FALSE 1 2021-02-03 258860992 relation "Tepco Station, Pastoral Unincorporated Area, South Australia, 5440, Australia" boundary administrative 0.35 Australia FALSE
+the jewish state au Oceania Australia and New Zealand FALSE 1 2021-02-03 223245688 way "Zee Germans, Cessnock, Cessnock City Council, New South Wales, Australia" highway path 0.075 Australia FALSE
+thomson innovation au Oceania Australia and New Zealand FALSE 1 2021-02-03 10691481 node "Thomson, Rathdowne Street, Melbourne Innovation District, Carlton, City of Melbourne, Victoria, 3053, Australia" shop estate_agent 0.201 Australia FALSE
+tru group au Oceania Australia and New Zealand FALSE 1 2021-02-03 83205259 node "Tru-fit Denture Group, 84, Grange Road, Alphington, City of Darebin, Victoria, 3078, Australia" shop medical_supply 0.201 Australia FALSE
+united ki au Oceania Australia and New Zealand FALSE 1 2021-02-03 3232177 node "United Rangeway, 50, Rifle Range Road, Rangeway, Geraldton, City Of Greater Geraldton, Western Australia, 6530, Australia" amenity fuel 0.101 Australia FALSE
+university of monash au Oceania Australia and New Zealand FALSE 1 2021-02-03 87739881 way "Monash University, Clayton Campus, Bus Loop, Clayton, City of Monash, Victoria, 3800, Australia" amenity university 0.567719150556049 Australia FALSE
+university of new south wales sydney au Oceania Australia and New Zealand FALSE 1 2021-02-03 102614348 way "University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia" amenity university 1.11490411729019 Australia FALSE
+unsw au Oceania Australia and New Zealand FALSE 1 2021-02-03 102614348 way "University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia" amenity university 0.61490411729019 Australia FALSE
+unsw sydney au Oceania Australia and New Zealand FALSE 1 2021-02-03 102614348 way "University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia" amenity university 0.71490411729019 Australia FALSE
+us national security council au Oceania Australia and New Zealand FALSE 1 2021-02-03 138068943 way "Security, Anna Clark Avenue, Nirimba Fields, Sydney, Blacktown City Council, New South Wales, 2763, Australia" building university 0.301 Australia FALSE
+us public health service au Oceania Australia and New Zealand FALSE 1 2021-02-03 99223949 way "400 Public Health, 400, Jackson Avenue, Bentley, Town of Victoria Park, Western Australia, 6102, Australia" building university 0.301 Australia FALSE
+western australia department of parks and wildlife au Oceania Australia and New Zealand FALSE 1 2021-02-03 33111781 node "Gnaala Mia Campground, Loop 2, Williams, Shire Of Williams, Western Australia, Australia" tourism camp_site 0.301 Australia FALSE
+western sydney university au Oceania Australia and New Zealand FALSE 1 2021-02-03 52671569 node "Western Sydney University, Kearney Avenue, Kingswood, Sydney, Penrith City Council, New South Wales, 2747, Australia" tourism information 0.301 Australia FALSE
+γ-ray observatory au Oceania Australia and New Zealand FALSE 1 2021-02-03 181119800 way "University of Tasmania Cosmic Ray Observatory, Pinnacle Feeder Track, City of Hobart, Tasmania, Australia" man_made observatory 0.201 Australia FALSE
+areva at Europe Western Europe FALSE 1 2021-02-03 108135800 way "Areva, Bergham, Enzenwinkl, Leonding, Bezirk Linz-Land, Oberösterreich, 4060, Österreich" landuse commercial 0.3 Österreich FALSE
+circuit therapeutics at Europe Western Europe FALSE 1 2021-02-03 193999341 way "Stuwerviertel, KG Leopoldstadt, Leopoldstadt, Wien, 1020, Österreich" highway raceway 0.1 Österreich FALSE
+ctbto at Europe Western Europe FALSE 1 2021-02-03 148373856 way "Vienna International Centre, 5, Wagramer Straße, KG Kaisermühlen, Donaustadt, Wien, 1400, Österreich" place house 0.392168689295747 Österreich FALSE
+erwin schrödinger international institute for mathematical physics at Europe Western Europe FALSE 1 2021-02-03 55212209 node "Erwin-Schrödinger-Institut für Mathematische Physik, 9, Boltzmanngasse, Thurygrund, KG Alsergrund, Alsergrund, Wien, 1090, Österreich" amenity university 0.516167966338533 Österreich FALSE
+gapp at Europe Western Europe FALSE 1 2021-02-03 109776638 way "Gapp, 17, Grazbachgasse, Jakomini, Graz, Steiermark, 8010, Österreich" shop safety_equipment 0.101 Österreich FALSE
+gpg at Europe Western Europe FALSE 1 2021-02-03 72976686 node "GPG, Wollöster, Kobledt, Eglsee, Burgkirchen, Bezirk Braunau am Inn, Oberösterreich, 5274, Österreich" shop window_blind 0.101 Österreich FALSE
+joanneum research at Europe Western Europe FALSE 1 2021-02-03 100346870 way "JOANNEUM RESEARCH - DIGITAL Institut für Informations- und Kommunikationssysteme, 17, Steyrergasse, Jakomini, Graz, Steiermark, 8010, Österreich" building yes 0.201 Österreich FALSE
+melk at Europe Western Europe FALSE 1 2021-02-03 258502438 relation "Melk, Bezirk Melk, Niederösterreich, 3281, Österreich" waterway river 0.494052338771708 Österreich FALSE
+nhm at Europe Western Europe FALSE 1 2021-02-03 258348028 relation "Naturhistorisches Museum, 7, Burgring, Schottenviertel, Innere Stadt, Wien, 1010, Österreich" tourism museum 0.441911671250342 Österreich FALSE
+taigen at Europe Western Europe FALSE 1 2021-02-03 568295 node "Taigen, Irrsdorf, Straßwalchen, Bezirk Salzburg-Umgebung, Salzburg, 5204, Österreich" place hamlet 0.35 Österreich FALSE
+university of salzburg at Europe Western Europe FALSE 1 2021-02-03 120296912 way "Universität Salzburg - Unipark, 1, Erzabt-Klotz-Straße, Nonntal, Salzburg, 5020, Österreich" amenity university 0.577768525385992 Österreich FALSE
+university of veterinary medicine vienna at Europe Western Europe FALSE 1 2021-02-03 96379147 way "Veterinärmedizinische Universität, Angyalföldstraße, KG Leopoldau, Floridsdorf, Wien, 1210, Österreich" amenity university 0.342242222837154 Österreich FALSE
+wehi at Europe Western Europe FALSE 1 2021-02-03 258340208 relation "Gemeinde Weiler, Bezirk Feldkirch, Vorarlberg, 6837, Österreich" boundary administrative 0.384723197268746 Österreich FALSE
+anses ar Americas South America FALSE 1 2021-02-03 76657057 node "ANSES, 1192, Doctor Arturo R. de la Serna, General Lavalle, Partido de General Lavalle, Buenos Aires, 7103, Argentina" office government 0.375244632729739 Argentina FALSE
+aol ar Americas South America FALSE 1 2021-02-03 165974980 way "Aeropuerto Paso De Los Libres, Avenida Arturo Frondizi, B 60 viv, 50 VIV G1,2,3,4, Municipio de Paso de los Libres, Departamento Paso de los Libres, Corrientes, W3230FLP, Argentina" aeroway aerodrome 0.331005307834616 Argentina FALSE
+ar ar Americas South America FALSE 1 2021-02-03 258404994 relation Argentina boundary administrative 0.910104194561691 Argentina FALSE
+atic ar Americas South America FALSE 1 2021-02-03 50671745 node "Atic, Ingeniero White, Partido de BahÃa Blanca, Buenos Aires, 8013, Argentina" place neighbourhood 0.35 Argentina FALSE
+auger observatory ar Americas South America FALSE 1 2021-02-03 10519055 node "Observatorio Pierre Auger, 304, Avenida San MartÃn (Norte), Malargüe, Distrito Ciudad de Malargüe, Departamento Malargüe, Mendoza, Argentina" tourism attraction 0.43489332460211 Argentina FALSE
+conicet ar Americas South America FALSE 1 2021-02-03 302226945 relation "CONICET, BahÃa Blanca, Partido de BahÃa Blanca, Buenos Aires, Argentina" boundary administrative 0.4 Argentina FALSE
+córdoba national observatory ar Americas South America FALSE 1 2021-02-03 122297187 way "Observatorio Astronómico de Córdoba, 854, Francisco N. de Laprida, Observatorio, Córdoba, Municipio de Córdoba, PedanÃa Capital, Departamento Capital, Córdoba, X5000, Argentina" building public 0.101 Argentina FALSE
+corrientes ar Americas South America FALSE 1 2021-02-03 257819256 relation "Corrientes, Argentina" boundary administrative 0.638272357177901 Argentina FALSE
+cvi ar Americas South America FALSE 1 2021-02-03 155461170 way "Aeropuerto de Caleta Olivia, Ruta Provincial 99, Km. 8, Caleta Olivia, Deseado, Santa Cruz, 9013, Argentina" aeroway aerodrome 0.119931111449547 Argentina FALSE
+ianigla ar Americas South America FALSE 1 2021-02-03 25557881 node "Instituto Argentino de NivologÃa, GlaciologÃa y Ciencias Ambientales (IANIGLA), Avenida Adrián Ruiz Leal, Ciudad de Mendoza, Sección 9ª Parque General San MartÃn, Departamento Capital, Mendoza, M5547, Argentina" amenity college 0.101 Argentina FALSE
+la pampa ar Americas South America FALSE 1 2021-02-03 258441426 relation "La Pampa, Argentina" boundary administrative 0.710733717290293 Argentina FALSE
+laguna diamante ar Americas South America FALSE 1 2021-02-03 184628204 way "Laguna Diamante, Departamento Antofagasta de la Sierra, Catamarca, K4705, Argentina" natural water 0.4 Argentina FALSE
+saa ar Americas South America FALSE 1 2021-02-03 251041075 way "Aeropuerto General Acha, 2356, Manuel J. Campos, General Acha, Municipio de General Acha, Departamento Utracán, La Pampa, L8200, Argentina" aeroway aerodrome 0.2885709817045 Argentina FALSE
+santa fe ar Americas South America FALSE 1 2021-02-03 258372619 relation "Santa Fe, Argentina" boundary administrative 0.771095269263292 Argentina FALSE
+us epa ar Americas South America FALSE 1 2021-02-03 96252367 way "El Palomar, José Bianco, El Palomar, Partido de Morón, Buenos Aires, 1684, Argentina" aeroway aerodrome 0.351537799411788 Argentina FALSE
+westinghouse ar Americas South America FALSE 1 2021-02-03 129730400 way "Westinghouse, Ituzaingó, Córdoba, Municipio de Córdoba, PedanÃa Capital, Departamento Capital, Córdoba, X5020, Argentina" highway residential 0.2 Argentina FALSE
+nam ao Africa Middle Africa FALSE 1 2021-02-03 258455224 relation "Namibe, Angola" boundary administrative 0.595173613781596 Angola FALSE
+ponta ao Africa Middle Africa FALSE 1 2021-02-03 259503510 relation "Ponta, MunicÃpio de Luanda, Luanda, Angola" boundary administrative 0.5 Angola FALSE
+teva ao Africa Middle Africa FALSE 1 2021-02-03 10960093 node "Teva, Huambo, Angola" place village 0.375 Angola FALSE
+polytechnic university of tirana al Europe Southern Europe FALSE 1 2021-02-03 185277358 way "Universiteti Politeknik i Tiranës, 4, Sheshi Nënë Tereza, Libri Universitar, Njësia Bashkiake Nr. 5, Tiranë, Bashkia Tiranë, Qarku i Tiranës, Shqipëria qendrore, 1001-1028, Shqipëria" amenity university 0.351332014915526 Shqipëria FALSE
+romesberg al Europe Southern Europe FALSE 1 2021-02-03 6516142 node "Romës, Armen, Bashkia Selenicë, Qarku i Vlorës, Shqipëria jugore, 9427, Shqipëria" place village 0.275 Shqipëria FALSE
+university of tirana al Europe Southern Europe FALSE 1 2021-02-03 185277358 way "Universiteti Politeknik i Tiranës, 4, Sheshi Nënë Tereza, Libri Universitar, Njësia Bashkiake Nr. 5, Tiranë, Bashkia Tiranë, Qarku i Tiranës, Shqipëria qendrore, 1001-1028, Shqipëria" amenity university 0.351332014915526 Shqipëria FALSE
+aei ai Americas Caribbean FALSE 1 2021-02-03 258465287 relation Anguilla boundary administrative 0.597033622148582 Anguilla FALSE
+jaea af Asia Southern Asia FALSE 1 2021-02-03 176884644 way "د جلال اباد هوايي ډګر, Jalalabad Torkham Highway, Khoshkombat, بهسود ولسوالÛ<8d>, ننگرهار ولايت, 0039, اÙ<81>غانستان" aeroway aerodrome 0.335429261886761 اÙ<81>غانستان FALSE
+sra af Asia Southern Asia FALSE 1 2021-02-03 17142841 node "Sra, Øصارک ولسوالÛ<8d>, ننگرهار ولايت, اÙ<81>غانستان" place town 0.4 اÙ<81>غانستان FALSE
+american university of sharjah ae Asia Western Asia FALSE 1 2021-02-03 53275531 node "American university sharjah, STAIR 06, Al Juraina 1, ملويلØ, الشارقة, 120100, الإمارات العربية المتØدة" amenity university 0.641036070852761 الإمارات العربية المتØدة FALSE
+manchester business school ae Asia Western Asia FALSE 1 2021-02-03 42982352 node "Manchester Business School, شارع البروج, قرية المعرÙ<81>Ø©, دبي, 11999, الإمارات العربية المتØدة" building university 0.301 الإمارات العربية المتØدة FALSE
+masdar ae Asia Western Asia FALSE 1 2021-02-03 40179978 node "Masdar, Pedestrian Zone Masdar, مدينة مصدر, أبوظبي, أبو ظبي, 46450, الإمارات العربية المتØدة" highway bus_stop 0.101 الإمارات العربية المتØدة FALSE
+ministry of environmental protection ae Asia Western Asia FALSE 1 2021-02-03 139477241 way "The Ministry of Environmental Protection, مارينا أم القيوين, أم القيوين, الإمارات العربية المتØدة" landuse commercial 0.6 الإمارات العربية المتØدة FALSE
+new york university abu dhabi ae Asia Western Asia FALSE 1 2021-02-03 148462781 way "جامعة نيويورك أبوظبي, جزيرة السعديات, جامعة نيويورك أبوظبي, أبوظبي, أبو ظبي, الإمارات العربية المتØدة" amenity university 0.336487354815963 الإمارات العربية المتØدة FALSE
+novaya zemlya ae Asia Western Asia FALSE 1 2021-02-03 259223381 relation "Novaya Zemlya, دبي, الإمارات العربية المتØدة" place islet 0.45 الإمارات العربية المتØدة FALSE
+special committee ae Asia Western Asia FALSE 1 2021-02-03 57489199 node "Special Olympics 2019 Local Committee Offices, شارع الشيخ راشد بن سعيد, Fairmont Residences, مدينة خليÙ<81>Ø©, أبوظبي, أبو ظبي, 63171, الإمارات العربية المتØدة" office government 0.201 الإمارات العربية المتØدة FALSE
+anschutz medical center de Europe Western Europe FALSE NA 2021-02-05 1146647 node "Anschütz, 17, Stiller Gasse, Schmalkalden, Landkreis Schmalkalden-Meiningen, Thüringen, 98574, Deutschland" shop bicycle 0.001 Deutschland FALSE
\ No newline at end of file
diff --git a/data/reference_data/osm_cache_copy.tsv b/data/reference_data/osm_cache_copy.tsv
new file mode 100644
index 000000000..5725d825a
--- /dev/null
+++ b/data/reference_data/osm_cache_copy.tsv
@@ -0,0 +1,10758 @@
+query address.country_code un_region un_subregion hand_edited Freq query_date place_id osm_type display_name class type importance address.country reviewed
+uk gb Europe Northern Europe FALSE 1201 2021-02-03 258411454 relation United Kingdom boundary administrative 0.872378013283733 United Kingdom TRUE
+us us Americas Northern America FALSE 1173 2021-02-03 257984054 relation United States boundary administrative 0.935691367457589 United States TRUE
+california us Americas Northern America FALSE 1068 2021-02-03 258350986 relation "California, United States" boundary administrative 0.912136384157707 United States TRUE
+united states us Americas Northern America FALSE 1060 2021-02-03 257984054 relation United States boundary administrative 1.13569136745759 United States TRUE
+massachusetts us Americas Northern America FALSE 770 2021-02-03 258278823 relation "Massachusetts, United States" boundary administrative 0.836449761303479 United States TRUE
+germany de Europe Western Europe FALSE 697 2021-02-03 257692299 relation Deutschland boundary administrative 0.889681489172255 Deutschland TRUE
+china cn Asia Eastern Asia FALSE 674 2021-02-03 257605389 relation ä¸å›½ boundary administrative 0.87882659637803 ä¸å›½ TRUE
+maryland us Americas Northern America FALSE 528 2021-02-03 258170637 relation "Maryland, United States" boundary administrative 0.824620353023131 United States TRUE
+nasa us Americas Northern America FALSE 524 2021-02-03 99133114 way "Lyndon B. Johnson Space Center, 2101, NASA Parkway, Houston, Harris County, Texas, 77058, United States" tourism attraction 0.618056742388072 United States TRUE
+canada ca Americas Northern America FALSE 513 2021-02-03 258158704 relation Canada boundary administrative 0.966125910965408 Canada TRUE
+new york us Americas Northern America FALSE 479 2021-02-03 258355858 relation "New York, United States" boundary administrative 1.01757661145185 United States TRUE
+australia au Oceania Australia and New Zealand FALSE 423 2021-02-03 257740098 relation Australia boundary administrative 0.952135063915111 Australia TRUE
+japan jp Asia Eastern Asia FALSE 406 2021-02-03 258446007 relation 日本 boundary administrative 0.871013326546246 日本 TRUE
+university of california us Americas Northern America FALSE 404 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 0.948194378261701 United States TRUE
+united kingdom gb Europe Northern Europe FALSE 353 2021-02-03 258411454 relation United Kingdom boundary administrative 1.07237801328373 United Kingdom TRUE
+switzerland ch Europe Western Europe FALSE 344 2021-02-03 257695656 relation Schweiz/Suisse/Svizzera/Svizra boundary administrative 0.826485171575252 Schweiz/Suisse/Svizzera/Svizra TRUE
+france fr Europe Western Europe FALSE 339 2021-02-03 258401904 relation France boundary administrative 1.01332644373965 France TRUE
+european union MULTI Europe MULTI TRUE 279 2021-02-03 NA NA NA NA NA NA NA TRUE
+netherlands nl Europe Western Europe FALSE 270 2021-02-03 258635389 relation Nederland boundary administrative 0.829416895369094 Nederland TRUE
+italy it Europe Southern Europe FALSE 262 2021-02-03 258444203 relation Italia boundary administrative 0.883101903144055 Italia TRUE
+congress NONE NA NA TRUE 258 2021-02-03 NA NA NA NA NA NA NA TRUE
+india in Asia Southern Asia FALSE 254 2021-02-03 298116298 relation India boundary administrative 0.947689135880987 India TRUE
+washington us Americas Northern America FALSE 240 2021-02-03 259037983 relation "Washington, District of Columbia, United States" boundary administrative 0.849288898611582 United States TRUE
+america NONE NA NA TRUE 239 2021-02-03 NA NA NA NA NA NA NA TRUE
+us national institutes of health us Americas Northern America FALSE 230 2021-02-03 102178084 way "National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, United States" landuse commercial 0.6 United States TRUE
+illinois us Americas Northern America FALSE 229 2021-02-03 257440201 relation "Illinois, United States" boundary administrative 0.843803112037364 United States TRUE
+massachusetts institute of technology us Americas Northern America FALSE 221 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 1.04674262776464 United States TRUE
+texas us Americas Northern America FALSE 212 2021-02-03 257418219 relation "Texas, United States" boundary administrative 0.858052139534058 United States TRUE
+nih us Americas Northern America TRUE 210 2021-02-03 102178084 way "National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, United States" landuse commercial 0.6 United States TRUE
+world health organization MULTI MULTI MULTI TRUE 210 2021-02-03 NA NA NA NA NA NA NA TRUE
+new jersey us Americas Northern America FALSE 207 2021-02-03 257885980 relation "New Jersey, United States" boundary administrative 0.952055513496666 United States TRUE
+university of oxford gb Europe Northern Europe FALSE 205 2021-02-03 96249903 way "Oxford University Museum of Natural History, Parks Road, City Centre, Oxford, Oxfordshire, South East, England, OX1 3PW, United Kingdom" tourism museum 0.690225650640271 United Kingdom TRUE
+european space agency MULTI Europe MULTI TRUE 204 2021-02-03 NA NA NA NA NA NA NA TRUE
+mexico mx Americas Central America FALSE 194 2021-02-03 257065613 relation México boundary administrative 0.839923932441765 México TRUE
+colorado us Americas Northern America FALSE 193 2021-02-03 258349416 relation "Colorado, United States" boundary administrative 0.816010061654908 United States TRUE
+brazil br Americas South America FALSE 193 2021-02-03 256950327 relation Brasil boundary administrative 0.845577342306117 Brasil TRUE
+united nations MULTI MULTI MULTI TRUE 188 2021-02-03 159967172 way "United Nations, Taft Avenue, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" railway station 0.529847857867275 Luzon TRUE
+harvard university us Americas Northern America FALSE 187 2021-02-03 258370425 relation "Harvard University, Kingsley Street, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134-1420, United States" amenity university 0.977190722653673 United States TRUE
+eu MULTI Europe MULTI TRUE 182 2021-02-03 258377753 relation "Eu, Dieppe, Seine-Maritime, Normandie, France métropolitaine, 76260, France" boundary administrative 0.659192634426485 France TRUE
+stanford university us Americas Northern America FALSE 181 2021-02-03 97833344 way "Stanford University, 408, Panama Mall, Stanford, Santa Clara County, California, 94305, United States" amenity university 0.855492545367418 United States TRUE
+us food and drug administration us Americas Northern America FALSE 176 2021-02-03 27293848 node "US Food & Drug Administration, 5162, Valleypointe Parkway, Thornecrest, Roanoke County, Virginia, 24019, United States" office government 0.401 United States TRUE
+russia ru Europe Eastern Europe FALSE 172 2021-02-03 258410737 relation РоÑ<81>Ñ<81>иÑ<8f> boundary administrative 0.852192362078589 РоÑ<81>Ñ<81>иÑ<8f> TRUE
+"university of california, berkeley" us Americas Northern America FALSE 162 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.0481943782617 United States TRUE
+virginia us Americas Northern America FALSE 162 2021-02-03 257877023 relation "Virginia, United States" boundary administrative 0.837428557079075 United States TRUE
+south africa za Africa Southern Africa FALSE 159 2021-02-03 258310948 relation South Africa boundary administrative 0.982907627703066 South Africa TRUE
+spain es Europe Southern Europe FALSE 158 2021-02-03 258583824 relation España boundary administrative 0.865552504518026 España TRUE
+european commission MULTI Europe MULTI TRUE 156 2021-02-03 80449876 node "EC, 200, Rue de la Loi - Wetstraat, Quartier européen - Europese Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1040, België / Belgique / Belgien" office government 0.636019418289309 België / Belgique / Belgien TRUE
+sweden se Europe Northern Europe FALSE 152 2021-02-03 257716320 relation Sverige boundary administrative 0.84163245433824 Sverige TRUE
+connecticut us Americas Northern America FALSE 151 2021-02-03 258171713 relation "Connecticut, United States" boundary administrative 0.818771933111505 United States TRUE
+britain gb Europe Northern Europe FALSE 149 2021-02-03 258411454 relation United Kingdom boundary administrative 0.872378013283733 United Kingdom TRUE
+north carolina us Americas Northern America FALSE 144 2021-02-03 258457663 relation "North Carolina, United States" boundary administrative 0.920364397898499 United States TRUE
+university of cambridge gb Europe Northern Europe FALSE 144 2021-02-03 85738792 way "Fitzwilliam Museum, Trumpington Street, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 1RB, United Kingdom" tourism museum 0.667686595449203 United Kingdom TRUE
+florida us Americas Northern America FALSE 142 2021-02-03 257824147 relation "Florida, United States" boundary administrative 0.851213972798062 United States TRUE
+university of washington us Americas Northern America FALSE 142 2021-02-03 258779744 relation "University of Washington, Burke-Gilman Trail, University District, Seattle, King County, Washington, 98105, United States" amenity university 0.898418423079257 United States TRUE
+senate NONE NA NA TRUE 138 2021-02-03 367209 node "Senate, Jack County, Texas, United States" place hamlet 0.35 United States TRUE
+pennsylvania us Americas Northern America FALSE 133 2021-02-03 295875619 relation "Pennsylvania, United States" boundary administrative 0.857742643241961 United States TRUE
+la NONE NA NA FALSE 131 2021-02-03 NA NA NA NA NA NA NA TRUE
+university college london gb Europe Northern Europe FALSE 129 2021-02-03 259450693 relation "University College London, Endsleigh Gardens, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0EB, United Kingdom" amenity university 0.615434238632773 United Kingdom TRUE
+imperial college london gb Europe Northern Europe FALSE 128 2021-02-03 301718758 relation "Imperial College London, Exhibition Road, Knightsbridge, City of Westminster, London, Greater London, England, SW7 2AZ, United Kingdom" amenity university 0.795213557010066 United Kingdom TRUE
+chile cl Americas South America FALSE 128 2021-02-03 257831844 relation Chile boundary administrative 0.87834210834697 Chile TRUE
+fda us Americas Northern America TRUE 127 2021-02-03 259031793 relation "FDA, Zone 6, Tchien, Grand Gedeh County, Liberia" boundary administrative 0.35 Liberia TRUE
+us national science foundation us Americas Northern America TRUE 122 2021-02-03 189156816 way "National Science Foundation, Vidya Road, Independace Squre, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office research 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை TRUE
+south korea kr Asia Eastern Asia FALSE 122 2021-02-03 258235947 relation ëŒ€í•œë¯¼êµ boundary administrative 0.802419592147396 ëŒ€í•œë¯¼êµ TRUE
+harvard medical school us Americas Northern America FALSE 120 2021-02-03 146981708 way "Harvard Medical School, Longwood Avenue, Roxbury, Boston, Suffolk County, Massachusetts, 02120, United States" amenity university 0.301 United States TRUE
+california institute of technology us Americas Northern America FALSE 117 2021-02-03 97237039 way "California Institute of Technology, East Del Mar Boulevard, Pasadena, Los Angeles County, California, 91106, United States" amenity university 0.98591368499579 United States TRUE
+white house us Americas Northern America FALSE 116 2021-02-03 147370893 way "White House, 1600, Pennsylvania Avenue Northwest, Washington, District of Columbia, 20500, United States" historic castle 0.83472115416811 United States TRUE
+nature NONE NA NA TRUE 116 2021-02-03 106841545 way "Nature, Woodbury Lane, Woodbury, Irvine, Orange County, California, 92620, United States" highway residential 0.2 United States TRUE
+hawaii us Americas Northern America FALSE 108 2021-02-03 258372128 relation "Hawaii, United States" boundary administrative 0.820432643396309 United States TRUE
+national institutes of health us Americas Northern America FALSE 108 2021-02-03 102178084 way "National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, United States" landuse commercial 0.6 United States TRUE
+nsf us Americas Northern America TRUE 108 2021-02-03 80933809 node "An NiÅŸf, غبيش, ولاية غرب كردÙ<81>ان, السودان" place hamlet 0.25 السودان TRUE
+yale university us Americas Northern America FALSE 108 2021-02-03 258788418 relation "Yale University, West Haven, New Haven County, Connecticut, 06516, United States" amenity university 0.859636160157988 United States TRUE
+georgia us Americas Northern America FALSE 107 2021-02-03 258375785 relation "Georgia, United States" boundary administrative 0.829577897122545 United States TRUE
+cern MULTI Europe MULTI TRUE 107 2021-02-03 257664292 relation "CERN - Site de Meyrin, Route de Meyrin, Prévessin, Prévessin-Moëns, Gex, Ain, Auvergne-Rhône-Alpes, France métropolitaine, 01280, France" office research 0.658916271379286 France TRUE
+columbia university us Americas Northern America FALSE 106 2021-02-03 235180475 way "Columbia University, Reunion Plaza, Morningside Heights, Manhattan Community Board 9, Manhattan, New York County, New York, United States" amenity university 0.872550278643288 United States TRUE
+google us Americas Northern America FALSE 106 2021-02-03 18812108 node "Google, 355, Main Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" office company 0.794935675921029 United States TRUE
+who MULTI MULTI MULTI TRUE 106 2021-02-03 91298032 way "Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra TRUE
+national science foundation us Americas Northern America TRUE 103 2021-02-03 189156816 way "National Science Foundation, Vidya Road, Independace Squre, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office research 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை TRUE
+israel il Asia Western Asia FALSE 100 2021-02-03 258074628 relation ישר×<90>ל boundary administrative 0.791602003658504 ישר×<90>ל TRUE
+harvard us Americas Northern America FALSE 98 2021-02-03 258370425 relation "Harvard University, Kingsley Street, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134-1420, United States" amenity university 0.877190722653673 United States TRUE
+new zealand nz Oceania Australia and New Zealand FALSE 96 2021-02-03 257922775 relation New Zealand / Aotearoa boundary administrative 0.991711172959347 New Zealand / Aotearoa TRUE
+princeton university us Americas Northern America FALSE 93 2021-02-03 259109522 relation "Princeton University, Brunswick Pike, Penns Neck, Princeton, Mercer County, New Jersey, 08540, United States" amenity university 0.846017552564293 United States TRUE
+johns hopkins university us Americas Northern America FALSE 91 2021-02-03 259066232 relation "Johns Hopkins University, 3400, North Charles Street, Charles Village, Baltimore, Maryland, 21218, United States" amenity university 0.891185823835172 United States TRUE
+norway no Europe Northern Europe FALSE 91 2021-02-03 258434833 relation Norge boundary administrative 0.814696521978471 Norge TRUE
+noaa us Americas Northern America TRUE 90 2021-02-03 47618740 node "ນາ, ເມືàºàº‡à»€àºŠà»‚ປນ, ສະຫວັນນະເຂດ, ປະເທດລາວ" place village 0.275 ປະເທດລາວ TRUE
+ohio us Americas Northern America FALSE 89 2021-02-03 295875618 relation "Ohio, United States" boundary administrative 0.8407357649767 United States TRUE
+un MULTI MULTI MULTI TRUE 89 2021-02-03 258337461 relation "Universidad de Navarra, Carretera de la Universidad, Pamplona/Iruña, Navarra - Nafarroa, 31007, España" amenity university 0.58086888056666 España TRUE
+co co Americas South America FALSE 89 2021-02-03 258355394 relation Colombia boundary administrative 0.879708646936571 Colombia TRUE
+house of representatives us Americas Northern America TRUE 88 2021-02-03 60617052 node "衆è°é™¢, 1, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0014, 日本" office government 0.570873380707553 日本 TRUE
+cornell university us Americas Northern America FALSE 86 2021-02-03 259012417 relation "Johnson Museum of Art, 114, Central Avenue, Ithaca, Ithaca Town, Tompkins County, New York, 14853, United States" tourism museum 0.378680902821112 United States TRUE
+louisiana us Americas Northern America FALSE 86 2021-02-03 257328554 relation "Louisiana, United States" boundary administrative 0.813184888367119 United States TRUE
+us environmental protection agency us Americas Northern America FALSE 82 2021-02-03 258100172 relation "Environmental Protection Agency, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20004, United States" office government 0.301 United States TRUE
+missouri us Americas Northern America FALSE 81 2021-02-03 258150217 relation "Missouri, United States" boundary administrative 0.832881344700329 United States TRUE
+university of michigan us Americas Northern America FALSE 79 2021-02-03 258570054 relation "University of Michigan, 500, South State Street, Ann Arbor, Washtenaw County, Michigan, 48109, United States" amenity university 0.942114967834941 United States TRUE
+belgium be Europe Western Europe FALSE 79 2021-02-03 258282932 relation België / Belgique / Belgien boundary administrative 0.819060552357301 België / Belgique / Belgien TRUE
+epa us Americas Northern America TRUE 78 2021-02-03 96252367 way "El Palomar, José Bianco, El Palomar, Partido de Morón, Buenos Aires, 1684, Argentina" aeroway aerodrome 0.351537799411788 Argentina TRUE
+university of pennsylvania us Americas Northern America FALSE 78 2021-02-03 258680341 relation "University of Pennsylvania, Market Street, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19139, United States" amenity university 0.926036457903365 United States TRUE
+national academy of sciences us Americas Northern America FALSE 75 2021-02-03 106787905 way "National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States" office ngo 1.00593943258948 United States TRUE
+tennessee us Americas Northern America FALSE 75 2021-02-03 257213963 relation "Tennessee, United States" boundary administrative 0.820268105343983 United States TRUE
+iran ir Asia Southern Asia FALSE 74 2021-02-03 258075432 relation ایران boundary administrative 0.824702703615226 ایران TRUE
+duke university us Americas Northern America FALSE 72 2021-02-03 259450641 relation "Duke University, 15th Street, 9th Street District, Durham, Durham County, North Carolina, 27705, United States" amenity university 0.793140337132867 United States TRUE
+indonesia id Asia South-Eastern Asia FALSE 72 2021-02-03 257918359 relation Indonesia boundary administrative 0.915582040548682 Indonesia TRUE
+facebook us Americas Northern America TRUE 70 2021-02-03 258236555 way "Facebook, Kawangware, Nairobi, Kenya" landuse recreation_ground 0.3 Kenya TRUE
+university of chicago us Americas Northern America FALSE 70 2021-02-03 123843818 way "The University of Chicago, 5801, South Ellis Avenue, Hyde Park, Chicago, Hyde Park Township, Cook County, Illinois, 60637, United States" amenity university 0.934698313895193 United States TRUE
+esa MULTI Europe MULTI TRUE 70 2021-02-03 258416750 relation "Yesa, Navarra - Nafarroa, España" boundary administrative 0.608906504927631 España TRUE
+england gb Europe Northern Europe FALSE 70 2021-02-03 257775513 relation "England, United Kingdom" boundary administrative 0.938748907051256 United Kingdom TRUE
+denmark dk Europe Northern Europe FALSE 70 2021-02-03 257253228 relation Danmark boundary administrative 0.806805864691751 Danmark TRUE
+us national oceanic and atmospheric administration us Americas Northern America FALSE 69 2021-02-03 301086165 way "1839, National Oceanic Atmospheric Administration, San Diego, San Diego County, California, 92101, United States" landuse industrial 0.6 United States TRUE
+royal society gb Europe Northern Europe FALSE 68 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.847225834784319 United Kingdom TRUE
+wellcome trust gb Europe Northern Europe FALSE 68 2021-02-03 165545925 way "Wellcome Trust, 215, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom" building yes 0.630084056292374 United Kingdom TRUE
+national oceanic and atmospheric administration us Americas Northern America FALSE 67 2021-02-03 301086165 way "1839, National Oceanic Atmospheric Administration, San Diego, San Diego County, California, 92101, United States" landuse industrial 0.6 United States TRUE
+new mexico us Americas Northern America FALSE 64 2021-02-03 258170453 relation "New Mexico, United States" boundary administrative 0.915456300696001 United States TRUE
+intergovernmental panel NONE NA NA FALSE 64 2021-02-03 NA NA NA NA NA NA NA TRUE
+kenya ke Africa Eastern Africa FALSE 64 2021-02-03 258031172 relation Kenya boundary administrative 0.826488598383626 Kenya TRUE
+twitter us Americas Northern America FALSE 62 2021-02-03 18817852 node "Twitter, 1355, Market Street, Civic Center, San Francisco, San Francisco City and County, California, 94102, United States" office company 0.798653680040316 United States TRUE
+university of illinois us Americas Northern America FALSE 62 2021-02-03 24997928 node "Gameday Spirit, 2028, North Prospect Avenue, Champaign, Champaign County, Illinois, 61822, United States" shop clothes 0.101 United States TRUE
+arizona us Americas Northern America FALSE 61 2021-02-03 257489274 relation "Arizona, United States" boundary administrative 0.823799492478004 United States TRUE
+house NONE NA NA TRUE 61 2021-02-03 258618125 relation "استان هرمزگان, ایران" boundary administrative 0.571634966054199 ایران TRUE
+university of edinburgh gb Europe Northern Europe FALSE 60 2021-02-03 87886135 way "University of Edinburgh, Windmill Place, Pleasance, Southside, City of Edinburgh, Scotland, EH8 9XQ, United Kingdom" amenity university 0.900742371444641 United Kingdom TRUE
+alaska us Americas Northern America FALSE 59 2021-02-03 258358045 relation "Alaska, United States" boundary administrative 0.821112507250872 United States TRUE
+swiss federal institute of technology ch Europe Western Europe TRUE 59 2021-02-03 3632573991 Node ETH Merchandise Store shop clothes NA Schweiz/Suisse/Svizzera/Svizra TRUE
+oregon us Americas Northern America FALSE 58 2021-02-03 257496023 relation "Oregon, United States" boundary administrative 0.824296037464145 United States TRUE
+pennsylvania state university us Americas Northern America FALSE 58 2021-02-03 147721263 way "Air Quality Learning and Demonstration Center, Air Quality Lane, Ferguson Township, Centre County, Pennsylvania, 16803, United States" tourism attraction 0.201 United States TRUE
+university of arizona us Americas Northern America FALSE 58 2021-02-03 117399379 way "University of Arizona, East Polk Street, Central City, Phoenix, Maricopa County, Arizona, 85004, United States" amenity university 0.301 United States TRUE
+us geological survey us Americas Northern America FALSE 58 2021-02-03 135946356 way "US Geological Survey, Wilson Avenue, Pasadena, Los Angeles County, California, 91125, United States" building yes 0.301 United States TRUE
+university of manchester gb Europe Northern Europe FALSE 57 2021-02-03 122339635 way "Pendulum Hotel, Sackville Street, City Centre, Manchester, Greater Manchester, North West England, England, M1 3BB, United Kingdom" tourism hotel 0.101 United Kingdom TRUE
+university of wisconsin us Americas Northern America FALSE 56 2021-02-03 53450184 node "UWRF Fast Copy, 410, South 3rd Street, River Falls, Pierce County, Wisconsin, 54022, United States" shop copyshop 0.101 United States TRUE
+singapore sg Asia South-Eastern Asia FALSE 56 2021-02-03 258556513 relation Singapore boundary administrative 0.843276755105906 Singapore TRUE
+american geophysical union us Americas Northern America FALSE 54 2021-02-03 34377963 node "American Geophysical Union, 2000, Florida Avenue Northwest, Washington, District of Columbia, 20009, United States" office research 0.765817363739393 United States TRUE
+indiana us Americas Northern America FALSE 54 2021-02-03 257993413 relation "Indiana, United States" boundary administrative 0.817836972596621 United States TRUE
+minnesota us Americas Northern America FALSE 54 2021-02-03 258377215 relation "Minnesota, United States" boundary administrative 0.831102000252045 United States TRUE
+mit us Americas Northern America FALSE 54 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 0.646742627764641 United States TRUE
+us centers for disease control and prevention us Americas Northern America FALSE 54 2021-02-03 96695743 way "Centers for Disease Control and Prevention Edward R. Roybal Campus, Clifton Heights Lane Northeast, Druid Hills, DeKalb County, Georgia, 1540, United States" office research 0.701 United States TRUE
+european research council MULTI Europe MULTI TRUE 54 2021-02-03 73122812 node "ERCEA, 16, Place Charles Rogier - Karel Rogierplein, Saint-Josse-ten-Noode - Sint-Joost-ten-Node, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1210, België / Belgique / Belgien" office government 0.429911496965354 België / Belgique / Belgien TRUE
+argentina ar Americas South America FALSE 54 2021-02-03 258404994 relation Argentina boundary administrative 0.910104194561691 Argentina TRUE
+american association for the advancement of science us Americas Northern America FALSE 53 2021-02-03 8123167 node "AAAS / Science, 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" tourism attraction 0.201 United States TRUE
+university of colorado boulder us Americas Northern America FALSE 53 2021-02-03 103270225 way "Museum of Natural History - Henderson Building, 1030, Broadway, The Hill, Boulder, Boulder County, Colorado, 80802, United States" tourism museum 0.556321943137092 United States TRUE
+turkey tr Asia Western Asia FALSE 53 2021-02-03 258445264 relation Türkiye boundary administrative 0.812289652418409 Türkiye TRUE
+lhc MULTI Europe MULTI TRUE 53 2021-02-03 208268818 way "LHC, Sai Nagar, Chamundeshwari Nagar, Hubballi, Hubballi taluku, Dharwad district, Karnataka, 580020, India" highway service 0.175 India TRUE
+university of toronto ca Americas Northern America FALSE 53 2021-02-03 86595017 way "University of Toronto, Wellesley-Hoskin Cycle Track, Bloor Street Culture Corridor, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5S 1C4, Canada" amenity university 0.905105918866445 Canada TRUE
+arizona state university us Americas Northern America FALSE 52 2021-02-03 258489814 relation "Arizona State University, East Apache Boulevard, Tempe Junction, Tempe, Maricopa County, Arizona, 85287, United States" amenity university 0.854736575831137 United States TRUE
+austria at Europe Western Europe FALSE 52 2021-02-03 257659808 relation Österreich boundary administrative 0.823043874164126 Österreich TRUE
+goddard space flight center us Americas Northern America FALSE 51 2021-02-03 258921089 relation "Goddard Space Flight Center, Greenbelt Road, Brookland, Glenn Dale, Prince George's County, Maryland, 20769, United States" amenity research_institute 0.900582931635345 United States TRUE
+new york university us Americas Northern America FALSE 51 2021-02-03 114164826 way "New York University, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States" amenity university 0.934621425344776 United States TRUE
+chinese academy of sciences cn Asia Eastern Asia FALSE 51 2021-02-03 163215118 way "ä¸å›½ç§‘å¦é™¢ç‰©ç<90>†ç ”究所, ä¸å…³æ<9d>‘å<8d>—一æ<9d>¡, 新科祥å›, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" amenity research_institute 0.249182950422608 ä¸å›½ TRUE
+southwest research institute us Americas Northern America FALSE 50 2021-02-03 258916067 relation "Southwest Research Institute, 6220, Culebra Road, San Antonio, Bexar County, Texas, 78228, United States" amenity research_institute 0.663793454953531 United States TRUE
+ipcc MULTI MULTI MULTI TRUE 50 2021-02-03 47368685 node "IPCC, San Ignacio, Santiago, Provincia de Santiago, Región Metropolitana de Santiago, 8330180, Chile" amenity university 0.101 Chile TRUE
+ethiopia et Africa Eastern Africa FALSE 49 2021-02-03 258197652 relation ኢትዮጵያ boundary administrative 0.719313654189281 ኢትዮጵያ TRUE
+democratic republic of the congo cd Africa Middle Africa FALSE 49 2021-02-03 258410829 relation République démocratique du Congo boundary administrative 0.822405117667525 République démocratique du Congo TRUE
+bill & melinda gates foundation us Americas Northern America FALSE 48 2021-02-03 177964409 way "Bill & Melinda Gates Foundation, 500, 5th Avenue North, Lower Queen Anne, Belltown, Seattle, King County, Washington, 98109, United States" office foundation 0.833000783214491 United States TRUE
+department of energy us Americas Northern America TRUE 48 2021-02-03 228853589 way "Department of Energy, 192, Visagie Street, Pretoria Central, Tshwane Ward 80, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0126, South Africa" office government 0.6004701084432 South Africa TRUE
+university of minnesota us Americas Northern America FALSE 48 2021-02-03 100997326 way "Bell Museum of Natural History, 10, Southeast Church Street, Minneapolis, Hennepin County, Minnesota, 55455, United States" tourism museum 0.523386683132434 United States TRUE
+columbia co Americas South America FALSE 48 2021-02-03 258355394 relation Colombia boundary administrative 0.779708646936571 Colombia TRUE
+ligo us Americas Northern America TRUE 47 2021-02-03 258170031 relation "Liège, Wallonie, 4000, België / Belgique / Belgien" boundary administrative 0.63660006822952 België / Belgique / Belgien TRUE
+parliament NONE NA NA TRUE 47 2021-02-03 127825361 way "Parliament, , Boe, Yaren, Naoero" office government 0.531052870313343 Naoero TRUE
+trump NONE NA NA TRUE 47 2021-02-03 445769 node "Trump, Baltimore County, Maryland, 21161, United States" place hamlet 0.375244632729739 United States TRUE
+australian national university au Oceania Australia and New Zealand FALSE 47 2021-02-03 158291441 way "Australian National University, Lawson Crescent, Acton, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia" amenity university 0.846355606540819 Australia TRUE
+university of maryland in college park us Americas Northern America FALSE 46 2021-02-03 198712103 way "University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States" amenity university 1.15966453785279 United States TRUE
+karolinska institute se Europe Northern Europe FALSE 46 2021-02-03 299960275 relation "Karolinska Institutet campus Flemingsberg, Hälsovägen, BRF. Grantorp, Visättra, Flemingsberg, Huddinge kommun, Stockholms län, 14157, Sverige" amenity university 0.679801406140393 Sverige TRUE
+guinea gn Africa Western Africa FALSE 46 2021-02-03 257301923 relation Guinée boundary administrative 0.674714358349369 Guinée TRUE
+broad institute of mit us Americas Northern America TRUE 45 2021-02-03 NA NA NA NA NA NA NA TRUE
+food and drug administration us Americas Northern America FALSE 45 2021-02-03 161684229 way "Food and Drug Administration, San Juan Antiguo, San Juan, Puerto Rico, United States" landuse industrial 0.6 United States TRUE
+pfizer us Americas Northern America TRUE 45 2021-02-03 258561463 relation "Pfizer, Trujui, Partido de Moreno, Buenos Aires, Argentina" boundary administrative 0.4 Argentina TRUE
+rutgers university us Americas Northern America FALSE 45 2021-02-03 153113578 way "Zimmerli Art Museum, 71, Hamilton Street, New Brunswick, Middlesex County, New Jersey, 08901-1248, United States" tourism museum 0.313940046679794 United States TRUE
+washington university us Americas Northern America FALSE 44 2021-02-03 35683102 node "Washington University, Institute for Public Health, 600, South Taylor Avenue, WashU, City of Saint Louis, Missouri, 63110, United States" office university 0.201 United States TRUE
+uganda ug Africa Eastern Africa FALSE 44 2021-02-03 257547928 relation Uganda boundary administrative 0.797020967844266 Uganda TRUE
+university of bristol gb Europe Northern Europe FALSE 44 2021-02-03 50251699 node "University of Bristol, Woodland Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS2, United Kingdom" tourism information 0.301 United Kingdom TRUE
+environmental protection agency us Americas Northern America FALSE 43 2021-02-03 118168847 way "Environmental Protection Agency, Veterans Memorial Drive, Florence, Boone County, Kentucky, 41042, United States" office government 0.301 United States TRUE
+utah us Americas Northern America FALSE 43 2021-02-03 257844025 relation "Utah, United States" boundary administrative 0.803765430740067 United States TRUE
+springer nature MULTI MULTI MULTI TRUE 43 2021-02-03 107703717 way "Springer Nature, The Warehouse Way, Northcote, KaipÄ<81>tiki, Auckland, 0627, New Zealand / Aotearoa" office company 0.201 New Zealand / Aotearoa TRUE
+drc cd Africa Middle Africa FALSE 43 2021-02-03 258410829 relation République démocratique du Congo boundary administrative 0.722405117667525 République démocratique du Congo TRUE
+ontario ca Americas Northern America FALSE 43 2021-02-03 258413471 relation "Ontario, Canada" boundary administrative 0.835597144214394 Canada TRUE
+cdc us Americas Northern America FALSE 42 2021-02-03 172987439 way "CDC, New Center, Detroit, Wayne County, Michigan, United States" landuse farmyard 0.3 United States TRUE
+us department of energy us Americas Northern America TRUE 42 2021-02-03 228853589 way "Department of Energy, 192, Visagie Street, Pretoria Central, Tshwane Ward 80, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0126, South Africa" office government 0.6004701084432 South Africa TRUE
+"university of california, santa cruz" us Americas Northern America FALSE 41 2021-02-03 75590962 node "University of California, Santa Cruz, Coolidge Drive, Santa Cruz, Santa Cruz County, California, 95064, United States" tourism information 0.501 United States TRUE
+nigeria ng Africa Western Africa FALSE 41 2021-02-03 258179403 relation Nigeria boundary administrative 0.837817167052956 Nigeria TRUE
+university of sheffield gb Europe Northern Europe FALSE 41 2021-02-03 258762437 relation "University of Sheffield, West Street, Saint George's, Sheffield, Yorkshire and the Humber, England, S1 4ET, United Kingdom" amenity university 0.816705192186971 United Kingdom TRUE
+mcgill university ca Americas Northern America FALSE 41 2021-02-03 93463053 way "McGill University, Avenue du Parc, Saint-Louis, Plateau Mont-Royal, Montréal, Agglomération de Montréal, Montréal (06), Québec, H2W 1S4, Canada" amenity university 0.201 Canada TRUE
+rhode island us Americas Northern America FALSE 40 2021-02-03 258435553 relation "Rhode Island, United States" boundary administrative 0.888026902639812 United States TRUE
+us senate us Americas Northern America FALSE 40 2021-02-03 367209 node "Senate, Jack County, Texas, United States" place hamlet 0.35 United States TRUE
+poland pl Europe Eastern Europe FALSE 40 2021-02-03 258357895 relation Polska boundary administrative 0.852585547719659 Polska TRUE
+british columbia ca Americas Northern America FALSE 40 2021-02-03 258447774 relation "British Columbia, Canada" boundary administrative 0.91215515233974 Canada TRUE
+university of british columbia ca Americas Northern America FALSE 40 2021-02-03 258186091 relation "University of British Columbia, Eagles Drive, Hawthorn Place, University of British Columbia, Electoral Area A, Metro Vancouver Regional District, British Columbia, V6T 1Z4, Canada" amenity university 0.962214165030468 Canada TRUE
+northwestern university us Americas Northern America FALSE 39 2021-02-03 258324584 relation "Northwestern University, 633, Clark Street, Downtown, Evanston, Evanston Township, Cook County, Illinois, 60208, United States" amenity university 0.78907157644275 United States TRUE
+"university of california, santa barbara" us Americas Northern America FALSE 39 2021-02-03 205319990 way "University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States" place locality 0.625 United States TRUE
+university of colorado us Americas Northern America FALSE 39 2021-02-03 167749471 way "University of Northern Colorado, 501, 20th Street, Jackson Field, Greeley, Weld County, Colorado, 80631, United States" amenity university 0.714405926306359 United States TRUE
+us department of agriculture us Americas Northern America FALSE 39 2021-02-03 48599253 node "US Department of Agriculture, Maine Avenue Southwest, Washington, District of Columbia, 20250, United States" office government 1.00973759439018 United States TRUE
+us national academies of sciences us Americas Northern America TRUE 39 2021-02-03 NA NA NA NA NA NA NA TRUE
+gm NONE NA NA TRUE 39 2021-02-03 258194808 relation Gambia boundary administrative 0.652242698231784 Gambia TRUE
+ireland ie Europe Northern Europe FALSE 39 2021-02-03 258361977 relation Éire / Ireland boundary administrative 0.873845787392843 Éire / Ireland TRUE
+university of east anglia gb Europe Northern Europe FALSE 39 2021-02-03 206300612 way "University of East Anglia, Wilberforce Road, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" amenity university 0.904172803149122 United Kingdom TRUE
+egypt eg Africa Northern Africa FALSE 39 2021-02-03 258188085 relation مصر boundary administrative 0.785163958233235 مصر TRUE
+university of copenhagen dk Europe Northern Europe FALSE 39 2021-02-03 97069646 way "Københavns Universitet, Nørregade, Vesterbro, København, Københavns Kommune, Region Hovedstaden, 1167, Danmark" amenity university 0.587152318095233 Danmark TRUE
+scripps institution of oceanography us Americas Northern America FALSE 38 2021-02-03 2864486 node "Scripps Institution of Oceanography, Kennel Way, San Diego, San Diego County, California, 92093, United States" amenity school 0.401 United States TRUE
+university of southern california us Americas Northern America FALSE 38 2021-02-03 128225751 way "University of Southern California, West Jefferson Boulevard, University Park, Los Angeles, Los Angeles County, California, 90089, United States" amenity university 1.01587616839984 United States TRUE
+pakistan pk Asia Southern Asia FALSE 38 2021-02-03 258223154 relation پاکستان boundary administrative 0.762909367264627 پاکستان TRUE
+peru pe Americas South America FALSE 38 2021-02-03 258422900 relation Perú boundary administrative 0.762405923925327 Perú TRUE
+american physical society us Americas Northern America TRUE 37 2021-02-03 NA NA NA NA NA NA NA TRUE
+broad institute us Americas Northern America FALSE 37 2021-02-03 97512477 way "Broad Institute, Charles Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02141, United States" building university 0.593012981942171 United States TRUE
+us national academy of sciences us Americas Northern America FALSE 37 2021-02-03 106787905 way "National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States" office ngo 1.00593943258948 United States TRUE
+supreme court NONE NA NA TRUE 37 2021-02-03 258928765 relation "Supreme Court, Tilak Marg, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India" amenity courthouse 0.700289443464696 India TRUE
+astrazeneca gb Europe Northern Europe TRUE 37 2021-02-03 205568985 way "AstraZeneca, Petite-Synthe, Dunkerque, Nord, Hauts-de-France, France métropolitaine, 59640, France" landuse industrial 0.3 France TRUE
+francis crick institute gb Europe Northern Europe FALSE 37 2021-02-03 121182065 way "The Francis Crick Institute, 1, Midland Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 1AT, United Kingdom" amenity research_institute 0.684723197268746 United Kingdom TRUE
+glaxosmithkline gb Europe Northern Europe FALSE 37 2021-02-03 153515967 way "GlaxoSmithKline, Elmbridge, Surrey, South East, England, KT13 0DE, United Kingdom" landuse commercial 0.3 United Kingdom TRUE
+university of glasgow gb Europe Northern Europe FALSE 37 2021-02-03 96372396 way "University of Glasgow, Byres Road, Yorkhill, Dowanhill, Glasgow, Glasgow City, Scotland, G12 8TD, United Kingdom" amenity university 0.862549854310082 United Kingdom TRUE
+iter fr Europe Western Europe FALSE 37 2021-02-03 115946244 way "ITER Platform, Saint-Paul-lès-Durance, Aix-en-Provence, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13115, France" natural sand 0.554322572212639 France TRUE
+american astronomical society us Americas Northern America TRUE 36 2021-02-03 NA NA NA NA NA NA NA TRUE
+ibm us Americas Northern America TRUE 36 2021-02-03 67786313 node "IBM, 11, ProtifaÅ¡istických bojovnÃkov, Stredné Mesto, KoÅ¡ice - mestská Ä<8d>asÅ¥ Staré Mesto, okres KoÅ¡ice I, KoÅ¡ice, KoÅ¡ický kraj, Východné Slovensko, 04291, Slovensko" office company 0.742881688686971 Slovensko TRUE
+indiana university us Americas Northern America FALSE 36 2021-02-03 125822977 way "William H. Mathers Museum of World Cultures, 601, East 8th Street, Bloomington, Monroe County, Indiana, 47408, United States" tourism museum 0.253150759043076 United States TRUE
+oklahoma us Americas Northern America FALSE 36 2021-02-03 258391951 relation "Oklahoma, United States" boundary administrative 0.814016195392348 United States TRUE
+oregon state university us Americas Northern America FALSE 36 2021-02-03 258801464 relation "Oregon State University, Northwest Van Buren Avenue, Corvallis, Benton County, Oregon, 97331, United States" amenity university 0.829529792748761 United States TRUE
+rockefeller university us Americas Northern America FALSE 36 2021-02-03 114891432 way "Rockefeller University, 1230, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity university 0.696458698335865 United States TRUE
+university of north carolina us Americas Northern America FALSE 36 2021-02-03 258459202 relation "University of North Carolina, South Columbia Street, Downtown, Chapel Hill, Orange County, North Carolina, 27516, United States" amenity university 0.982889212190386 United States TRUE
+university of texas us Americas Northern America FALSE 36 2021-02-03 175807465 way "Sam Rayburn Museum, West 5th Street, Bonham, Fannin County, Texas, 75418, United States" tourism museum 0.101 United States TRUE
+us national institute of allergy us Americas Northern America TRUE 36 2021-02-03 NA NA NA NA NA NA NA TRUE
+hungary hu Europe Eastern Europe FALSE 36 2021-02-03 257662998 relation Magyarország boundary administrative 0.808284595263048 Magyarország TRUE
+boston university us Americas Northern America FALSE 35 2021-02-03 258894158 relation "Boston University, Brighton Avenue, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134, United States" amenity university 0.782119069629869 United States TRUE
+merck us Americas Northern America TRUE 35 2021-02-03 218371594 way "Merck, ã<81>„ã‚<8f>ã<81><8d>市, ç¦<8f>島県, 日本" landuse industrial 0.3 日本 TRUE
+michigan us Americas Northern America FALSE 35 2021-02-03 258403790 relation "Michigan, United States" boundary administrative 0.837851453380433 United States TRUE
+university of texas at austin us Americas Northern America FALSE 35 2021-02-03 57760018 node "University of Texas at Austin, 2152, San Jacinto Boulevard, Eastwoods, Austin, Travis County, Texas, 78712, United States" amenity college 0.501 United States TRUE
+university of utah us Americas Northern America FALSE 35 2021-02-03 149037043 way "University of Utah, 201, Presidents Circle, Salt Lake City, Salt Lake County, Utah, 84112, United States" amenity university 0.845769418466942 United States TRUE
+urbana-champaign us Americas Northern America FALSE 35 2021-02-03 258133881 relation "Urbana, Champaign County, Illinois, United States" boundary administrative 0.737432720198099 United States TRUE
+international union for conservation of nature MULTI MULTI MULTI TRUE 35 2021-02-03 46296307 node "International Union for Conservation of Nature, ຮ່àºàº¡ 8, ສີບຸນເຮືàºàº‡, ວຽງຈັນ, ເມືàºàº‡àºˆàº±àº™àº—ະບູລີ, ນະຄàºàº™àº«àº¼àº§àº‡àº§àº½àº‡àºˆàº±àº™, 01009, ປະເທດລາວ" office ngo 0.601 ປະເທດລາວ TRUE
+japan aerospace exploration agency jp Asia Eastern Asia FALSE 35 2021-02-03 104684391 way "å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本" amenity research_institute 0.534103782224402 日本 TRUE
+alabama us Americas Northern America FALSE 34 2021-02-03 257215122 relation "Alabama, United States" boundary administrative 0.819961141220614 United States TRUE
+georgia institute of technology us Americas Northern America FALSE 34 2021-02-03 258761291 relation "Georgia Institute of Technology, West Peachtree Street Northwest, Atlanta, Fulton County, Georgia, 30309, United States" amenity university 0.951690746237686 United States TRUE
+world bank MULTI MULTI MULTI TRUE 34 2021-02-03 120702584 way "World Bank, Ward 180, Zone 13 Adyar, Chennai, Chennai District, Tamil Nadu, India" landuse commercial 0.617582068811379 India TRUE
+max planck institute for evolutionary anthropology de Europe Western Europe TRUE 34 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of alberta ca Americas Northern America FALSE 34 2021-02-03 259278235 relation "University of Alberta, 115 Street NW, University of Alberta Neighbourhood, Greater Strathcona, Edmonton, Edmonton (city), Alberta, T6G 0N1, Canada" amenity university 0.835188313007839 Canada TRUE
+lawrence berkeley national laboratory us Americas Northern America FALSE 33 2021-02-03 201093023 way "Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States" amenity research_institute 0.401 United States TRUE
+university of florida us Americas Northern America FALSE 33 2021-02-03 119795320 way "University of Florida, Southwest 20th Street, Idylwild, Gainesville, Alachua County, Florida, 32611, United States" amenity university 0.890538725277712 United States TRUE
+vanderbilt university us Americas Northern America FALSE 33 2021-02-03 119946667 way "Vanderbilt University, Belcourt Avenue, Hillsboro Village, Nashville-Davidson, Davidson County, Tennessee, 37212, United States" amenity university 0.75130624340886 United States TRUE
+european parliament MULTI Europe MULTI TRUE 33 2021-02-03 258825741 relation "Parlement européen - Europees Parlement, 60, Rue Wiertz - Wiertzstraat, Espace Léopold - Leopoldruimte, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1047, België / Belgique / Belgien" office government 0.676444237673387 België / Belgique / Belgien TRUE
+university of southampton gb Europe Northern Europe TRUE 33 2021-02-03 136568212 way "University of Southampton, 3, Persiaran Canselor 1, EduCity Iskandar Malaysia, Iskandar Puteri, Johor Bahru, Iskandar Malaysia, Johor, 79200, Malaysia" amenity university 0.301 Malaysia TRUE
+colombia co Americas South America FALSE 33 2021-02-03 258355394 relation Colombia boundary administrative 0.879708646936571 Colombia TRUE
+johns hopkins university applied physics laboratory us Americas Northern America TRUE 32 2021-02-03 NA NA NA NA NA NA NA TRUE
+microsoft us Americas Northern America TRUE 32 2021-02-03 64154406 node "Microsoft Development Center Norway, 2, Torggata, Hammersborg, St. Hanshaugen, Oslo, 0181, Norge" office company 0.485675067916633 Norge TRUE
+north carolina state university us Americas Northern America FALSE 32 2021-02-03 258870586 relation "North Carolina State University, Trinity Road, Westover, Raleigh, Wake County, North Carolina, 27607, United States" amenity university 0.639862222899095 United States TRUE
+university of hawaii us Americas Northern America FALSE 32 2021-02-03 158423062 way "University of Hawaiʻi, Lower Campus, Woodlawn Drive, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" amenity parking 0.301 United States TRUE
+tanzania tz Africa Eastern Africa FALSE 32 2021-02-03 257254156 relation Tanzania boundary administrative 0.806848122384939 Tanzania TRUE
+taiwan tw Asia Eastern Asia FALSE 32 2021-02-03 257930770 relation 臺ç<81>£ boundary administrative 0.749419791781313 臺ç<81>£ TRUE
+uppsala university se Europe Northern Europe TRUE 32 2021-02-03 NA NA NA NA NA NA NA TRUE
+hubble space telescope NONE NA NA FALSE 32 2021-02-03 NA NA NA NA NA NA NA TRUE
+iceland is Europe Northern Europe FALSE 32 2021-02-03 258407939 relation Ã<8d>sland boundary administrative 0.735687578250399 Ã<8d>sland TRUE
+iraq iq Asia Western Asia FALSE 32 2021-02-03 257951804 relation العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© boundary administrative 0.746511820604847 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© TRUE
+greece gr Europe Southern Europe FALSE 32 2021-02-03 258453061 relation Ελλάδα boundary administrative 0.798996101984371 Ελλάδα TRUE
+cnrs fr Europe Western Europe FALSE 32 2021-02-03 109776204 way "CNRS, 3, Rue Michel-Ange, Hameau Boileau, Quartier d'Auteuil, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" building college 0.651410616675756 France TRUE
+emory university us Americas Northern America FALSE 31 2021-02-03 104443074 way "Emory University, Healthgate Drive, Emory Highlands, Druid Hills, DeKalb County, Georgia, 30322, United States" amenity university 0.722006836447408 United States TRUE
+james webb space telescope us Americas Northern America TRUE 31 2021-02-03 NA NA NA NA NA NA NA TRUE
+ohio state university us Americas Northern America FALSE 31 2021-02-03 258076404 relation "The Ohio State University, Columbus, Franklin, Ohio, 43210, United States" amenity university 0.891055260053775 United States TRUE
+stony brook university us Americas Northern America FALSE 31 2021-02-03 104502319 way "Stony Brook University, 100, Nicolls Road, Suffolk County, New York, 11794, United States" amenity university 0.803198357564167 United States TRUE
+syria sy Asia Western Asia FALSE 31 2021-02-03 257279539 relation سوريا boundary administrative 0.752519619259582 سوريا TRUE
+sudan sd Africa Northern Africa FALSE 31 2021-02-03 258367505 relation السودان boundary administrative 0.696406722929938 السودان TRUE
+bp us Americas Northern America TRUE 30 2021-02-03 82642393 node "BP, Azalea Street, Lenasia South, Johannesburg Ward 120, City of Johannesburg Metropolitan Municipality, Gauteng, 1835, South Africa" amenity fuel 0.65852441040192 South Africa TRUE
+brown university us Americas Northern America FALSE 30 2021-02-03 101690172 way "Brown University, South Main Street, Fox Point, Providence, Providence County, Rhode Island, 02912, United States" amenity university 0.786479374942082 United States TRUE
+department of health and human services us Americas Northern America FALSE 30 2021-02-03 197997224 way "Department of Health and Human Services, 242, State Street, Augusta, Kennebec County, Maine, 04330, United States" building yes 0.601 United States TRUE
+jet propulsion laboratory us Americas Northern America FALSE 30 2021-02-03 178071948 way "Jet Propulsion Laboratory, 4800, Oak Grove Drive, Pasadena, Los Angeles County, California, 91109, United States" office research 0.997556545369086 United States TRUE
+european medicines agency MULTI Europe MULTI TRUE 30 2021-02-03 302037271 node "European Medicines Agency, 6, Domenico Scarlattilaan, Drentepark, Zuid, Amsterdam, Noord-Holland, Nederland, 1083HS, Nederland" office government 0.79651736792561 Nederland TRUE
+nature communications MULTI MULTI MULTI TRUE 30 2021-02-03 NA NA NA NA NA NA NA TRUE
+london school of hygiene and tropical medicine gb Europe Northern Europe FALSE 30 2021-02-03 185180502 way "London School of Hygiene and Tropical Medicine, Gower Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7HT, United Kingdom" amenity university 1.14105233650125 United Kingdom TRUE
+university of sussex gb Europe Northern Europe FALSE 30 2021-02-03 99822511 way "University of Sussex, East Street, Falmer, Lewes, East Sussex, South East, England, BN1 9PB, United Kingdom" amenity university 0.814277218171963 United Kingdom TRUE
+finland fi Europe Northern Europe FALSE 30 2021-02-03 257282877 relation Suomi / Finland boundary administrative 0.907327503568528 Suomi / Finland TRUE
+peking university cn Asia Eastern Asia FALSE 30 2021-02-03 259319792 relation "北京大å¦, 5å<8f>·, é¢<90>å’Œå›è·¯, 万柳地区, 海淀区, 北京市, 100871, ä¸å›½" amenity university 0.557740373274367 ä¸å›½ TRUE
+new brunswick ca Americas Northern America FALSE 30 2021-02-03 258084050 relation "New Brunswick / Nouveau-Brunswick, Canada" boundary administrative 0.83371652883794 Canada TRUE
+baylor college of medicine us Americas Northern America FALSE 29 2021-02-03 145245721 way "Baylor College of Medicine, 1, Baylor Plaza, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" building college 0.801517374360847 United States TRUE
+george washington university us Americas Northern America FALSE 29 2021-02-03 106978219 way "George Washington University, I Street Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States" amenity university 0.861031504404982 United States TRUE
+scripps research institute us Americas Northern America FALSE 29 2021-02-03 2879141 node "Scripps Research Institute, 10666, Coast Highway, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States" office research 0.301 United States TRUE
+university of maryland us Americas Northern America FALSE 29 2021-02-03 198712103 way "University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States" amenity university 0.859664537852789 United States TRUE
+federation of american societies for experimental biology us Americas Northern America TRUE 28 2021-02-03 NA NA NA NA NA NA NA TRUE
+new york times us Americas Northern America FALSE 28 2021-02-03 138755486 way "The New York Times, Woodbridge Avenue, Bonhamtown, Edison, Middlesex County, New Jersey, 08818, United States" building warehouse 0.301 United States TRUE
+stanford us Americas Northern America FALSE 28 2021-02-03 258528651 relation "Stanford, Palo Alto, Santa Clara County, California, United States" boundary census 0.627221804640549 United States TRUE
+thailand th Asia South-Eastern Asia FALSE 28 2021-02-03 258620831 relation ประเทศไทย boundary administrative 0.76262728915554 ประเทศไทย TRUE
+saudi arabia sa Asia Western Asia FALSE 28 2021-02-03 258074051 relation السعودية boundary administrative 0.735262517159872 السعودية TRUE
+philippines ph Asia South-Eastern Asia FALSE 28 2021-02-03 258179528 relation Philippines boundary administrative 0.869521465880606 Philippines TRUE
+doe NONE NA NA TRUE 28 2021-02-03 257680231 relation República Dominicana boundary administrative 0.708236599440443 República Dominicana TRUE
+natural history museum NONE NA NA TRUE 28 2021-02-03 94551563 way "Natural History Museum, Cromwell Road, Brompton, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW7 5BD, United Kingdom" tourism museum 0.901298316780421 United Kingdom TRUE
+leiden university nl Europe Western Europe FALSE 28 2021-02-03 259157980 relation "Universiteit Leiden, Einsteinweg, Leiden Bio Science Park, Leiden, Zuid-Holland, Nederland, 2333CE, Nederland" amenity university 0.688163620893378 Nederland TRUE
+weizmann institute of science il Asia Western Asia FALSE 28 2021-02-03 207850603 way "מכון ויצמן למדע, כרמל, ×<90>חוזות ×”× ×©×™×<90>, רחובות, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל" amenity university 0.482730278313856 ישר×<90>ל TRUE
+wellcome gb Europe Northern Europe TRUE 28 2021-02-03 11400763 node "æƒ åº· Wellcome, 40, 馬é 角é<81>“ Ma Tau Kok Road, é<9d> 背壟 Kau Pui Lung, 馬é åœ<8d> Ma Tau Wai, ä¹<9d>é¾<8d>城å<8d>€ Kowloon City District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" shop supermarket 0.101 ä¸å›½ TRUE
+university of sydney au Oceania Australia and New Zealand FALSE 28 2021-02-03 258428008 relation "The University of Sydney, Sparkes Street, Camperdown, Sydney, Council of the City of Sydney, New South Wales, 2006, Australia" amenity university 0.859671553892341 Australia TRUE
+georgetown university us Americas Northern America FALSE 27 2021-02-03 105725399 way "Georgetown University, 3700, O Street Northwest, Georgetown, Washington, District of Columbia, 20057, United States" amenity university 0.787586492717596 United States TRUE
+laser interferometer gravitational-wave observatory us Americas Northern America TRUE 27 2021-02-03 NA NA NA NA NA NA NA TRUE
+space telescope science institute us Americas Northern America FALSE 27 2021-02-03 52509642 node "Space Telescope Science Institute, 3700, San Martin Drive, Wyman Park, Baltimore, Maryland, 21218, United States" office administrative 0.401 United States TRUE
+white house office of science and technology policy us Americas Northern America TRUE 27 2021-02-03 NA NA NA NA NA NA NA TRUE
+campaign for science and engineering NONE NA NA FALSE 27 2021-02-03 NA NA NA NA NA NA NA TRUE
+european southern observatory MULTI Europe MULTI TRUE 27 2021-02-03 229063373 way "Europäische Südsternwarte, 2, Karl-Schwarzschild-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.001 Deutschland TRUE
+ames research center us Americas Northern America FALSE 26 2021-02-03 101560700 way "Ames Research Center, Santa Clara County, California, 94035-0016, United States" landuse industrial 0.767592905439716 United States TRUE
+maine us Americas Northern America FALSE 26 2021-02-03 257996253 relation "Maine, United States" boundary administrative 0.80496250046223 United States TRUE
+massachusetts general hospital us Americas Northern America FALSE 26 2021-02-03 117945499 way "Massachusetts General Hospital, 55, Fruit Street, Beacon Hill, Boston, Suffolk County, Massachusetts, 02114, United States" amenity hospital 0.76012624965149 United States TRUE
+michigan state university us Americas Northern America FALSE 26 2021-02-03 94305089 way "Michigan State University, Short Street, Bailey, East Lansing, Ingham County, Michigan, 48823, United States" amenity university 0.869602686432449 United States TRUE
+ukraine ua Europe Eastern Europe FALSE 26 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна TRUE
+kyoto university jp Asia Eastern Asia FALSE 26 2021-02-03 1318672 node "京都大å¦, æ<9d>±å¤§è·¯é€š;京都市é<81>“181å<8f>·äº¬éƒ½ç’°çŠ¶ç·š, è<81>–è·é™¢å±±çŽ‹ç”º, 左京区, 京都市, 京都府, 606-8391, 日本" amenity university 0.57959701929309 日本 TRUE
+amazon br Americas South America FALSE 26 2021-02-03 258080318 relation "Amazonas, Região Norte, Brasil" boundary administrative 0.700882727324139 Brasil TRUE
+university of new south wales au Oceania Australia and New Zealand FALSE 26 2021-02-03 102614348 way "University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia" amenity university 1.01490411729019 Australia TRUE
+iowa us Americas Northern America FALSE 25 2021-02-03 258149110 relation "Iowa, United States" boundary administrative 0.821883953901863 United States TRUE
+nevada us Americas Northern America FALSE 25 2021-02-03 258160832 relation "Nevada, United States" boundary administrative 0.808101044486331 United States TRUE
+purdue university us Americas Northern America FALSE 25 2021-02-03 107976847 way "Purdue University, South River Road, West Lafayette, Tippecanoe County, Indiana, 47907, United States" amenity university 0.759762689800642 United States TRUE
+spacex us Americas Northern America TRUE 25 2021-02-03 24857819 node "Spacex, 45, Preston Street, St Thomas, Exeter, Devon, South West England, England, EX1 1DF, United Kingdom" amenity arts_centre 0.258083983169266 United Kingdom TRUE
+king's college london gb Europe Northern Europe FALSE 25 2021-02-03 258760701 relation "King's College London, Strand Campus, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 2LS, United Kingdom" amenity university 0.967778517860205 United Kingdom TRUE
+scotland gb Europe Northern Europe FALSE 25 2021-02-03 257273413 relation "Scotland, United Kingdom" boundary administrative 0.878974525409939 United Kingdom TRUE
+novartis ch Europe Western Europe TRUE 25 2021-02-03 168483166 way "211, Novartis, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" landuse industrial 0.3 United States TRUE
+commonwealth scientific and industrial research organisation au Oceania Australia and New Zealand FALSE 25 2021-02-03 208662403 way "Commonwealth Scientific and Industrial Research Organisation (Floreat Site), 147, Underwood Avenue, Floreat, Town Of Cambridge, City of Nedlands, Western Australia, 6014, Australia" amenity research_institute 1.06308792913159 Australia TRUE
+monash university au Oceania Australia and New Zealand FALSE 25 2021-02-03 95076092 way "Monash University, Mile Lane, Parkville, City of Melbourne, Victoria, 3052, Australia" amenity university 0.449182950422608 Australia TRUE
+carnegie mellon university us Americas Northern America FALSE 24 2021-02-03 258357673 relation "Carnegie Mellon University, Warwick Terrace, Squirrel Hill North, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States" amenity university 0.861734322664205 United States TRUE
+us supreme court us Americas Northern America TRUE 24 2021-02-03 258928765 relation "Supreme Court, Tilak Marg, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India" amenity courthouse 0.700289443464696 India TRUE
+sierra leone sl Africa Western Africa FALSE 24 2021-02-03 257903966 relation Sierra Leone boundary administrative 0.866895719179607 Sierra Leone TRUE
+saturn NONE NA NA TRUE 24 2021-02-03 113007948 way "Saturn, 13, Berliner Straße, Senden, Landkreis Neu-Ulm, Bayern, 89250, Deutschland" shop electronics 0.496378365738396 Deutschland TRUE
+scopus NONE NA NA TRUE 24 2021-02-03 416620 node "Scopus, Bollinger County, Missouri, United States" place hamlet 0.35 United States TRUE
+intergovernmental panel on climate change MULTI MULTI MULTI TRUE 24 2021-02-03 NA NA NA NA NA NA NA TRUE
+madagascar mg Africa Eastern Africa FALSE 24 2021-02-03 258058840 relation Madagasikara boundary administrative 0.710032185300668 Madagasikara TRUE
+university of exeter gb Europe Northern Europe FALSE 24 2021-02-03 259019581 relation "University of Exeter, Blackboy Road, Newtown, Exeter, Devon, South West England, England, EX4 6TB, United Kingdom" amenity university 0.803356007669835 United Kingdom TRUE
+university of leicester gb Europe Northern Europe FALSE 24 2021-02-03 162085793 way "University of Leicester, University Road, Highfields, Leicester, City of Leicester, East Midlands, England, LE1 7RH, United Kingdom" amenity university 0.795552033321719 United Kingdom TRUE
+university of melbourne au Oceania Australia and New Zealand FALSE 24 2021-02-03 258899917 relation "University of Melbourne, Royal Parade, Parkville, City of Melbourne, Victoria, 3010, Australia" amenity university 0.849205724971094 Australia TRUE
+afghanistan af Asia Southern Asia FALSE 24 2021-02-03 258408076 relation اÙ<81>غانستان boundary administrative 0.747027482837314 اÙ<81>غانستان TRUE
+united arab emirates ae Asia Western Asia FALSE 24 2021-02-03 258427713 relation الإمارات العربية المتØدة boundary administrative 0.715277344543931 الإمارات العربية المتØدة TRUE
+mississippi us Americas Northern America FALSE 23 2021-02-03 258375642 relation "Mississippi, United States" boundary administrative 0.800391778545257 United States TRUE
+texas a&m university in college station us Americas Northern America FALSE 23 2021-02-03 259129741 relation "Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States" amenity university 1.25527727305854 United States TRUE
+university of virginia us Americas Northern America FALSE 23 2021-02-03 258891172 relation "University of Virginia, Albemarle County, Virginia, United States" amenity university 0.893364107518662 United States TRUE
+wisconsin us Americas Northern America FALSE 23 2021-02-03 257826400 relation "Wisconsin, United States" boundary administrative 0.830625593637679 United States TRUE
+morocco ma Africa Northern Africa FALSE 23 2021-02-03 258802367 relation Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب boundary administrative 0.781074717986943 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب TRUE
+korea kr Asia Eastern Asia FALSE 23 2021-02-03 258235947 relation ëŒ€í•œë¯¼êµ boundary administrative 0.802419592147396 ëŒ€í•œë¯¼êµ TRUE
+jaxa jp Asia Eastern Asia FALSE 23 2021-02-03 104684391 way "å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本" amenity research_institute 0.634103782224402 日本 TRUE
+jordan jo Asia Western Asia FALSE 23 2021-02-03 258022296 relation الأردن boundary administrative 0.716221771346838 الأردن TRUE
+ghana gh Africa Western Africa FALSE 23 2021-02-03 258409793 relation Ghana boundary administrative 0.812029140680526 Ghana TRUE
+newcastle university gb Europe Northern Europe FALSE 23 2021-02-03 129397314 way "Newcastle University, Queen Victoria Road, Haymarket, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE1 7RU, United Kingdom" amenity university 0.700454702492461 United Kingdom TRUE
+max planck society de Europe Western Europe TRUE 23 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of geneva ch Europe Western Europe FALSE 23 2021-02-03 79436448 node "Bioscope, Rue Michel Servet, Champel, Genève, 1206, Schweiz/Suisse/Svizzera/Svizra" tourism museum 0.001 Schweiz/Suisse/Svizzera/Svizra TRUE
+bangladesh bd Asia Southern Asia FALSE 23 2021-02-03 298155988 relation বাংলাদেশ boundary administrative 0.718005971623183 বাংলাদেশ TRUE
+university of queensland au Oceania Australia and New Zealand FALSE 23 2021-02-03 258259141 relation "The University of Queensland, Gladstone Road, St Lucia, Brisbane City, Queensland, 4072, Australia" amenity university 0.821330978816988 Australia TRUE
+university of cape town za Africa Southern Africa FALSE 22 2021-02-03 258385027 relation "University of Cape Town, Grotto Road, Rondebosch, Cape Town, City of Cape Town, Western Cape, 7700, South Africa" amenity university 0.902350677963883 South Africa TRUE
+vietnam vn Asia South-Eastern Asia FALSE 22 2021-02-03 258322044 relation Việt Nam boundary administrative 0.751194527333514 Việt Nam TRUE
+fermi national accelerator laboratory us Americas Northern America FALSE 22 2021-02-03 99059145 way "Fermi National Accelerator Laboratory, DuPage County, Illinois, United States" landuse industrial 0.863054296170656 United States TRUE
+harvard-smithsonian center for astrophysics us Americas Northern America TRUE 22 2021-02-03 NA NA NA NA NA NA NA TRUE
+memorial sloan kettering cancer center us Americas Northern America FALSE 22 2021-02-03 210339215 way "Memorial Sloan Kettering Cancer Center, 1275, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity hospital 0.894052338771708 United States TRUE
+new hampshire us Americas Northern America FALSE 22 2021-02-03 257734907 relation "New Hampshire, United States" boundary administrative 0.892788681067394 United States TRUE
+salk institute for biological studies us Americas Northern America TRUE 22 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of rochester us Americas Northern America FALSE 22 2021-02-03 114205376 way "Memorial Art Gallery, 500, University Avenue, East End, Rochester, Monroe County, New York, 14607, United States" tourism museum 0.53489332460211 United States TRUE
+us national cancer institute us Americas Northern America TRUE 22 2021-02-03 15618390 node "National Cancer Institute, شارع القصر العيني, Ù<81>م الخليج ودير النØاس, المنيل, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11241, مصر" amenity hospital 0.301 مصر TRUE
+republican NONE NA NA TRUE 22 2021-02-03 468223 node "Republican, Bertie County, North Carolina, United States" place hamlet 0.35 United States TRUE
+liberia lr Africa Western Africa FALSE 22 2021-02-03 257865924 relation Liberia boundary administrative 0.76493857339783 Liberia TRUE
+university of tokyo jp Asia Eastern Asia FALSE 22 2021-02-03 95061621 way "æ<9d>±äº¬å¤§å¦ æŸ<8f>ã‚ャンパス, å¦èž<8d>å<90>ˆã<81>®é<81>“, æŸ<8f>市, å<8d>ƒè‘‰çœŒ, 277-8583, 日本" amenity university 0.001 日本 TRUE
+university of nottingham gb Europe Northern Europe FALSE 22 2021-02-03 92101266 way "University of Nottingham, University Boulevard, Dunkirk, City of Nottingham, Nottinghamshire, East Midlands, England, NG7 2RD, United Kingdom" amenity university 0.828526304922465 United Kingdom TRUE
+tsinghua university cn Asia Eastern Asia FALSE 22 2021-02-03 259261903 relation "清å<8d>Žå¤§å¦, 30, å<8f>Œæ¸…è·¯, 五é<81>“å<8f>£, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100084, ä¸å›½" amenity university 0.540801021048672 ä¸å›½ TRUE
+centers for disease control and prevention us Americas Northern America FALSE 21 2021-02-03 96695743 way "Centers for Disease Control and Prevention Edward R. Roybal Campus, Clifton Heights Lane Northeast, Druid Hills, DeKalb County, Georgia, 1540, United States" office research 0.601 United States TRUE
+environmental defense fund us Americas Northern America TRUE 21 2021-02-03 NA NA NA NA NA NA NA TRUE
+montana us Americas Northern America FALSE 21 2021-02-03 258349675 relation "Montana, United States" boundary administrative 0.801736049923475 United States TRUE
+usa us Americas Northern America FALSE 21 2021-02-03 257984054 relation United States boundary administrative 0.935691367457589 United States TRUE
+rwanda rw Africa Eastern Africa FALSE 21 2021-02-03 257506373 relation Rwanda boundary administrative 0.766200826101714 Rwanda TRUE
+nepal np Asia Southern Asia FALSE 21 2021-02-03 298303229 relation नेपाल boundary administrative 0.709769815032436 नेपाल TRUE
+national research council NONE NA NA TRUE 21 2021-02-03 259257626 relation "1191, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, Canada" landuse commercial 0.71890455386909 Canada TRUE
+rosetta NONE NA NA TRUE 21 2021-02-03 6645175 node "رشيد, البØيرة, 22745, مصر" place town 0.433708896343545 مصر TRUE
+seoul national university kr Asia Eastern Asia FALSE 21 2021-02-03 3079877 node "서울대학êµ<90>, 서호ë<8f>™ë¡œ, ê¶Œì„ êµ¬, 수ì›<90>ì‹œ, 16614, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ TRUE
+north korea kp Asia Eastern Asia FALSE 21 2021-02-03 257555920 relation ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ boundary administrative 0.712625561293871 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ TRUE
+durham university gb Europe Northern Europe FALSE 21 2021-02-03 34350681 node "Palatine Reception, Palatine Centre, Stockton Road, City of Durham, Durham, County Durham, North East England, England, DH1 3LE, United Kingdom" tourism information 0.101 United Kingdom TRUE
+university of warwick gb Europe Northern Europe FALSE 21 2021-02-03 258669080 relation "University of Warwick, Evesham Walk, Cannon Park, Coventry, West Midlands Combined Authority, West Midlands, England, CV4 7DT, United Kingdom" amenity university 0.301 United Kingdom TRUE
+dfg de Europe Western Europe TRUE 21 2021-02-03 99534807 way "DFG Eingang Metzer Straße, Metzer Straße, Bellevue, Alt-Saarbrücken, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66117, Deutschland" amenity parking 0.101 Deutschland TRUE
+university of hong kong cn Asia Eastern Asia FALSE 21 2021-02-03 258613825 relation "é¦™æ¸¯å¤§å¸ The University of Hong Kong, åˆ—å ¤é “é<81>“ Lyttelton Road, 西å<8d>Šå±± Mid-Levels West, 西營盤 Sai Ying Pun, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity university 0.929678345929394 ä¸å›½ TRUE
+university of bern ch Europe Western Europe FALSE 21 2021-02-03 258566275 relation "Universität Bern, Falkenplatz, Länggasse, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.626372678886767 Schweiz/Suisse/Svizzera/Svizra TRUE
+brigham and women's hospital us Americas Northern America FALSE 20 2021-02-03 258770706 relation "Brigham and Women's Hospital, 75, Francis Street, Roxbury, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.87720861480317 United States TRUE
+hhs us Americas Northern America FALSE 20 2021-02-03 101633556 way "U.S. Department of Health and Human Services, Center Leg Freeway, Southwest Employment Area, Washington, District of Columbia, 20546, United States" office government 0.27381125651268 United States TRUE
+johns hopkins bloomberg school of public health us Americas Northern America FALSE 20 2021-02-03 258664201 relation "Johns Hopkins Bloomberg School of Public Health, McElderry Street, Butchers Hill, Baltimore, Maryland, 21205, United States" building yes 1.06277471441433 United States TRUE
+national center for atmospheric research us Americas Northern America FALSE 20 2021-02-03 47686315 node "NCAR Exhibits, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" tourism museum 0.501 United States TRUE
+usda us Americas Northern America FALSE 20 2021-02-03 257848060 relation "U.S. Department of Agriculture South Building, 12th Street Southwest, Southwest Employment Area, Washington, District of Columbia, 20013, United States" office government 0.609737594390182 United States TRUE
+world resources institute us Americas Northern America TRUE 20 2021-02-03 65742500 node "World Resources Institute, 83/1, Mühürdar Caddesi, Caferağa Mahallesi, Kadıköy, İstanbul, Marmara Bölgesi, 34710, Türkiye" office company 0.301 Türkiye TRUE
+new england journal of medicine NONE NA NA TRUE 20 2021-02-03 NA NA NA NA NA NA NA TRUE
+haiti ht Americas Caribbean FALSE 20 2021-02-03 257948040 relation Ayiti boundary administrative 0.689458681171941 Ayiti TRUE
+university of birmingham gb Europe Northern Europe FALSE 20 2021-02-03 70139772 node "University of Birmingham, Ring Road North, Bournbrook, Metchley, Birmingham, West Midlands Combined Authority, West Midlands, England, B15 2TN, United Kingdom" tourism information 0.301 United Kingdom TRUE
+wellcome trust sanger institute gb Europe Northern Europe FALSE 20 2021-02-03 259312934 relation "Wellcome Trust Sanger Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SA, United Kingdom" amenity research_institute 0.811524674526993 United Kingdom TRUE
+congo cg Africa Middle Africa FALSE 20 2021-02-03 257866268 relation Congo boundary administrative 0.767415764799089 Congo TRUE
+american chemical society us Americas Northern America TRUE 19 2021-02-03 NA NA NA NA NA NA NA TRUE
+case western reserve university us Americas Northern America FALSE 19 2021-02-03 259081536 relation "Case Western Reserve University, 10900, Euclid Avenue, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States" amenity university 0.914467419199317 United States TRUE
+genentech us Americas Northern America FALSE 19 2021-02-03 168391805 way "Genentech, 4625, Northeast Brookwood Parkway, Northeast Hillsboro, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, 97124, United States" building yes 0.101 United States TRUE
+georgia state university us Americas Northern America FALSE 19 2021-02-03 212195433 way "Georgia State University, 33, Gilmer Street Southeast, Five Points, Atlanta, Fulton County, Georgia, 30303, United States" amenity university 0.76661634303041 United States TRUE
+icahn school of medicine us Americas Northern America FALSE 19 2021-02-03 156253448 way "Icahn School of Medicine at Mount Sinai, 1184, 5th Avenue, Manhattan Community Board 11, Manhattan, New York County, New York, 10029, United States" building hospital 0.791742165798516 United States TRUE
+jpl us Americas Northern America FALSE 19 2021-02-03 178071948 way "Jet Propulsion Laboratory, 4800, Oak Grove Drive, Pasadena, Los Angeles County, California, 91109, United States" office research 0.697556545369086 United States TRUE
+national museum of natural history us Americas Northern America FALSE 19 2021-02-03 107528703 way "National Museum of Natural History, Smithsonian Pollinator Garden Path, Penn Quarter, Washington, District of Columbia, 20560, United States" tourism museum 0.992769930727232 United States TRUE
+the states us Americas Northern America FALSE 19 2021-02-03 257984054 relation United States boundary administrative 1.03569136745759 United States TRUE
+university of miami us Americas Northern America FALSE 19 2021-02-03 201200428 way "University of Miami, Fate Bridge, Coral Gables, Miami-Dade County, Florida, 33124, United States" amenity university 0.846468701525174 United States TRUE
+university of new mexico us Americas Northern America FALSE 19 2021-02-03 163763522 way "University of New Mexico, Las Lomas Road Northeast, Martinez Town, Albuquerque, Bernalillo County, New Mexico, 87102-2622, United States" amenity university 0.914482025763995 United States TRUE
+us department of health and human services us Americas Northern America FALSE 19 2021-02-03 176345296 way "Department of Health and Human Services, 221, State Street, Augusta, Kennebec County, Maine, 04330, United States" office government 0.701 United States TRUE
+portugal pt Europe Southern Europe FALSE 19 2021-02-03 257659868 relation Portugal boundary administrative 0.904004273464586 Portugal TRUE
+crispr NONE NA NA FALSE 19 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of leeds gb Europe Northern Europe FALSE 19 2021-02-03 107623156 way "University of Leeds, Woodhouse Lane, Woodhouse, Leeds, West Yorkshire, Yorkshire and the Humber, England, LS2 3ED, United Kingdom" amenity university 0.301 United Kingdom TRUE
+czech republic cz Europe Eastern Europe FALSE 19 2021-02-03 257259323 relation ÄŒesko boundary administrative 0.810148442865958 ÄŒesko TRUE
+fudan university cn Asia Eastern Asia FALSE 19 2021-02-03 258558662 relation "å¤<8d>旦大å¦, 220, 邯郸路, æ<9d>¨æµ¦åŒº, 200433, ä¸å›½" amenity university 0.510109744363923 ä¸å›½ TRUE
+alberta ca Americas Northern America FALSE 19 2021-02-03 257625587 relation "Alberta, Canada" boundary administrative 0.772431047420852 Canada TRUE
+university of são paulo br Americas South America FALSE 19 2021-02-03 258734158 relation "Cidade Universitária Armando de Salles Oliveira, Rua Francisco dos Santos, Butantã, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05587-050, Brasil" amenity university 0.743129165494252 Brasil TRUE
+aaas us Americas Northern America FALSE 18 2021-02-03 8123141 node "AAAS Art Gallery (public), 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" tourism artwork 0.101 United States TRUE
+kentucky us Americas Northern America FALSE 18 2021-02-03 257850228 relation "Kentucky, United States" boundary administrative 0.81140476114566 United States TRUE
+los alamos national laboratory us Americas Northern America FALSE 18 2021-02-03 259190746 relation "Los Alamos National Laboratory, Los Alamos, Los Alamos County, New Mexico, United States" boundary military 0.927683295435605 United States TRUE
+mayo clinic us Americas Northern America FALSE 18 2021-02-03 162861597 way "Mayo Clinic, Phoenix, Maricopa County, Arizona, 85054, United States" highway unclassified 0.3 United States TRUE
+monsanto us Americas Northern America FALSE 18 2021-02-03 336874 node "Monsanto, Contra Costa County, California, 94520, United States" place hamlet 0.457598476917669 United States TRUE
+university of georgia us Americas Northern America FALSE 18 2021-02-03 259130044 relation "University of Georgia, East Green Street, Athens-Clarke County Unified Government, Athens-Clarke County, Georgia, 30602, United States" amenity university 0.854309471737941 United States TRUE
+el niño NONE NA NA TRUE 18 2021-02-03 20287493 node "El Niño, Municipio de Tijuana, Baja California, 22254, México" place village 0.475 México TRUE
+nature geoscience NONE NA NA FALSE 18 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of amsterdam nl Europe Western Europe FALSE 18 2021-02-03 130755668 way "Amsterdam University College, Science Park, Oost, Amsterdam, Noord-Holland, Nederland, 1098 XG, Nederland" office educational_institution 0.458218474293395 Nederland TRUE
+association of american universities MULTI Americas Northern America TRUE 18 2021-02-03 NA NA NA NA NA NA NA TRUE
+iss MULTI MULTI MULTI TRUE 18 2021-02-03 127962809 way "ISS, Priorei, Eilpe/Dahl, Hagen, Nordrhein-Westfalen, 58091, Deutschland" landuse industrial 0.3 Deutschland TRUE
+cardiff university gb Europe Northern Europe FALSE 18 2021-02-03 226503456 way "Cardiff University, 5, The Parade, Tredegarville, Roath, Cardiff, Cymru / Wales, CF24 3AA, United Kingdom" building university 0.201 United Kingdom TRUE
+house of commons gb Europe Northern Europe FALSE 18 2021-02-03 201453802 way "House of Commons, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 0PW, United Kingdom" highway footway 0.375 United Kingdom TRUE
+thomson reuters gb Europe Northern Europe FALSE 18 2021-02-03 135775517 way "Thomson Reuters, 30, South Colonnade, Canary Wharf, Isle of Dogs, London Borough of Tower Hamlets, London, Greater London, England, E14 5EP, United Kingdom" building office 0.43181178765026 United Kingdom TRUE
+ucl gb Europe Northern Europe FALSE 18 2021-02-03 97008546 way "Petrie Museum of Egyptian Archeology, Malet Place, St Pancras, London Borough of Camden, London, Greater London, England, WC1E 6BT, United Kingdom" tourism museum 0.404546165234516 United Kingdom TRUE
+university of zurich ch Europe Western Europe FALSE 18 2021-02-03 114961958 way "Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.354152289914814 Schweiz/Suisse/Svizzera/Svizra TRUE
+university of montreal ca Americas Northern America FALSE 18 2021-02-03 113982632 way "Concordia University (SGW Campus), Rue Saint-Mathieu, Montagne, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3H 2P4, Canada" amenity university 0.592769930727231 Canada TRUE
+federal university of rio de janeiro br Americas South America FALSE 18 2021-02-03 NA NA NA NA NA NA NA TRUE
+american association for cancer research us Americas Northern America TRUE 17 2021-02-03 NA NA NA NA NA NA NA TRUE
+cms us Americas Northern America FALSE 17 2021-02-03 118801821 way "Centers for Medicare & Medicaid Services, Baltimore County, Maryland, United States" landuse commercial 0.384962546693336 United States TRUE
+howard hughes medical institute us Americas Northern America TRUE 17 2021-02-03 NA NA NA NA NA NA NA TRUE
+louisiana state university us Americas Northern America FALSE 17 2021-02-03 100338394 way "Louisiana State University, West Lakeshore Drive, College Town, Baton Rouge, East Baton Rouge Parish, Louisiana, 70802, United States" amenity university 0.850358843721885 United States TRUE
+us national institute of mental health us Americas Northern America TRUE 17 2021-02-03 140482817 way "Institute of Mental Health, Triumph Road, Wollaton Park, City of Nottingham, East Midlands, England, NG8 1FD, United Kingdom" building yes 0.401 United Kingdom TRUE
+us national research council us Americas Northern America TRUE 17 2021-02-03 259257626 relation "1191, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, Canada" landuse commercial 0.71890455386909 Canada TRUE
+usgs us Americas Northern America FALSE 17 2021-02-03 198081067 way "U.S. Geological Survey Great Lakes Science Center, Ann Arbor, Washtenaw County, Michigan, United States" landuse industrial 0.2 United States TRUE
+somalia so Africa Eastern Africa FALSE 17 2021-02-03 258390915 relation Soomaaliya الصومال boundary administrative 0.681239435622405 Soomaaliya الصومال TRUE
+cassini NONE NA NA TRUE 17 2021-02-03 3464485 node "Cassini, Barasso, Varese, Lombardia, 21025, Italia" place hamlet 0.35 Italia TRUE
+medical research council NONE NA NA TRUE 17 2021-02-03 69565154 node "Medical Research Council, South Bank Road, Basse Santa Su, Basse Fulladu East, Basse, Upper River, Gambia" amenity hospital 0.301 Gambia TRUE
+ministry of science and technology NONE NA NA TRUE 17 2021-02-03 144400913 way "משרד המדע ×•×”×˜×›× ×•×œ×•×’×™×”, ×”×<90>×•× ×™×‘×¨×¡×™×˜×” העברית, קרית ×ž× ×—×<9d> בגין, الشيخ جراØ, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" office government 0.001 ישר×<90>ל TRUE
+wildlife service NONE NA NA TRUE 17 2021-02-03 85634178 way "Wildlife, Choctaw County, Alabama, United States" highway residential 0.2 United States TRUE
+erc MULTI Europe MULTI TRUE 17 2021-02-03 73122812 node "ERCEA, 16, Place Charles Rogier - Karel Rogierplein, Saint-Josse-ten-Noode - Sint-Joost-ten-Node, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1210, België / Belgique / Belgien" office government 0.529911496965354 België / Belgique / Belgien TRUE
+world meteorological organization MULTI MULTI MULTI TRUE 17 2021-02-03 NA NA NA NA NA NA NA TRUE
+akatsuki jp Asia Eastern Asia FALSE 17 2021-02-03 46404960 node "æš<81>, 甲賀市, 滋賀県, 528-0012, 日本" place neighbourhood 0.25 日本 TRUE
+hokkaido university jp Asia Eastern Asia FALSE 17 2021-02-03 128417717 way "北海é<81>“大å¦, 環状通, 北14æ<9d>¡æ<9d>±7, æ<9d>±åŒº, æœå¹Œå¸‚, 石狩振興局, 北海é<81>“, 060-0808, 日本" amenity university 0.525438377157725 日本 TRUE
+gsk gb Europe Northern Europe TRUE 17 2021-02-03 226292997 way "GSK, Prangins, District de Nyon, Vaud, 1197, Schweiz/Suisse/Svizzera/Svizra" landuse industrial 0.3 Schweiz/Suisse/Svizzera/Svizra TRUE
+pasteur institute fr Europe Western Europe TRUE 17 2021-02-03 19127860 node "Institut Pasteur, Avenue de l'Indépendance, Bangî - Bangui, Ködörösêse tî Bêafrîka - République Centrafricaine" amenity hospital 0.101 Ködörösêse tî Bêafrîka - République Centrafricaine TRUE
+ecuador ec Americas South America FALSE 17 2021-02-03 258316020 relation Ecuador boundary administrative 0.839288603689881 Ecuador TRUE
+german aerospace center de Europe Western Europe FALSE 17 2021-02-03 258165325 relation "Deutsches Zentrum für Luft- und Raumfahrt, Grengel, Porz, Köln, Nordrhein-Westfalen, 51147, Deutschland" landuse industrial 0.419657429852984 Deutschland TRUE
+max planck institute for gravitational physics de Europe Western Europe FALSE 17 2021-02-03 96116691 way "Max-Planck-Institut für Gravitationsphysik, 1, Am Mühlenberg, Golm, Potsdam Nord, Potsdam, Brandenburg, 14476, Deutschland" office research 0.46851441835616 Deutschland TRUE
+cameroon cm Africa Middle Africa FALSE 17 2021-02-03 258195704 relation Cameroun boundary administrative 0.719266805257029 Cameroun TRUE
+queen's university ca Americas Northern America FALSE 17 2021-02-03 89031530 way "Queen's University, Stuart Street, University District, Kingston, Eastern Ontario, Ontario, K7L 3N6, Canada" amenity university 0.823019643336546 Canada TRUE
+australian academy of science au Oceania Australia and New Zealand FALSE 17 2021-02-03 143546668 way "Australian Academy of Science, Marcus Clarke Street, City, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia" amenity school 0.836617872091844 Australia TRUE
+fbi us Americas Northern America TRUE 16 2021-02-03 258367640 relation "Federacija Bosne i Hercegovine, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" boundary administrative 0.630855216331828 Bosna i Hercegovina / БоÑ<81>на и Херцеговина TRUE
+gates foundation us Americas Northern America FALSE 16 2021-02-03 177964409 way "Bill & Melinda Gates Foundation, 500, 5th Avenue North, Lower Queen Anne, Belltown, Seattle, King County, Washington, 98109, United States" office foundation 0.633000783214491 United States TRUE
+george mason university us Americas Northern America FALSE 16 2021-02-03 170416369 way "George Mason University, Cleveland Street, Maple Hills, Halemhurst, Fairfax, Fairfax (city), Virginia, 22030, United States" amenity university 0.804705676188448 United States TRUE
+national cancer institute us Americas Northern America TRUE 16 2021-02-03 15618390 node "National Cancer Institute, شارع القصر العيني, Ù<81>م الخليج ودير النØاس, المنيل, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11241, مصر" amenity hospital 0.301 مصر TRUE
+natural resources defense council us Americas Northern America FALSE 16 2021-02-03 48705927 node "Natural Resources Defense Council, 317, East Mendenhall Street, Bozeman, Gallatin County, Montana, 59715, United States" place house 0.401 United States TRUE
+planetary science institute us Americas Northern America TRUE 16 2021-02-03 NA NA NA NA NA NA NA TRUE
+south dakota us Americas Northern America FALSE 16 2021-02-03 258150382 relation "South Dakota, United States" boundary administrative 0.895271582116408 United States TRUE
+university of iowa us Americas Northern America FALSE 16 2021-02-03 258145487 relation "The University of Iowa, West Benton Street, Iowa City, Johnson County, Iowa, 52246, United States" amenity university 0.864487559394863 United States TRUE
+university of pittsburgh us Americas Northern America FALSE 16 2021-02-03 258622513 relation "University of Pittsburgh, Strip District, Pittsburgh, Allegheny County, Pennsylvania, United States" amenity university 0.870726964523873 United States TRUE
+west virginia us Americas Northern America FALSE 16 2021-02-03 257993887 relation "West Virginia, United States" boundary administrative 0.895386507122709 United States TRUE
+yale us Americas Northern America FALSE 16 2021-02-03 257391646 relation "Yale, Guthrie County, Iowa, United States" boundary administrative 0.531727684347105 United States TRUE
+senegal sn Africa Western Africa FALSE 16 2021-02-03 258367179 relation Sénégal boundary administrative 0.7011432334198 Sénégal TRUE
+utrecht university nl Europe Western Europe FALSE 16 2021-02-03 61984253 node "UU4U, Leuvenplein, Utrecht, Nederland, 3584LA, Nederland" tourism information 0.101 Nederland TRUE
+organisation for economic co-operation and development MULTI MULTI MULTI TRUE 16 2021-02-03 103637552 way "OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" office government 0.669924309656139 France TRUE
+kazakhstan kz Asia Central Asia FALSE 16 2021-02-03 258456913 relation ҚазақÑ<81>тан boundary administrative 0.762519577338093 ҚазақÑ<81>тан TRUE
+cambodia kh Asia South-Eastern Asia FALSE 16 2021-02-03 257250265 relation ព្រះរាជាណាចក្រ​កម្ពុជា boundary administrative 0.695583245164628 ព្រះរាជាណាចក្រ​កម្ពុជា TRUE
+university of milan it Europe Southern Europe TRUE 16 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان TRUE
+university of liverpool gb Europe Northern Europe FALSE 16 2021-02-03 139896766 way "University of Liverpool, Peach Street, Knowledge Quarter, Liverpool, North West England, England, L7, United Kingdom" amenity university 0.301 United Kingdom TRUE
+inserm fr Europe Western Europe FALSE 16 2021-02-03 109366785 way "Institut national de la santé et de la recherche médicale, 12, Avenue du Professeur Léon Bernard, Kennedy, Villejean, Villejean - Beauregard, Quartiers Nord-Ouest, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35000, France" building yes 0.412449177852278 France TRUE
+costa rica cr Americas Central America FALSE 16 2021-02-03 258402817 relation Costa Rica boundary administrative 0.916454807244672 Costa Rica TRUE
+zimbabwe zw Africa Eastern Africa FALSE 15 2021-02-03 257847347 relation Zimbabwe boundary administrative 0.797897126879187 Zimbabwe TRUE
+zambia zm Africa Eastern Africa FALSE 15 2021-02-03 257858630 relation Zambia boundary administrative 0.78492269201686 Zambia TRUE
+yemen ye Asia Western Asia FALSE 15 2021-02-03 258075923 relation اليمن boundary administrative 0.734163292678192 اليمن TRUE
+center for science and democracy us Americas Northern America TRUE 15 2021-02-03 NA NA NA NA NA NA NA TRUE
+dartmouth college us Americas Northern America FALSE 15 2021-02-03 236828980 way "Dartmouth College, River Road, Norwich, Windsor County, Vermont, 03755, United States" amenity college 0.769183253746589 United States TRUE
+delaware us Americas Northern America FALSE 15 2021-02-03 257993619 relation "Delaware, United States" boundary administrative 0.783550568235905 United States TRUE
+lawrence livermore national laboratory us Americas Northern America FALSE 15 2021-02-03 95865246 way "Lawrence Livermore National Laboratory, South Vasco Road, Livermore, Alameda County, California, 94550, United States" amenity science_park 0.893328255224182 United States TRUE
+melinda gates foundation us Americas Northern America FALSE 15 2021-02-03 177964409 way "Bill & Melinda Gates Foundation, 500, 5th Avenue North, Lower Queen Anne, Belltown, Seattle, King County, Washington, 98109, United States" office foundation 0.733000783214492 United States TRUE
+nist us Americas Northern America TRUE 15 2021-02-03 137975640 way "Ð<9d>иÑ<81>Ñ‚ÑŒ, ГайнÑ<81>кий муниципальный округ, ПермÑ<81>кий край, ПриволжÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" waterway river 0.275 РоÑ<81>Ñ<81>иÑ<8f> TRUE
+slac national accelerator laboratory us Americas Northern America FALSE 15 2021-02-03 299175282 way "Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States" amenity research_center 0.727082745074033 United States TRUE
+south carolina us Americas Northern America FALSE 15 2021-02-03 257325089 relation "South Carolina, United States" boundary administrative 0.90345926227768 United States TRUE
+state university of new york us Americas Northern America FALSE 15 2021-02-03 176996050 way "University at Albany, The State University of New York, Tricentenial Drive, Albany, Albany County, New York, 12203, United States" amenity university 0.941578907776644 United States TRUE
+union of concerned scientists us Americas Northern America TRUE 15 2021-02-03 NA NA NA NA NA NA NA TRUE
+weill cornell medical college us Americas Northern America FALSE 15 2021-02-03 2627269 node "Weill Cornell Medical College, 1300, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10128, United States" amenity university 0.773868796445932 United States TRUE
+wyoming us Americas Northern America FALSE 15 2021-02-03 257871658 relation "Wyoming, United States" boundary administrative 0.790706641027201 United States TRUE
+romania ro Europe Eastern Europe FALSE 15 2021-02-03 257807627 relation România boundary administrative 0.805346179828883 România TRUE
+society for neuroscience NONE NA NA FALSE 15 2021-02-03 NA NA NA NA NA NA NA TRUE
+namibia na NA NA FALSE 15 2021-02-03 258181441 relation Namibia boundary administrative 0.787423386363076 Namibia TRUE
+malaysia my Asia South-Eastern Asia FALSE 15 2021-02-03 258625503 relation Malaysia boundary administrative 0.867487508874317 Malaysia TRUE
+iucn MULTI MULTI MULTI TRUE 15 2021-02-03 197240496 way "IUCN, Rajapaksha Mawatha, TownHall, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity office 0.101 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை TRUE
+oecd MULTI MULTI MULTI TRUE 15 2021-02-03 103637552 way "OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" office government 0.669924309656139 France TRUE
+tel aviv university il Asia Western Asia FALSE 15 2021-02-03 37018800 node "תל ×<90>ביב ×<90>×•× ×™×‘×¨×¡×™×˜×”, ×<90>יילון דרו×<9d>, תל ×<90>ביב - יפו, ×<90>×•× ×™×‘×¨×¡×™×˜×ª ת""×<90>, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל" railway station 0.339805842395375 ישר×<90>ל TRUE
+bgi cn Asia Eastern Asia TRUE 15 2021-02-03 102608522 way "Grantley Adams International Airport, Tom Adams Highway, Charnocks, Fairy Valley, Christ Church, CHRIST CHURCH, Barbados" aeroway aerodrome 0.39332663350649 Barbados TRUE
+yunnan cn Asia Eastern Asia FALSE 15 2021-02-03 258085373 relation "云å<8d>—çœ<81>, ä¸å›½" boundary administrative 0.665684201955769 ä¸å›½ TRUE
+roche ch Europe Western Europe TRUE 15 2021-02-03 258342813 relation "Roche, La Tour-du-Pin, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38090, France" boundary administrative 0.632815701917223 France TRUE
+quebec ca Americas Northern America FALSE 15 2021-02-03 258336560 relation "Québec, Canada" boundary administrative 0.752720691937819 Canada TRUE
+university of vienna at Europe Western Europe FALSE 15 2021-02-03 258520179 relation "Universität Wien, 1, Universitätsring, Schottenviertel, Innere Stadt, Wien, 1010, Österreich" building university 0.282582546755277 Österreich TRUE
+university of pretoria za Africa Southern Africa FALSE 14 2021-02-03 162398262 way "Geography, Geoinformatics and Meteorology Building, Tukkie, Baileys Muckleneuk, Tshwane Ward 56, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0001, South Africa" building Campus 0.201 South Africa TRUE
+american society for microbiology us Americas Northern America TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+ct us Americas Northern America FALSE 14 2021-02-03 258171713 relation "Connecticut, United States" boundary administrative 0.818771933111505 United States TRUE
+dana-farber cancer institute us Americas Northern America FALSE 14 2021-02-03 145616376 way "Dana-Farber Cancer Institute, 450, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States" amenity hospital 0.71689306175332 United States TRUE
+goddard institute for space studies us Americas Northern America TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+idaho us Americas Northern America FALSE 14 2021-02-03 257490816 relation "Idaho, United States" boundary administrative 0.791516533107901 United States TRUE
+johnson & johnson us Americas Northern America TRUE 14 2021-02-03 120701063 way "Johnson & Johnson, Gemarkung Barmen, Wuppertal, Nordrhein-Westfalen, 42289, Deutschland" landuse industrial 0.4 Deutschland TRUE
+national institute of standards and technology us Americas Northern America FALSE 14 2021-02-03 103001988 way "National Institute of Standards and Technology, Montgomery County, Maryland, 20899, United States" landuse industrial 0.8 United States TRUE
+niaid us Americas Northern America TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+northeastern university us Americas Northern America FALSE 14 2021-02-03 163110509 way "Northeastern University, Ruggles Street, Roxbury Crossing, Roxbury, Boston, Suffolk County, Massachusetts, 02120, United States" amenity university 0.692915167891094 United States TRUE
+university of alabama us Americas Northern America FALSE 14 2021-02-03 110391765 way "University of Alabama, 9th Street, Tuscaloosa, Tuscaloosa County, Alabama, 35487, United States" amenity university 0.849900181888843 United States TRUE
+university of tennessee us Americas Northern America FALSE 14 2021-02-03 178444498 way "University of Tennessee, Alcoa Highway, Fort Sanders, Knoxville, Knox County, Tennessee, 37996, United States" amenity university 0.844319596061909 United States TRUE
+washington state university us Americas Northern America FALSE 14 2021-02-03 258940577 relation "Washington State University, Northeast Reaney Way, Pullman, Whitman County, Washington, 99164, United States" amenity university 0.81377697632841 United States TRUE
+conservative party NONE NA NA TRUE 14 2021-02-03 150193380 way "Conservative Party, Glenlea Road, Well Hall, Royal Borough of Greenwich, London, Greater London, England, SE9 1DZ, United Kingdom" office political 0.201 United Kingdom TRUE
+ministry of education NONE NA NA TRUE 14 2021-02-03 154002767 way "Ministry of Education, 33, Bowen Street, Wellington Central, Wellington, Wellington City, Wellington, 6140, New Zealand / Aotearoa" office government 0.715942243699873 New Zealand / Aotearoa TRUE
+national autonomous university of mexico mx Americas Central America FALSE 14 2021-02-03 96671012 way "Universidad Nacional Autónoma de México, Circuito Exterior, Ciudad Universitaria, Coyoacán, Ciudad de México, 04360, México" amenity university 0.562409087444079 México TRUE
+unesco MULTI MULTI MULTI TRUE 14 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 0.808162869304848 Palestinian Territory TRUE
+institute of physics gb Europe Northern Europe FALSE 14 2021-02-03 141162734 way "Institute of Physics, 76, Portland Place, Marylebone, City of Westminster, London, Greater London, England, W1B 1NT, United Kingdom" office ngo 0.721993534059618 United Kingdom TRUE
+oxford gb Europe Northern Europe TRUE 14 2021-02-03 468374 node "Oxford, Chester County, Pennsylvania, 19363, United States" place suburb 0.760604041060727 United States TRUE
+university of york gb Europe Northern Europe FALSE 14 2021-02-03 259581754 relation "University of York, Low Lane, Heslington, York, Yorkshire and the Humber, England, YO10 5DD, United Kingdom" amenity university 0.808489417863799 United Kingdom TRUE
+wellcome sanger institute gb Europe Northern Europe FALSE 14 2021-02-03 259312934 relation "Wellcome Trust Sanger Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SA, United Kingdom" amenity research_institute 0.711524674526993 United Kingdom TRUE
+ludwig maximilian university of munich de Europe Western Europe TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+max planck institute for the science of human history de Europe Western Europe TRUE 14 2021-02-03 NA NA NA NA NA NA NA TRUE
+southern university of science and technology cn Asia Eastern Asia FALSE 14 2021-02-03 193573154 way "å<8d>—方科技大å¦, 1088, å¦è‹‘大é<81>“, 深圳大å¦åŸŽ, 桃å›è¡—é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518055, ä¸å›½" amenity university 0.310439474412231 ä¸å›½ TRUE
+sun yat-sen university cn Asia Eastern Asia FALSE 14 2021-02-03 162813155 way "ä¸å±±å¤§å¦å<8d>—æ ¡åŒº, 135, 新港西路, 新港街é<81>“, æµ·ç<8f> 区, 广州市, 广东çœ<81>, 510275, ä¸å›½" amenity university 0.474754845855875 ä¸å›½ TRUE
+simon fraser university ca Americas Northern America FALSE 14 2021-02-03 113041662 way "Simon Fraser University, University Drive West, Burnaby, Metro Vancouver Regional District, British Columbia, V5A 4X6, Canada" amenity university 0.794772751234326 Canada TRUE
+university of ottawa ca Americas Northern America FALSE 14 2021-02-03 173311174 way "University of Ottawa, 75, Laurier Avenue East, Sandy Hill, Rideau-Vanier, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1N 6N5, Canada" amenity university 0.812764144652578 Canada TRUE
+bolivia bo Americas South America FALSE 14 2021-02-03 258419196 relation Bolivia boundary administrative 0.833354940927664 Bolivia TRUE
+csiro au Oceania Australia and New Zealand FALSE 14 2021-02-03 148535125 way "CSIRO, Mayfield West, Newcastle, Newcastle City Council, New South Wales, 2304, Australia" landuse industrial 0.3 Australia TRUE
+university of the witwatersrand za Africa Southern Africa FALSE 13 2021-02-03 95936135 way "University of the Witwatersrand, Empire Road, Parktown, Johannesburg Ward 87, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" amenity university 0.87569370880422 South Africa TRUE
+allen institute for brain science us Americas Northern America FALSE 13 2021-02-03 176152346 way "Allen Institute for Brain Science, 615, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office research 0.501 United States TRUE
+american museum of natural history us Americas Northern America FALSE 13 2021-02-03 181018011 way "American Museum of Natural History, 180, Central Park West, Upper West Side, Manhattan Community Board 7, Manhattan, New York County, New York, 10024, United States" tourism museum 1.04240928202528 United States TRUE
+amgen us Americas Northern America FALSE 13 2021-02-03 178550546 way "Amgen, Thousand Oaks, Ventura County, California, United States" landuse industrial 0.3 United States TRUE
+berkeley us Americas Northern America FALSE 13 2021-02-03 258426548 relation "Berkeley, Alameda County, California, United States" boundary administrative 0.704505510928137 United States TRUE
+boeing us Americas Northern America FALSE 13 2021-02-03 217291868 way "Boeing, Pasadena, Harris County, Texas, United States" landuse commercial 0.3 United States TRUE
+brookhaven national laboratory us Americas Northern America FALSE 13 2021-02-03 104653350 way "Brookhaven National Laboratory, Suffolk County, New York, United States" landuse commercial 0.5 United States TRUE
+caltech us Americas Northern America FALSE 13 2021-02-03 97237039 way "California Institute of Technology, East Del Mar Boulevard, Pasadena, Los Angeles County, California, 91106, United States" amenity university 0.58591368499579 United States TRUE
+fermilab us Americas Northern America FALSE 13 2021-02-03 99059145 way "Fermi National Accelerator Laboratory, DuPage County, Illinois, United States" landuse industrial 0.463054296170656 United States TRUE
+fred hutchinson cancer research center us Americas Northern America FALSE 13 2021-02-03 179513052 way "Fred Hutchinson Cancer Research Center, 1100, Fairview Avenue North, South Lake Union, Capitol Hill, Seattle, King County, Washington, 98109, United States" amenity research_institute 0.831005307834616 United States TRUE
+jackson laboratory us Americas Northern America FALSE 13 2021-02-03 100308447 way "The Jackson Laboratory, 600, Main Street, Bar Harbor, Hancock County, Maine, 04609, United States" amenity research_institute 0.201 United States TRUE
+rice university us Americas Northern America FALSE 13 2021-02-03 103588283 way "Rice University, Shakespeare Street, Houston, Harris County, Texas, 77030, United States" amenity university 0.734727351217308 United States TRUE
+university of missouri us Americas Northern America FALSE 13 2021-02-03 157228940 way "University of Missouri, Old 63 South, Columbia, Boone County, Missouri, 65201, United States" amenity university 0.856334584047093 United States TRUE
+university of notre dame us Americas Northern America FALSE 13 2021-02-03 148464630 way "University of Notre Dame du Lac, West Pokagon Street, North Shore Triangle, South Bend, Saint Joseph County, Indiana, 46556, United States" amenity university 0.970403619291787 United States TRUE
+university of texas md anderson cancer center us Americas Northern America FALSE 13 2021-02-03 103450497 way "University of Texas MD Anderson Cancer Center, 1515, Holcombe Boulevard, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity hospital 1.04319043229938 United States TRUE
+us agency for international development us Americas Northern America FALSE 13 2021-02-03 19295624 node "US Agency for International Development, 14th Street Northwest, Washington, District of Columbia, 20230, United States" office government 0.998819499208192 United States TRUE
+us congress us Americas Northern America FALSE 13 2021-02-03 257925515 relation "Congress, Maricopa County, Arizona, 85332, United States" boundary administrative 0.490444593674683 United States TRUE
+us department of justice us Americas Northern America TRUE 13 2021-02-03 258462661 relation "Department of Justice, Padre Faura Street, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" office government 0.772714057293031 Luzon TRUE
+us national institute of standards and technology us Americas Northern America FALSE 13 2021-02-03 103001988 way "National Institute of Standards and Technology, Montgomery County, Maryland, 20899, United States" landuse industrial 0.8 United States TRUE
+lund university se Europe Northern Europe TRUE 13 2021-02-03 141557155 way "Lund Building, University Drive, Duluth, Saint Louis County, Minnesota, 55812, United States" building yes 0.201 United States TRUE
+ph ph Asia South-Eastern Asia FALSE 13 2021-02-03 258179528 relation Philippines boundary administrative 0.869521465880606 Philippines TRUE
+panama pa Americas Central America FALSE 13 2021-02-03 257650546 relation Panamá boundary administrative 0.714187410132119 Panamá TRUE
+university of auckland nz Oceania Australia and New Zealand FALSE 13 2021-02-03 259348817 relation "University of Auckland, Ernest Davis Steps, Quay Park, Auckland Central, Auckland, WaitematÄ<81>, Auckland, 1053, New Zealand / Aotearoa" amenity university 0.808489417863799 New Zealand / Aotearoa TRUE
+embryology authority NONE NA NA FALSE 13 2021-02-03 NA NA NA NA NA NA NA TRUE
+nature publishing group NONE NA NA FALSE 13 2021-02-03 NA NA NA NA NA NA NA TRUE
+fao MULTI MULTI MULTI TRUE 13 2021-02-03 50992903 node "FAO, Viale Aventino, Municipio Roma I, Roma, Roma Capitale, Lazio, 00153, Italia" office government 0.503670690295642 Italia TRUE
+interacademy council MULTI MULTI MULTI TRUE 13 2021-02-03 NA NA NA NA NA NA NA TRUE
+international space station MULTI MULTI MULTI TRUE 13 2021-02-03 54535102 node "International Space Station, 1601, NASA Parkway, Houston, Harris County, Texas, 77058, United States" tourism attraction 0.301 United States TRUE
+wwf MULTI MULTI MULTI TRUE 13 2021-02-03 187819953 way "WWF, Juupajoki, Ylä-Pirkanmaan seutukunta, Pirkanmaa, Länsi- ja Sisä-Suomen aluehallintovirasto, Manner-Suomi, FIN-35500, Suomi / Finland" highway path 0.175 Suomi / Finland TRUE
+croatia hr Europe Southern Europe FALSE 13 2021-02-03 257878830 relation Hrvatska boundary administrative 0.783685743027873 Hrvatska TRUE
+potsdam institute for climate impact research de Europe Western Europe TRUE 13 2021-02-03 NA NA NA NA NA NA NA TRUE
+technical university of munich de Europe Western Europe FALSE 13 2021-02-03 161377183 way "Technische Universität München, Am Coulombwall, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity university 0.544238542262786 Deutschland TRUE
+university of tübingen de Europe Western Europe FALSE 13 2021-02-03 155721520 way "Klimagarten der Universität Tübingen, Sand, Lustnau, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland" leisure park 0.25 Deutschland TRUE
+cuba cu Americas Caribbean FALSE 13 2021-02-03 258428385 relation Cuba boundary administrative 0.844839051690795 Cuba TRUE
+dalhousie university ca Americas Northern America FALSE 13 2021-02-03 52245694 node "Faculty of Computer Science, Dalhousie University, 6050, University Avenue, Marlborough Woods, Halifax, Halifax Regional Municipality, Halifax County, Nova Scotia, B3H 4R2, Canada" amenity university 0.411644870826829 Canada TRUE
+university of waterloo ca Americas Northern America FALSE 13 2021-02-03 259427430 relation "University of Waterloo, Wilmot, Region of Waterloo, Southwestern Ontario, Ontario, Canada" amenity university 0.804103708523755 Canada TRUE
+university of adelaide au Oceania Australia and New Zealand FALSE 13 2021-02-03 113745459 way "University of Adelaide, North Terrace, Adelaide, Adelaide City Council, South Australia, 5005, Australia" amenity university 0.79940049921715 Australia TRUE
+university of tasmania au Oceania Australia and New Zealand FALSE 13 2021-02-03 95796124 way "University of Tasmania, Alexander Street, Sandy Bay, Hobart, City of Hobart, Tasmania, 7005, Australia" amenity university 0.758734778928549 Australia TRUE
+advanced laser interferometer gravitational-wave observatory us Americas Northern America TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+apple us Americas Northern America FALSE 12 2021-02-03 22363154 node "Apple Store, 815, Boylston Street, Block F, Back Bay, Boston, Suffolk County, Massachusetts, 02116, United States" shop electronics 0.760382661059545 United States TRUE
+argonne national laboratory us Americas Northern America FALSE 12 2021-02-03 84941288 way "Argonne National Laboratory, DuPage County, Illinois, United States" landuse industrial 0.756680175360968 United States TRUE
+carnegie institution for science us Americas Northern America TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+cold spring harbor laboratory us Americas Northern America FALSE 12 2021-02-03 217475644 way "Cold Spring Harbor Laboratory, Moores Hill Road, Laurel Hollow, Oyster Bay, Nassau County, New York, 11724, United States" amenity university 0.401 United States TRUE
+colorado state university us Americas Northern America FALSE 12 2021-02-03 259127396 relation "Colorado State University, Spring Park Drive, Fort Collins, Larimer County, Colorado, 80525-1424, United States" amenity university 0.794853132594755 United States TRUE
+illumina us Americas Northern America FALSE 12 2021-02-03 105132630 way "Illumina, San Diego, San Diego County, California, United States" landuse commercial 0.3 United States TRUE
+j. craig venter institute us Americas Northern America FALSE 12 2021-02-03 183799690 way "J. Craig Venter Institute, Capricorn Lane, San Diego, San Diego County, California, 92093, United States" building university 0.401 United States TRUE
+johns hopkins us Americas Northern America FALSE 12 2021-02-03 70591573 node "John's Hopkins, 2112, Dundalk Avenue, Norwood Park, Dundalk, Baltimore County, Maryland, 21222:21224, United States" amenity doctors 0.101 United States TRUE
+nebraska us Americas Northern America FALSE 12 2021-02-03 257963338 relation "Nebraska, United States" boundary administrative 0.799657112825905 United States TRUE
+oregon health and science university us Americas Northern America FALSE 12 2021-02-03 258885522 relation "Oregon Health & Science University, Robert Hugh Baldock Freeway, South Portland, Portland, Metro, Oregon, 97258, United States" amenity university 0.876527586886318 United States TRUE
+smithsonian center for astrophysics us Americas Northern America TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+southern methodist university us Americas Northern America FALSE 12 2021-02-03 97835046 way "Southern Methodist University, 6425, Dyer Street, University Park, Dallas County, Texas, 75205, United States" amenity university 0.818001590349159 United States TRUE
+university of south florida us Americas Northern America FALSE 12 2021-02-03 98932241 way "University of South Florida, USF Pine Drive, Tampa, Hillsborough County, Florida, 33612, United States" amenity university 0.401 United States TRUE
+university of texas southwestern medical center us Americas Northern America FALSE 12 2021-02-03 207040692 way "University of Texas Southwestern Medical Center, 5323, Harry Hines Boulevard, Dallas, TX, Dallas, Dallas County, Texas, 75390, United States" amenity university 0.942002873412564 United States TRUE
+us air force us Americas Northern America FALSE 12 2021-02-03 226151743 way "US Air Force, East Steamboat Avenue, Aurora, Arapahoe County, Colorado, 80017, United States" tourism camp_site 0.301 United States TRUE
+woods hole oceanographic institution us Americas Northern America FALSE 12 2021-02-03 189684904 way "Woods Hole Oceanographic Institution, Water Street, Woods Hole, Falmouth, Barnstable County, Massachusetts, 02543, United States" amenity university 0.401 United States TRUE
+chad td Africa Middle Africa FALSE 12 2021-02-03 258517069 relation Tchad تشاد boundary administrative 0.762462283081021 Tchad تشاد TRUE
+papua new guinea pg Oceania Melanesia FALSE 12 2021-02-03 258241053 relation Papua Niugini boundary administrative 0.788329503761047 Papua Niugini TRUE
+department of science and technology NONE NA NA TRUE 12 2021-02-03 99532466 way "Department of Science and Technology, Taguig, Fourth District, Metro Manila, Luzon" landuse commercial 0.862603275084388 Luzon TRUE
+harvard t. h. chan school of public health NONE NA NA FALSE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+higher education funding council NONE NA NA FALSE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+mrc NONE NA NA TRUE 12 2021-02-03 258982901 relation "Kiamika, Antoine-Labelle, Laurentides, Québec, Canada" boundary administrative 0.429332784738109 Canada TRUE
+university of oslo no Europe Northern Europe FALSE 12 2021-02-03 259041314 relation "Universitetet i Oslo, Behrens’ gate, Briskeby, Frogner, Oslo, 0257, Norge" amenity university 0.687044419782976 Norge TRUE
+radboud university nl Europe Western Europe FALSE 12 2021-02-03 85314411 way "Radboud Universiteit, Erasmuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525 EX, Nederland" amenity university 0.552553099500867 Nederland TRUE
+european food safety authority MULTI Europe MULTI TRUE 12 2021-02-03 258983516 relation "EFSA, 1A, Via Carlo Magno, Cornocchio, Pablo, Parma, Emilia-Romagna, 43126, Italia" office government 0.45558864174307 Italia TRUE
+european university association MULTI Europe MULTI TRUE 12 2021-02-03 113874154 way "European University Association, 24, Avenue de l'Yser - Ijzerlaan, Etterbeek, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1040, België / Belgique / Belgien" building yes 0.301 België / Belgique / Belgien TRUE
+united nations environment programme MULTI MULTI MULTI TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+luxembourg lu Europe Western Europe FALSE 12 2021-02-03 258680582 relation Lëtzebuerg boundary administrative 0.72827867579404 Lëtzebuerg TRUE
+riken jp Asia Eastern Asia TRUE 12 2021-02-03 5691099 node "Riken, Murgenthal, Bezirk Zofingen, Aargau, 4853, Schweiz/Suisse/Svizzera/Svizra" place village 0.375 Schweiz/Suisse/Svizzera/Svizra TRUE
+hebrew university of jerusalem il Asia Western Asia FALSE 12 2021-02-03 6058012 node "×”×<90>×•× ×™×‘×¨×¡×™×˜×” העברית בירושלי×<9d>, Reagan Plaza, הר הצופי×<9d>, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" amenity university 0.001 ישר×<90>ל TRUE
+eli lilly gb Europe Northern Europe FALSE 12 2021-02-03 225577556 way "Eli Lilly, Windlesham, Surrey Heath, Surrey, South East, England, GU20 6PH, United Kingdom" landuse commercial 0.4 United Kingdom TRUE
+house of lords gb Europe Northern Europe FALSE 12 2021-02-03 6178647 node "House of Lords, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 0AA, United Kingdom" tourism attraction 0.915610657194478 United Kingdom TRUE
+met office gb Europe Northern Europe FALSE 12 2021-02-03 259459361 relation "The Met Office, Fitzroy Road, Met Office, Monkerton, Exeter, Devon, South West England, England, EX1 3PB, United Kingdom" office weather 0.660932371570306 United Kingdom TRUE
+uk research and innovation gb Europe Northern Europe TRUE 12 2021-02-03 NA NA NA NA NA NA NA TRUE
+university of bath gb Europe Northern Europe FALSE 12 2021-02-03 173079366 way "University of Bath, All Saints Place, Claverton Down, Bath, Bath and North East Somerset, South West England, England, BA2 6DU, United Kingdom" amenity university 0.782140725159681 United Kingdom TRUE
+university of portsmouth gb Europe Northern Europe FALSE 12 2021-02-03 4318922 node "University, Cambridge Road, Old Portsmouth, Portsmouth, South East, England, PO1 2HB, United Kingdom" highway bus_stop 0.201 United Kingdom TRUE
+university of reading gb Europe Northern Europe FALSE 12 2021-02-03 54678990 node "The Ure Museum of Greek Archaeology, Queen's Drive, Lower Earley, Earley, Reading, Wokingham, South East, England, RG6 6DN, United Kingdom" tourism museum 0.43859140675544 United Kingdom TRUE
+university of montpellier fr Europe Western Europe FALSE 12 2021-02-03 17861839 node "Institut Musicothérapie, 11, Rue Saint-Louis, Les Arceaux, Centre, Montpellier, Hérault, Occitanie, France métropolitaine, 34967, France" amenity university 0.101 France TRUE
+max planck institute for solar system research de Europe Western Europe FALSE 12 2021-02-03 153463565 way "Max-Planck-Institut für Sonnensystemforschung, 3, Justus-von-Liebig-Weg, Weende, Weende / Deppoldshausen, Göttingen, Landkreis Göttingen, Niedersachsen, 37077, Deutschland" amenity university 0.401 Deutschland TRUE
+university of heidelberg de Europe Western Europe FALSE 12 2021-02-03 6159717 node "SRH Hochschule, 6, Ludwig-Guttmann-Straße, Wieblingen, Heidelberg, Baden-Württemberg, 69123, Deutschland" amenity university 0.414317004425986 Deutschland TRUE
+american astronomical society's division for planetary sciences us Americas Northern America TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+american society for biochemistry and molecular biology us Americas Northern America TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+arecibo observatory us Americas Northern America FALSE 11 2021-02-03 184420154 way "Arecibo Observatory, Carretera al Observatorio de Arecibo, Cienaga, Esperanza, Arecibo, Puerto Rico, United States" building yes 0.201 United States TRUE
+cornell us Americas Northern America FALSE 11 2021-02-03 257370146 relation "Cornell, Livingston County, Illinois, United States" boundary administrative 0.526110221552319 United States TRUE
+lunar and planetary institute us Americas Northern America FALSE 11 2021-02-03 2467172 node "Lunar and Planetary Institute Rice University, West Oaks Drive, Pasadena, Harris County, Texas, 77058, United States" amenity school 0.401 United States TRUE
+national academies us Americas Northern America FALSE 11 2021-02-03 158007717 way "Bergen County Academies, NJ 4, Hackensack, Bergen County, New Jersey, 07646:07666, United States" amenity school 0.451332014915526 United States TRUE
+oregon health & science university us Americas Northern America FALSE 11 2021-02-03 258885522 relation "Oregon Health & Science University, Robert Hugh Baldock Freeway, South Portland, Portland, Metro, Oregon, 97258, United States" amenity university 0.776527586886318 United States TRUE
+sangamo biosciences us Americas Northern America TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+smithsonian institution us Americas Northern America FALSE 11 2021-02-03 107528703 way "National Museum of Natural History, Smithsonian Pollinator Garden Path, Penn Quarter, Washington, District of Columbia, 20560, United States" tourism museum 0.592769930727231 United States TRUE
+tufts university us Americas Northern America FALSE 11 2021-02-03 258528054 relation "Tufts University, Whitman Street, West Somerville, Somerville, Middlesex County, Massachusetts, 02144, United States" amenity university 0.726756832210693 United States TRUE
+u.s. us Americas Northern America FALSE 11 2021-02-03 158313324 way "U.S., State Highway 55, Sunny Waters, Town of Wolf River, Langlade County, Wisconsin, 54462, United States" amenity fuel 0.201 United States TRUE
+ucla us Americas Northern America FALSE 11 2021-02-03 179950382 way "UCLA, Marina del Rey, Los Angeles County, California, United States" highway pedestrian 0.2 United States TRUE
+ucsf us Americas Northern America FALSE 11 2021-02-03 99733448 way "University of California, San Francisco, Irving Street, Inner Sunset, San Francisco, San Francisco City and County, California, 94122, United States" amenity university 0.479827038246968 United States TRUE
+university of new hampshire us Americas Northern America FALSE 11 2021-02-03 97073744 way "University of New Hampshire, Main Street, Durham, Strafford County, New Hampshire, 03824, United States" amenity university 0.874977044922586 United States TRUE
+university of oklahoma us Americas Northern America FALSE 11 2021-02-03 181607166 way "University of Oklahoma, 660, Parrington Oval, Norman, Cleveland County, Oklahoma, 73019, United States" amenity university 0.906565448656976 United States TRUE
+university of oregon us Americas Northern America FALSE 11 2021-02-03 258754869 relation "University of Oregon, Emerald Express, Eugene, Lane County, Oregon, 97403-5274, United States" amenity university 0.858937574127135 United States TRUE
+university of texas medical branch us Americas Northern America TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+us fish and wildlife service us Americas Northern America FALSE 11 2021-02-03 166257913 way "US Fish and Wildlife Service, Linn County, Oregon, United States" landuse commercial 0.7 United States TRUE
+west virginia university us Americas Northern America FALSE 11 2021-02-03 203052022 way "George Washington University - Virginia Science and Technology Campus, Broad Run Drive, Broad Run Farms, Loudoun County, Virginia, 20165, United States" amenity university 0.521409003314806 United States TRUE
+uae ua Europe Eastern Europe FALSE 11 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна TRUE
+royal swedish academy of sciences se Europe Northern Europe TRUE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+russian academy of sciences ru Europe Eastern Europe FALSE 11 2021-02-03 96980816 way "ЗоологичеÑ<81>кий музей ЗоологичеÑ<81>кого инÑ<81>титута Ð Ð<90>Ð<9d>, 1-3, УниверÑ<81>итетÑ<81>каÑ<8f> набережнаÑ<8f>, округ â„– 7, Санкт-Петербург, Северо-Западный федеральный округ, 199034, РоÑ<81>Ñ<81>иÑ<8f>" tourism museum 0.343425222676179 РоÑ<81>Ñ<81>иÑ<8f> TRUE
+university of otago nz Oceania Australia and New Zealand FALSE 11 2021-02-03 258279984 relation "University of Otago, Ward Street Overbridge, North Dunedin, Dunedin, Dunedin City, Otago, 9016, New Zealand / Aotearoa" amenity university 0.784012568793374 New Zealand / Aotearoa TRUE
+aps NONE NA NA TRUE 11 2021-02-03 258139810 relation "Alba-la-Romaine, Privas, Ardèche, Auvergne-Rhône-Alpes, France métropolitaine, 07400, France" boundary administrative 0.504276300065756 France TRUE
+cmb NONE NA NA TRUE 11 2021-02-03 259551000 relation "Lomé, Togo" boundary administrative 0.540313125234513 Togo TRUE
+department of justice NONE NA NA TRUE 11 2021-02-03 258462661 relation "Department of Justice, Padre Faura Street, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" office government 0.672714057293031 Luzon TRUE
+geophysical research letters NONE NA NA FALSE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+human genome project NONE NA NA FALSE 11 2021-02-03 NA NA NA NA NA NA NA TRUE
+open university NONE NA NA TRUE 11 2021-02-03 107644861 way "×”×<90>×•× ×™×‘×¨×¡×™×˜×” הפתוחה, החורש, Kiryat Golomb, Kiryat Etgarim, ×¨×¢× × ×”, × ×¤×ª פתח תקווה, מחוז המרכז, no, ישר×<90>ל" amenity university 0.467686595449203 ישר×<90>ל TRUE
+orion NONE NA NA TRUE 11 2021-02-03 258678145 relation "Orion, Oloron-Sainte-Marie, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64390, France" boundary administrative 0.652704511977299 France TRUE
+public library of science NONE NA NA TRUE 11 2021-02-03 117746945 way "Science, Victoria Road, London Borough of Hillingdon, London, Greater London, England, HA4 0JE, United Kingdom" building yes 0.201 United Kingdom TRUE
+university NONE NA NA TRUE 11 2021-02-03 115937498 way "University College, Logic Lane, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4EX, United Kingdom" amenity university 0.583844730994415 United Kingdom TRUE
+international astronomical union MULTI MULTI MULTI TRUE 11 2021-02-03 80025084 node "International Astronomical Union, 98 bis, Boulevard Arago, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" office company 0.928915221808463 France TRUE
+syngenta MULTI MULTI MULTI TRUE 11 2021-02-03 101933385 way "Syngenta, Aigues-Vives, Nîmes, Gard, Occitanie, France métropolitaine, 30670, France" landuse industrial 0.3 France TRUE
+mongolia mn Asia Eastern Asia FALSE 11 2021-02-03 258374991 relation Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° boundary administrative 0.712716402748512 Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° TRUE
+mali ml Africa Western Africa FALSE 11 2021-02-03 258390630 relation Mali boundary administrative 0.790781088929414 Mali TRUE
+university of padua it Europe Southern Europe FALSE 11 2021-02-03 5420036 node "Aula studio ""Jappelli"", Via Giuseppe Jappelli, Forcellini, Padova, Veneto, 35121, Italia" amenity university 0.001 Italia TRUE
+indian institute of science in Asia Southern Asia FALSE 11 2021-02-03 259230417 relation "Indian Institute of Science, CV Raman Road, Malleswaram, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India" amenity university 0.860020321697533 India TRUE
+indian space research organisation in Asia Southern Asia FALSE 11 2021-02-03 102303066 way "Indian Space Research Organisation - ISRO Vijinapura Campus, 1st Main Road, Dollar Colony, Raj Mahal Vilas, East Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560094, India" office government 0.922406253415619 India TRUE
+isro in Asia Southern Asia FALSE 11 2021-02-03 236288936 way "ISRO, Thiruvananthapuram, Kerala, India" landuse industrial 0.3 India TRUE
+athena gr Europe Southern Europe FALSE 11 2021-02-03 298973026 node "Αθήνα, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 10667, Ελλάδα" place city 0.732722808213196 Ελλάδα TRUE
+university of london gb Europe Northern Europe FALSE 11 2021-02-03 59535451 node "University of London, Thornhaugh Street, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1H 0XG, United Kingdom" tourism information 0.301 United Kingdom TRUE
+university of st andrews gb Europe Northern Europe FALSE 11 2021-02-03 44520497 node "University of St Andrews, North Street, St Andrews, Fife, Scotland, KY16 9AJ, United Kingdom" amenity university 0.967907552390845 United Kingdom TRUE
+algeria dz Africa Northern Africa FALSE 11 2021-02-03 258028956 relation Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر boundary administrative 0.758319025069823 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر TRUE
+max planck institute for chemistry de Europe Western Europe FALSE 11 2021-02-03 258507046 relation "Max-Planck-Institut für Chemie, 1, Hahn-Meitner-Weg, Oberstadt, Mainz, Rheinland-Pfalz, 55128, Deutschland" building university 0.201 Deutschland TRUE
+guangdong cn Asia Eastern Asia FALSE 11 2021-02-03 257937455 relation "广东çœ<81>, ä¸å›½" boundary administrative 0.685068695817348 ä¸å›½ TRUE
+hubei cn Asia Eastern Asia FALSE 11 2021-02-03 257842089 relation "湖北çœ<81>, ä¸å›½" boundary administrative 0.677032187273797 ä¸å›½ TRUE
+sichuan cn Asia Eastern Asia FALSE 11 2021-02-03 257966453 relation "å››å·<9d>çœ<81>, ä¸å›½" boundary administrative 0.711286195807749 ä¸å›½ TRUE
+university of manitoba ca Americas Northern America FALSE 11 2021-02-03 259131209 relation "University of Manitoba, Sifton Road, Montcalm, Winnipeg, Winnipeg (city), Manitoba, R3T 2N2, Canada" amenity university 0.301 Canada TRUE
+university of victoria ca Americas Northern America FALSE 11 2021-02-03 78344431 node "University of Victoria, Alumni Chip Trail, Cadboro Bay Village, Saanich, Capital Regional District, British Columbia, V8P 5C0, Canada" amenity post_office 0.301 Canada TRUE
+australian research council au Oceania Australia and New Zealand FALSE 11 2021-02-03 198145984 way "Australian Cotton Research Institute, Kamilaroi Highway, Narrabri, Narrabri Shire Council, New South Wales, 2390, Australia" office research 0.301 Australia TRUE
+james cook university au Oceania Australia and New Zealand FALSE 11 2021-02-03 162709786 way "James Cook University, 1, James Cook Drive, Douglas, Townsville, Townsville City, Queensland, 4811, Australia" amenity university 0.72561814389347 Australia TRUE
+venezuela ve Americas South America FALSE 10 2021-02-03 258211725 relation Venezuela boundary administrative 0.857303027661612 Venezuela TRUE
+american society of human genetics us Americas Northern America TRUE 10 2021-02-03 NA NA NA NA NA NA NA TRUE
+campbell us Americas Northern America FALSE 10 2021-02-03 259236537 relation "Campbell, Santa Clara County, California, 95008, United States" boundary administrative 0.580261160940683 United States TRUE
+carnegie institution for science in stanford us Americas Northern America TRUE 10 2021-02-03 NA NA NA NA NA NA NA TRUE
+human rights watch us Americas Northern America FALSE 10 2021-02-03 58663937 node "Human Rights Watch, 350 5th Ave, West 34th Street, Midtown South, Manhattan Community Board 5, Manhattan, New York County, New York, 10118, United States" office ngo 0.301 United States TRUE
+intel us Americas Northern America FALSE 10 2021-02-03 177283013 way "Intel, Intel Hawthorn Farm Campus, Orenco Station, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, United States" landuse construction 0.3 United States TRUE
+johnson space center us Americas Northern America FALSE 10 2021-02-03 99133114 way "Lyndon B. Johnson Space Center, 2101, NASA Parkway, Houston, Harris County, Texas, 77058, United States" tourism attraction 0.818056742388072 United States TRUE
+national science board us Americas Northern America FALSE 10 2021-02-03 12578717 node "NYU School of Medicine, 562, 1st Avenue, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10017-6927, United States" amenity university 0.499286093607089 United States TRUE
+osaka university us Americas Northern America FALSE 10 2021-02-03 74378542 node "Osaka, University Mall, University Place, Orem, Utah County, Utah, 84604, United States" amenity restaurant 0.201 United States TRUE
+rogers us Americas Northern America FALSE 10 2021-02-03 258319337 relation "Rogers, Benton County, Arkansas, United States" boundary administrative 0.579492986484072 United States TRUE
+university of bergen us Americas Northern America FALSE 10 2021-02-03 158650789 way "Fairleigh Dickinson University, Northumberland Road, Teaneck Township, Bergen County, New Jersey, 07666, United States" amenity university 0.636721108965853 United States TRUE
+university of kansas us Americas Northern America FALSE 10 2021-02-03 226545942 way "University of Kansas, Louisiana Street, Malls Shopping Center, Lawrence, Douglas County, Kansas, 66046, United States" amenity university 0.862696980333312 United States TRUE
+university of kentucky us Americas Northern America FALSE 10 2021-02-03 258670100 relation "University of Kentucky, East Vine Street, Central Business District, Lexington, Fayette County, Kentucky, 40506, United States" amenity university 0.850375161540189 United States TRUE
+university of massachusetts amherst us Americas Northern America FALSE 10 2021-02-03 259199097 relation "University of Massachusetts Amherst, Kendrick Place, Amherst, Hampshire County, Massachusetts, 01004, United States" amenity university 0.91421857649354 United States TRUE
+us defense advanced research projects agency us Americas Northern America FALSE 10 2021-02-03 166563644 way "Defense Advanced Research Projects Agency, 675, North Randolph Street, Ballston, Arlington, Arlington County, Virginia, 22203, United States" office government 0.501 United States TRUE
+us national academies us Americas Northern America FALSE 10 2021-02-03 158007717 way "Bergen County Academies, NJ 4, Hackensack, Bergen County, New Jersey, 07646:07666, United States" amenity school 0.451332014915526 United States TRUE
+seti institute td Africa Middle Africa FALSE 10 2021-02-03 153816233 way "Institut Tchadien pour la Recherche Agronomique et le Développement, شارع مليز, Ù<81>ارشا Farcha, 1er Arrondissement / الدائرة الأولى, N'Djaména انجمينا, BP41, Tchad تشاد" office research 0.001 Tchad تشاد TRUE
+united nations educational ps Asia Western Asia FALSE 10 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 1.00816286930485 Palestinian Territory TRUE
+darpa pk Asia Southern Asia FALSE 10 2021-02-03 50587431 node "Darpa Khel, North WazÄ«ristÄ<81>n Agency, خیبر پښتونخوا, پاکستان" place village 0.375 پاکستان TRUE
+astrophysical journal NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA TRUE
+church NONE NA NA TRUE 10 2021-02-03 299392511 way "Church, Thruxton, Test Valley, Hampshire, South East, England, SP11 8PW, United Kingdom" highway raceway 0.539445078941215 United Kingdom TRUE
+clarivate analytics NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepmind NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecohealth alliance NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+european geosciences union NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard office for scholarly communication NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard t.h. chan school of public health NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for stem cell research NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+national human genome research institute NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+precision medicine initiative NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+vaccine alliance NONE NA NA FALSE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+delft university of technology nl Europe Western Europe FALSE 10 2021-02-03 138201041 way "Technische Universiteit Delft, Mijnbouwstraat, Wippolder, Delft, Zuid-Holland, Nederland, 2628, Nederland" amenity university 0.604534284533579 Nederland FALSE
+niger ne Africa Western Africa FALSE 10 2021-02-03 258196686 relation Niger boundary administrative 0.762187691693021 Niger FALSE
+hind NA Africa Southern Africa FALSE 10 2021-02-03 1244386 node Indian Ocean place ocean 0.676747312216863 NA FALSE
+unam mx Americas Central America FALSE 10 2021-02-03 96671012 way "Universidad Nacional Autónoma de México, Circuito Exterior, Ciudad Universitaria, Coyoacán, Ciudad de México, 04360, México" amenity university 0.562409087444079 México FALSE
+us navy it Europe Southern Europe FALSE 10 2021-02-03 16815715 node "Us Navy, SP69/II, San Giorgio-Librino-San Giuseppe la Rena-Zia Lisa-Villaggio Sant'Agata, Lentini, Siracusa, Sicilia, Italia" amenity fuel 0.201 Italia FALSE
+nci ie Europe Northern Europe FALSE 10 2021-02-03 258574096 relation "National College of Ireland, Mayor Square, International Financial Services Centre, North Dock, Dublin, County Dublin, Leinster, Éire / Ireland" amenity college 0.402778707896871 Éire / Ireland FALSE
+hungarian academy of sciences hu Europe Eastern Europe FALSE 10 2021-02-03 256816091 relation "Magyar Tudományos Akadémia, 9, Széchenyi István tér, Lipótváros, V. kerület, Budapest, Közép-Magyarország, 1051, Magyarország" tourism attraction 0.578948761652427 Magyarország FALSE
+alliance manchester business school gb Europe Northern Europe FALSE 10 2021-02-03 707500 node "Alliance Manchester Business School, Booth Street West, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M15 6PB, United Kingdom" amenity university 0.401 United Kingdom FALSE
+institute of cancer research gb Europe Northern Europe FALSE 10 2021-02-03 175592054 way "Institute of Cancer Research, 237, Fulham Road, The Boltons, Brompton, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW3 6HS, United Kingdom" building hospital 0.810743518323823 United Kingdom FALSE
+isis gb Europe Northern Europe FALSE 10 2021-02-03 136970771 way "ISIS, Road Eight, East Hendred, Vale of White Horse, Oxfordshire, South East, England, OX11 0RD, United Kingdom" building industrial 0.411628560800675 United Kingdom FALSE
+london school of economics gb Europe Northern Europe FALSE 10 2021-02-03 258598818 relation "London School of Economics and Political Science, Houghton Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AE, United Kingdom" amenity university 0.988176875647945 United Kingdom FALSE
+london school of hygiene & tropical medicine gb Europe Northern Europe FALSE 10 2021-02-03 185180502 way "London School of Hygiene and Tropical Medicine, Gower Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7HT, United Kingdom" amenity university 1.04105233650125 United Kingdom FALSE
+universities uk gb Europe Northern Europe FALSE 10 2021-02-03 55479876 node "Universities UK, 20, Tavistock Square, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 9HQ, United Kingdom" place house 0.201 United Kingdom FALSE
+university of aberdeen gb Europe Northern Europe FALSE 10 2021-02-03 259116297 relation "University of Aberdeen, College Bounds, Old Aberdeen, Aberdeen City, Scotland, AB24 3EB, United Kingdom" amenity university 0.823940959797236 United Kingdom FALSE
+university of dundee gb Europe Northern Europe FALSE 10 2021-02-03 102764772 way "University of Dundee, Ure Street, Blackness, Dundee, Dundee City, Scotland, DD1 5JA, United Kingdom" amenity university 0.774336051043759 United Kingdom FALSE
+zoological society of london gb Europe Northern Europe FALSE 10 2021-02-03 252630202 way "Zoological Society of London, Regent's Canal Towpath, Chalk Farm, City of Westminster, London, Greater London, England, NW1 4SX, United Kingdom" office ngo 0.401 United Kingdom FALSE
+labour fr Europe Western Europe FALSE 10 2021-02-03 50485271 node "Le Labour, La Chapelle-du-Lou, La Chapelle du Lou du Lac, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35360, France" place hamlet 0.35 France FALSE
+organisation for economic co-operation fr Europe Western Europe FALSE 10 2021-02-03 103637552 way "OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" office government 0.569924309656139 France FALSE
+sanofi fr Europe Western Europe FALSE 10 2021-02-03 135101682 way "Sanofi, Vitry Sud - Ardoines, Vitry-sur-Seine, Arrondissement de L'Haÿ-les-Roses, Val-de-Marne, Île-de-France, France métropolitaine, 94400, France" landuse industrial 0.3 France FALSE
+technical university of denmark dk Europe Northern Europe FALSE 10 2021-02-03 94920613 way "Danmarks Tekniske Universitet, Asmussens Allé, Lundtofte, Lyngby-Taarbæk Kommune, Region Hovedstaden, 2800, Danmark" amenity university 0.570433047832959 Danmark FALSE
+fws de Europe Western Europe FALSE 10 2021-02-03 14490517 node "FWS, 5, Stephanstraße, St. Johanner Markt, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66111, Deutschland" amenity language_school 0.101 Deutschland FALSE
+reuters de Europe Western Europe FALSE 10 2021-02-03 16075920 node "Reuters, Lauterbach, Vogelsbergkreis, Hessen, 36318, Deutschland" place village 0.305371759161912 Deutschland FALSE
+galileo co Americas South America FALSE 10 2021-02-03 228694972 way "Galileo, Localidad Usaquén, Bogotá, Bogotá Distrito Capital, Región Andina, 110131, Colombia" landuse residential 0.3 Colombia FALSE
+wikipedia co Americas South America FALSE 10 2021-02-03 258072903 relation "Amazonas, Amazonia, Colombia" boundary administrative 0.478217339016076 Colombia FALSE
+chinese university of hong kong cn Asia Eastern Asia FALSE 10 2021-02-03 259201755 relation "香港ä¸æ–‡å¤§å¸ The Chinese University of Hong Kong, å<90><90>露港公路 Tolo Highway, 馬料水 Ma Liu Shui, 馬éž<8d>å±± Ma On Shan, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" amenity university 1.01579693868845 ä¸å›½ FALSE
+green party cn Asia Eastern Asia FALSE 10 2021-02-03 296801653 node "The Green Party, é’Ÿå<8d>—è¡—, è<8f><81>å<8d>Žç¤¾åŒº, 东沙湖社工委, è‹<8f>州工业å›åŒºç›´å±žé•‡, è‹<8f>州工业å›åŒº, è‹<8f>州市, 江è‹<8f>çœ<81>, 215028, ä¸å›½" shop variety_store 0.201 ä¸å›½ FALSE
+canadian institutes of health research ca Americas Northern America TRUE 10 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcmaster university ca Americas Northern America FALSE 10 2021-02-03 95450699 way "McMaster University, Main Street West, Westdale, Hamilton, Golden Horseshoe, Ontario, L8S 1B3, Canada" amenity university 0.704585752093458 Canada FALSE
+duke ba Europe Southern Europe FALSE 10 2021-02-03 24796492 node "Duke, Općina Kiseljak, Srednjobosanski kanton / Županija SrediÅ¡nja Bosna, Federacija Bosne i Hercegovine, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" place village 0.375 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+deakin university au Oceania Australia and New Zealand FALSE 10 2021-02-03 133189487 way "Deakin University, 221, Burwood Highway, Burwood, Melbourne, City of Whitehorse, Victoria, 3125, Australia" amenity university 0.36265143530573 Australia FALSE
+university of wollongong au Oceania Australia and New Zealand FALSE 10 2021-02-03 85003768 way "University of Wollongong, Dallas Street, Keiraville, Wollongong City Council, New South Wales, 2500, Australia" amenity university 0.751344582361174 Australia FALSE
+international energy agency at Europe Western Europe FALSE 10 2021-02-03 149447246 way "Internationale Atomenergie-Organisation IAEO, Bruno-Kreisky-Platz, Donau City, KG Kaisermühlen, Donaustadt, Wien, 1220, Österreich" building yes 0.101 Österreich FALSE
+albert einstein college of medicine us Americas Northern America FALSE 9 2021-02-03 203373692 way "Albert Einstein College of Medicine, Rhinelander Avenue, The Bronx, Bronx County, New York, 10461, United States" amenity college 0.91305789785603 United States FALSE
+beth israel deaconess medical center us Americas Northern America FALSE 9 2021-02-03 147022219 way "Beth Israel Deaconess Medical Center East Campus, 330, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States" amenity hospital 0.859613385609502 United States FALSE
+biogen us Americas Northern America FALSE 9 2021-02-03 191876081 way "Biogen, 225, Binney Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" building commercial 0.101 United States FALSE
+california state university us Americas Northern America FALSE 9 2021-02-03 140128410 way "California State University, Long Beach, East Bixby Hill Road, Long Beach, Los Angeles County, California, 90815, United States" amenity university 0.781345777911708 United States FALSE
+city college us Americas Northern America FALSE 9 2021-02-03 115546934 way "The City College of New York, 160, Convent Avenue, Sugar Hill, Manhattan Community Board 9, Manhattan, New York County, New York, 10031, United States" amenity university 0.71231196067725 United States FALSE
+defense advanced research projects agency us Americas Northern America FALSE 9 2021-02-03 166563644 way "Defense Advanced Research Projects Agency, 675, North Randolph Street, Ballston, Arlington, Arlington County, Virginia, 22203, United States" office government 0.501 United States FALSE
+federal bureau of investigation us Americas Northern America FALSE 9 2021-02-03 295889146 relation "Federal Bureau of Investigation, 935, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20535, United States" amenity police 0.742718151065986 United States FALSE
+florida state university us Americas Northern America FALSE 9 2021-02-03 121104541 way "Florida State University, 600, West College Avenue, Tallahassee, Leon County, Florida, 32306-1058, United States" amenity university 0.851225835831412 United States FALSE
+imperial us Americas Northern America FALSE 9 2021-02-03 258271306 relation "Imperial County, California, United States" boundary administrative 0.649875514128109 United States FALSE
+jupiter us Americas Northern America FALSE 9 2021-02-03 258426556 relation "Jupiter, Palm Beach County, Florida, United States" boundary administrative 0.570373326511065 United States FALSE
+kansas us Americas Northern America FALSE 9 2021-02-03 257791284 relation "Kansas, United States" boundary administrative 0.816541831442553 United States FALSE
+lamont-doherty earth observatory us Americas Northern America FALSE 9 2021-02-03 101655405 way "Lamont-Doherty Earth Observatory, Ludlow Lane, Palisades, Town of Orangetown, Rockland County, New York, 10964, United States" amenity university 0.401 United States FALSE
+mass us Americas Northern America FALSE 9 2021-02-03 258278823 relation "Massachusetts, United States" boundary administrative 0.836449761303479 United States FALSE
+nasa ames research center us Americas Northern America FALSE 9 2021-02-03 298990599 way "NASA Ames Conference Center (NACC) Building 3, South Akron Road, Ames Research Center, Santa Clara County, California, 94035-0016, United States" building yes 0.401 United States FALSE
+national research foundation us Americas Northern America FALSE 9 2021-02-03 123853626 way "Research Parkway, Presbyterian Health Foundation, Oklahoma City, Oklahoma County, Oklahoma, 73104, United States" highway unclassified 0.3 United States FALSE
+texas tech university us Americas Northern America FALSE 9 2021-02-03 193845831 way "Texas Tech University, 2500, Broadway Street, Lubbock, Lubbock County, Texas, 79409, United States" amenity university 0.809795372861755 United States FALSE
+tmt us Americas Northern America FALSE 9 2021-02-03 5539908 node "Thirty Meter Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.354348884656857 United States FALSE
+university of cincinnati us Americas Northern America FALSE 9 2021-02-03 258441379 relation "University of Cincinnati, Elland Avenue, Pill Hill, Corryville, Cincinnati, Hamilton County, Ohio, 45229-3026, United States" amenity university 0.81920367879753 United States FALSE
+university of massachusetts us Americas Northern America FALSE 9 2021-02-03 75830459 node "Cold Spring Orchard, 391, Sabin Street, Cold Spring, Belchertown, Hampshire County, Massachusetts, 01009, United States" shop farm 0.101 United States FALSE
+university of massachusetts medical school us Americas Northern America FALSE 9 2021-02-03 125863087 way "University of Massachusetts Medical School, First Road, Worcester, Worcester County, Massachusetts, 01653, United States" amenity college 0.501 United States FALSE
+university of montana us Americas Northern America FALSE 9 2021-02-03 207899223 way "University of Montana, East Beckwith Avenue, University District, Missoula, Missoula County, Montana, 59812, United States" amenity university 0.76176245010242 United States FALSE
+university of wyoming us Americas Northern America FALSE 9 2021-02-03 197878304 way "University of Wyoming, North 30th Street, Laramie, Albany County, Wyoming, 82071, United States" amenity university 0.790871452105903 United States FALSE
+us government accountability office us Americas Northern America FALSE 9 2021-02-03 103419777 way "Government Accountability Office, 441, G Street Northwest, Penn Quarter, Washington, District of Columbia, 20548, United States" building house 0.435420222661424 United States FALSE
+us national academy of medicine us Americas Northern America FALSE 9 2021-02-03 101801329 way "Academy of Medicine, 7th Street Northeast, Atlanta, Fulton County, Georgia, 30308, United States" amenity school 0.428160971568546 United States FALSE
+vesta us Americas Northern America FALSE 9 2021-02-03 257790764 relation "Vesta, Redwood County, Minnesota, United States" boundary administrative 0.52868986151298 United States FALSE
+youtube us Americas Northern America FALSE 9 2021-02-03 107269264 way "YouTube, 900, Cherry Avenue, YouTube, San Bruno, San Mateo County, California, 94066, United States" building commercial 0.815565438604185 United States FALSE
+nrc ua Europe Eastern Europe FALSE 9 2021-02-03 45182287 node "Ð<9d>орвезька рада у Ñ<81>правах біженців, 10 к2, Федоренка вулицÑ<8f>, Сєвєродонецьк, Сєвєродонецький район, ЛуганÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 93408, Україна" office ngo 0.30799018260571 Україна FALSE
+eua to Oceania Polynesia FALSE 9 2021-02-03 258839633 relation "'Eua, Mata'aho, Vahe 'Eua, ʻEua, Tonga" place island 0.425 Tonga FALSE
+slovakia sk Europe Eastern Europe FALSE 9 2021-02-03 257217802 relation Slovensko boundary administrative 0.777034782704995 Slovensko FALSE
+stockholm university se Europe Northern Europe FALSE 9 2021-02-03 104694332 way "Stockholms universitet, Stora Skuggans Väg, Lappkärrsberget, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 17, Sverige" amenity university 0.101 Sverige FALSE
+qatar qa Asia Western Asia FALSE 9 2021-02-03 258224271 relation قطر boundary administrative 0.703411605024364 قطر FALSE
+department of health ph Asia South-Eastern Asia FALSE 9 2021-02-03 674851 node "Department Of Health, Rizal Avenue, Barangay 335, Santa Cruz, Third District, Manila, First District, Metro Manila, 1003, Luzon" amenity public_building 0.301 Luzon FALSE
+national health service np Asia Southern Asia FALSE 9 2021-02-03 68009675 node "Health Service, Nayapul-Makha, Makha, Modi Rural Municipality Ward No.2, देउपà¥<81>र, मोदि गाउà¤<81>पालिका (Modi), परà¥<8d>वत, गणà¥<8d>डकी पà¥<8d>रदेश, नेपाल" amenity clinic 0.201 नेपाल FALSE
+association of american medical colleges NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian academy of sciences NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+convention on international trade in endangered species of wild fauna NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+editas medicine NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+intergovernmental science-policy platform on biodiversity and ecosystem services NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+league of european research universities NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine-earth science and technology NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of allergy NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+national natural science foundation of china NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel committee NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of science and technology policy NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk medical research council NONE NA NA FALSE 9 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of groningen nl Europe Western Europe FALSE 9 2021-02-03 258652656 relation "Academiegebouw, Broerstraat, Binnenstad-noord, Centrum, Groningen, Nederland, 9712GJ, Nederland" building university 0.349182950422608 Nederland FALSE
+deepwater horizon NA Africa Southern Africa FALSE 9 2021-02-03 6855110 node Deepwater Horizon man_made pumping_rig 0.629506969685059 NA FALSE
+mozambique mz Africa Eastern Africa FALSE 9 2021-02-03 258405737 relation Moçambique boundary administrative 0.690869640042326 Moçambique FALSE
+ukri lv Europe Northern Europe FALSE 9 2021-02-03 259569629 relation "Ukri, Auces novads, Zemgale, Latvija" boundary administrative 0.4 Latvija FALSE
+ministry of health lk Asia Southern Asia FALSE 9 2021-02-03 152298643 way "Ministry of Health, 385, Deans Road, Suduwella, Maligawatte, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 800, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office government 0.594028740055238 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+sri lanka lk Asia Southern Asia FALSE 9 2021-02-03 258464964 relation à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை boundary administrative 0.730312094018578 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+institute for basic science kr Asia Eastern Asia FALSE 9 2021-02-03 195637674 way "Institute for Basic Science, 대ë<8d>•ëŒ€ë¡œ512번길, ì‹ ì„±ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 34125, 대한민êµ" amenity research_institute 0.401 ëŒ€í•œë¯¼êµ FALSE
+universities space research association in Asia Southern Asia FALSE 9 2021-02-03 156452951 way "Bharati Vidyapeetha, Admiral Somnath Path, Sneh Paradise, Erandwana, Pune City, Pune District, Maharashtra, 411038, India" amenity university 0.001 India FALSE
+university college dublin ie Europe Northern Europe FALSE 9 2021-02-03 94729783 way "James Joyce Library, Route1, Roebuck, Dundrum ED, Dundrum, Dún Laoghaire-Rathdown, County Dublin, Leinster, D04 XT65, Éire / Ireland" amenity library 0.101 Éire / Ireland FALSE
+bangor university gb Europe Northern Europe FALSE 9 2021-02-03 116565795 way "Bangor University, College Road Site, Garth Road, Garth, Bangor, Gwynedd, Cymru / Wales, LL57 2RP, United Kingdom" amenity university 0.201 United Kingdom FALSE
+climatic research unit gb Europe Northern Europe FALSE 9 2021-02-03 99663934 way "Climatic Research Unit (CRU), Chancellors Drive, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" building yes 0.627161274702289 United Kingdom FALSE
+commission gb Europe Northern Europe FALSE 9 2021-02-03 174443117 way "The Commission, Stratford Road, London Borough of Hillingdon, London, Greater London, England, TW6 3FB, United Kingdom" amenity restaurant 0.101 United Kingdom FALSE
+conservative gb Europe Northern Europe FALSE 9 2021-02-03 128024014 way "Conservative Club, Whitecross Street, Overmonnow, Monmouth, Monmouthshire, Cymru / Wales, NP25 3BY, United Kingdom" club yes 0.383827688081076 United Kingdom FALSE
+elsevier gb Europe Northern Europe FALSE 9 2021-02-03 258202489 relation "Elsevier, The Boulevard, Oxford Spires Business Park, Kidlington, Thrupp, Cherwell, Oxfordshire, South East, England, OX5 1NZ, United Kingdom" building yes 0.101 United Kingdom FALSE
+russell group gb Europe Northern Europe FALSE 9 2021-02-03 23799035 node "Russell Group Limited, 2a, Commerce Square, Lace Market, St Ann's, City of Nottingham, East Midlands, England, NG1 1HS, United Kingdom" office company 0.201 United Kingdom FALSE
+aarhus university dk Europe Northern Europe FALSE 9 2021-02-03 258651824 relation "Aarhus Universitet, Paludan-Müllers Vej, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8200, Danmark" amenity university 0.616309477187943 Danmark FALSE
+ludwig maximilian university de Europe Western Europe FALSE 9 2021-02-03 108346027 way "Ludwig-Maximilians-Universität, 1, Geschwister-Scholl-Platz, Bezirksteil Universität, Maxvorstadt, München, Bayern, 80539, Deutschland" amenity university 0.812089678594562 Deutschland FALSE
+cyprus cy Asia Western Asia FALSE 9 2021-02-03 257947846 relation ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs boundary administrative 0.720547249770618 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+cas co Americas South America FALSE 9 2021-02-03 1280004 node "Casanare, Orinoquia, Colombia" place state 0.65 Colombia FALSE
+university of calgary ca Americas Northern America FALSE 9 2021-02-03 83952183 way "University of Calgary, Crowchild Trail NW, Banff Trail, Calgary, Alberta, T2M 4X6, Canada" amenity university 0.301 Canada FALSE
+university of guelph ca Americas Northern America FALSE 9 2021-02-03 126276159 way "University of Guelph, South Ring Road, Guelph, Southwestern Ontario, Ontario, N1G 3A2, Canada" amenity university 0.768891779789467 Canada FALSE
+university of western ontario ca Americas Northern America FALSE 9 2021-02-03 119657580 way "Huron University College, Western Road, London, Southwestern Ontario, Ontario, N6G 2V4, Canada" building university 0.657411994477751 Canada FALSE
+nas bs Americas Caribbean FALSE 9 2021-02-03 198204916 way "Lynden Pindling International Airport, John F. Kennedy Drive, New Providence, 00000, The Bahamas" aeroway aerodrome 0.392062334826953 The Bahamas FALSE
+anr be Europe Western Europe FALSE 9 2021-02-03 86964198 way "Internationale Luchthaven Antwerpen, Leon Stampelaan, Deurne, Antwerpen, Vlaanderen, 2100, België / Belgique / Belgien" aeroway aerodrome 0.389007360490923 België / Belgique / Belgien FALSE
+basf be Europe Western Europe FALSE 9 2021-02-03 102592327 way "BASF Antwerpen nv, 600, Scheldelaan, Zandvliet, Berendrecht-Zandvliet-Lillo, Antwerpen, Vlaanderen, 2040, België / Belgique / Belgien" man_made works 0.630708311748545 België / Belgique / Belgien FALSE
+brain research au Oceania Australia and New Zealand FALSE 9 2021-02-03 103375921 way "Queensland Brain Institute, Research Road, St Lucia, Brisbane City, Queensland, 4072, Australia" building university 0.201 Australia FALSE
+international atomic energy agency at Europe Western Europe FALSE 9 2021-02-03 149447246 way "Internationale Atomenergie-Organisation IAEO, Bruno-Kreisky-Platz, Donau City, KG Kaisermühlen, Donaustadt, Wien, 1220, Österreich" building yes 0.101 Österreich FALSE
+new horizons za Africa Southern Africa FALSE 8 2021-02-03 724484 node "New Horizons, Bitou Ward 4, Plettenberg Bay, Bitou Local Municipality, Garden Route District Municipality, Western Cape, 6600, South Africa" place suburb 0.475 South Africa FALSE
+international monetary fund us Americas Northern America FALSE 8 2021-02-03 258484235 relation "International Monetary Fund, 700, 19th Street Northwest, Golden Triangle, Washington, District of Columbia, 20052, United States" office ngo 0.913937873889599 United States FALSE
+lbnl us Americas Northern America FALSE 8 2021-02-03 201093023 way "Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States" amenity research_institute 0.001 United States FALSE
+md us Americas Northern America FALSE 8 2021-02-03 258170637 relation "Maryland, United States" boundary administrative 0.724620353023131 United States FALSE
+north dakota us Americas Northern America FALSE 8 2021-02-03 258332531 relation "North Dakota, United States" boundary administrative 0.889102339362075 United States FALSE
+salk institute us Americas Northern America FALSE 8 2021-02-03 3058237 node "Salk Institute Library, Salk Institute Road, La Jolla Farms, Torrey Pines, San Diego, San Diego County, California, 92093, United States" amenity library 0.201 United States FALSE
+scripps us Americas Northern America FALSE 8 2021-02-03 149620798 way "Scripps, Asilomar Avenue, Pacific Grove Acres, Pacific Grove, Monterey County, California, 93950-2424, United States" building yes 0.101 United States FALSE
+syracuse university us Americas Northern America FALSE 8 2021-02-03 258567940 relation "Syracuse University, East Adams Street, University Hill, Syracuse, Onondaga County, New York, 13210-1053, United States" amenity university 0.763992465055935 United States FALSE
+university of alaska fairbanks us Americas Northern America FALSE 8 2021-02-03 259286295 relation "University of Alaska Fairbanks, 1731, College, Fairbanks North Star, Alaska, 99775, United States" amenity university 0.827623120278844 United States FALSE
+university of delaware us Americas Northern America FALSE 8 2021-02-03 30187178 node "University of Delaware, South College Avenue, Newark, New Castle County, Delaware, 19713, United States" amenity university 0.801868684259545 United States FALSE
+university of houston us Americas Northern America FALSE 8 2021-02-03 154516059 way "University of Houston, 4800, Calhoun Road, Houston, Harris County, Texas, 77004, United States" amenity university 0.831411414196818 United States FALSE
+us forest service us Americas Northern America FALSE 8 2021-02-03 301108853 node "Cabin City, Twelvemile Creek Road #353, Cabin City, Mineral County, Montana, United States" tourism camp_site 0.001 United States FALSE
+us national park service us Americas Northern America FALSE 8 2021-02-03 229380168 way "Longleaf Campground, National Park Road, Richland County, South Carolina, United States" tourism camp_site 0.201 United States FALSE
+us patent and trademark office us Americas Northern America FALSE 8 2021-02-03 55565757 node "Silicon Valley United States Patent and Trademark Office, South 4th Street, Saint James Square Historic District, Japantown, San Jose, Santa Clara County, California, 95112-3580, United States" office government 0.401 United States FALSE
+uspto us Americas Northern America FALSE 8 2021-02-03 103148391 way "USPTO Remsen Building, 400, Dulany Street, Lyles-Crouch, Alexandria, Virginia, 22314, United States" building office 0.101 United States FALSE
+us institute of medicine ua Europe Eastern Europe FALSE 8 2021-02-03 5595802 node "МедуниверÑ<81>итет, бульвар Ленина, Железнодорожный район, Симферополь, СимферопольÑ<81>кий городÑ<81>кой Ñ<81>овет, 295006, Україна" highway bus_stop 0.001 Україна FALSE
+treasury se Europe Northern Europe FALSE 8 2021-02-03 20386522 node "Skattkammaren, Slottsbacken, Gamla stan, Södermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 111 31, Sverige" tourism museum 0.244698616841389 Sverige FALSE
+genbank ru Europe Eastern Europe FALSE 8 2021-02-03 37168464 node "Генбанк, МалаÑ<8f> Ð<90>ндроньевÑ<81>каÑ<8f> улица, ТаганÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 109544, РоÑ<81>Ñ<81>иÑ<8f>" amenity bank 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+paraguay py Americas South America FALSE 8 2021-02-03 258211585 relation Paraguay boundary administrative 0.814653400915517 Paraguay FALSE
+lancet pl Europe Eastern Europe FALSE 8 2021-02-03 45795901 node "Lancet, 1a, KoÅ›cielna, BaÅ‚uty-DoÅ‚y, Å<81>ódź-BaÅ‚uty, Å<81>ódź, województwo łódzkie, 91-444, Polska" amenity veterinary 0.101 Polska FALSE
+food and agriculture organization of the united nations pe Americas South America FALSE 8 2021-02-03 64529240 node "Food and Agriculture Organization of the United Nations, 328, Calle Manuel Almenara, Miraflores, Lima, 15048, Perú" office diplomatic 0.801 Perú FALSE
+advanced research projects agency NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+butantan institute NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+cary institute of ecosystem studies NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+chandra x-ray observatory NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecological society of america NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and resources institute NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+french academy of sciences NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+german institute for international and security affairs NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+hfea NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on science and technology NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+ice data center NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan science and technology agency NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+marshall space flight center NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa goddard institute for space studies NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for biomedical research NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for space research NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+ostp NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew research center NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+protein & cell NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+skolkovo institute of science and technology NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+solar dynamics observatory NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of würzburg NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+whitehead institute for biomedical research NONE NA NA FALSE 8 2021-02-03 NA NA NA NA NA NA NA FALSE
+european research area nl Europe Western Europe FALSE 8 2021-02-03 296384894 way "European Space Research and Technology Centre, Noordwijk, Zuid-Holland, Nederland, 2201AZ, Nederland" landuse commercial 0.615797566639606 Nederland FALSE
+malawi mw Africa Eastern Africa FALSE 8 2021-02-03 258015492 relation Malawi boundary administrative 0.760119250884759 Malawi FALSE
+european court of justice lu Europe Western Europe FALSE 8 2021-02-03 137569328 way "Ministère des affaires étrangères & européennes, 9, Rue du Palais de Justice, Ville-Haute, Luxembourg, Canton Luxembourg, 1841, Lëtzebuerg" office government 0.472275390676979 Lëtzebuerg FALSE
+lebanon lb Asia Western Asia FALSE 8 2021-02-03 258407440 relation لبنان boundary administrative 0.733805379704602 لبنان FALSE
+tohoku university jp Asia Eastern Asia FALSE 8 2021-02-03 49999020 node "Tohoku University, 1, é<8d>›å†¶å±‹å‰<8d>ä¸<81>, ä¸å¤®å››ä¸<81>ç›®, é<9d>’葉区, ä»™å<8f>°å¸‚, 宮城県, 980-8577, 日本" amenity school 0.201 日本 FALSE
+national centre for scientific research iq Asia Western Asia FALSE 8 2021-02-03 109500352 way "المركز الوطني للعلوم والابØاث, شارع الأميرات, Ù…Øلة 601, Mansour, المنصور, بغداد, قضاء الکرخ, Ù…ØاÙ<81>ظة بغداد, 10013, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" office research 0.195871082899258 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+gmo in Asia Southern Asia FALSE 8 2021-02-03 6772130 node "Netaji SC Bose Junction Gomoh, NH19, Topchanchi, Dhanbad, Jharkhand, 828402, India" railway station 0.339306791900516 India FALSE
+science media centre in Asia Southern Asia FALSE 8 2021-02-03 48932681 node "Science Media Center, CV Raman Road, Sadhashivanagar, Aramane Nagara Ward, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India" office research 0.201 India FALSE
+bbc gb Europe Northern Europe FALSE 8 2021-02-03 101162178 way "BBC, 23, Whiteladies Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS8 2LR, United Kingdom" building commercial 0.484120725224289 United Kingdom FALSE
+bracewell gb Europe Northern Europe FALSE 8 2021-02-03 150485 node "Bracewell, Pendle, Lancashire, North West England, England, BD23 3JU, United Kingdom" place village 0.375 United Kingdom FALSE
+greenpeace gb Europe Northern Europe FALSE 8 2021-02-03 98060114 way "Greenpeace, Canonbury Villas, Highbury, London Borough of Islington, London, Greater London, England, N1 2PN, United Kingdom" building office 0.101 United Kingdom FALSE
+royal society b gb Europe Northern Europe FALSE 8 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.847225834784319 United Kingdom FALSE
+royal society of chemistry gb Europe Northern Europe FALSE 8 2021-02-03 2359906 node "Royal Society of Chemistry, Albany Court Yard, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1J 0HE, United Kingdom" amenity learned_society;library 0.902029768014478 United Kingdom FALSE
+tyndall centre for climate change research gb Europe Northern Europe FALSE 8 2021-02-03 99663934 way "Climatic Research Unit (CRU), Chancellors Drive, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" building yes 0.427161274702289 United Kingdom FALSE
+acs fr Europe Western Europe FALSE 8 2021-02-03 258273931 relation "Ax-les-Thermes, Foix, Ariège, Occitanie, France métropolitaine, 09110, France" boundary administrative 0.523865752467132 France FALSE
+cnes fr Europe Western Europe FALSE 8 2021-02-03 3710223 node "CNES, Avenue de l'Europe, Rangueil, Sauzelong, Pech David, Pouvourville, Toulouse Sud-Est, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31400, France" tourism information 0.101 France FALSE
+trademark office dk Europe Northern Europe FALSE 8 2021-02-03 40802206 node "Trædemark, Vesthimmerlands Kommune, Region Nordjylland, Danmark" place hamlet 0.25 Danmark FALSE
+european molecular biology laboratory de Europe Western Europe FALSE 8 2021-02-03 97458858 way "Europäisches Laboratorium für Molekularbiologie, 1, Meyerhofstraße, Rohrbach, Heidelberg, Baden-Württemberg, 69117, Deutschland" amenity research_institute 0.353558714867367 Deutschland FALSE
+dama cn Asia Eastern Asia FALSE 8 2021-02-03 55283412 node "大马镇, 鄢陵县, 许昌市, æ²³å<8d>—çœ<81>, ä¸å›½" place town 0.3 ä¸å›½ FALSE
+guizhou cn Asia Eastern Asia FALSE 8 2021-02-03 258210629 relation "贵州çœ<81>, ä¸å›½" boundary administrative 0.653351269063716 ä¸å›½ FALSE
+open science cn Asia Eastern Asia FALSE 8 2021-02-03 24025212 node "Open Oyster, 科å¸é¤¨å»£å ´ Science Museum Square, 尖沙咀æ<9d>± East Tsim Sha Tsui, 尖沙咀 Tsim Sha Tsui, 油尖旺å<8d>€ Yau Tsim Mong District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" amenity restaurant 0.201 ä¸å›½ FALSE
+xinjiang cn Asia Eastern Asia FALSE 8 2021-02-03 257472610 relation "新疆维å<90>¾å°”自治区, ä¸å›½" boundary administrative 0.674183703517689 ä¸å›½ FALSE
+msf ch Europe Western Europe FALSE 8 2021-02-03 145205796 way "Médecins Sans Frontières, 78, Rue de Lausanne, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" office ngo 0.549022542887286 Schweiz/Suisse/Svizzera/Svizra FALSE
+global fund cf Africa Middle Africa FALSE 8 2021-02-03 42017839 node "IFRC Global Fund office, RN 2, Bangî - Bangui, Ködörösêse tî Bêafrîka - République Centrafricaine" office ngo 0.201 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+zaire cd Africa Middle Africa FALSE 8 2021-02-03 258410829 relation République démocratique du Congo boundary administrative 0.722405117667525 République démocratique du Congo FALSE
+botswana bw Africa Southern Africa FALSE 8 2021-02-03 258296134 relation Botswana boundary administrative 0.769811324959997 Botswana FALSE
+burkina faso bf Africa Western Africa FALSE 8 2021-02-03 258453504 relation Burkina Faso boundary administrative 0.880491224481489 Burkina Faso FALSE
+curtin university au Oceania Australia and New Zealand FALSE 8 2021-02-03 259557731 relation "Curtin University, Rivervale, City of Belmont, Western Australia, 6103, Australia" amenity university 0.635785692031318 Australia FALSE
+universities australia au Oceania Australia and New Zealand FALSE 8 2021-02-03 138620341 way "Australian Universities Centre, Geils Court, Deakin, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" building yes 0.201 Australia FALSE
+university of western australia au Oceania Australia and New Zealand FALSE 8 2021-02-03 259557956 relation "University of Western Australia, 35, Stirling Highway, Claremont, Town of Claremont, Western Australia, 6009, Australia" amenity university 0.889177431740209 Australia FALSE
+central european university at Europe Western Europe FALSE 8 2021-02-03 299890380 way "Central European University, 51, Quellenstraße, KG Favoriten, Favoriten, Wien, 1100, Österreich" amenity university 0.749444237200763 Österreich FALSE
+university of innsbruck at Europe Western Europe FALSE 8 2021-02-03 95953179 way "Universität Innsbruck Campus Innrain, Innerkoflerstraße, Innenstadt, Innsbruck, Tirol, 6020, Österreich" amenity university 0.728386601652889 Österreich FALSE
+angola ao Africa Middle Africa FALSE 8 2021-02-03 258358160 relation Angola boundary administrative 0.821117617604629 Angola FALSE
+george church za Africa Southern Africa FALSE 7 2021-02-03 122429 node "George, George Local Municipality, Garden Route District Municipality, Western Cape, 6529, South Africa" place town 0.541004242546897 South Africa FALSE
+university of science and technology ye Asia Western Asia FALSE 7 2021-02-03 104295063 way "جامعة العلوم والتكنولوجيا, شارع القاهرة, الجامعة, مديرية معين, مدينة صنعاء, أمانة العاصمة, 0022, اليمن" amenity university 0.001 اليمن FALSE
+uruguay uy Americas South America FALSE 7 2021-02-03 257746160 relation Uruguay boundary administrative 0.835509004923576 Uruguay FALSE
+advancement of science us Americas Northern America FALSE 7 2021-02-03 8123167 node "AAAS / Science, 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" tourism attraction 0.201 United States FALSE
+american civil liberties union us Americas Northern America FALSE 7 2021-02-03 61017923 node "American Civil Liberties Union, 125, Broad Street, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10004, United States" office association 0.401 United States FALSE
+arkansas us Americas Northern America FALSE 7 2021-02-03 257460053 relation "Arkansas, United States" boundary administrative 0.804692261310712 United States FALSE
+center for biological diversity us Americas Northern America FALSE 7 2021-02-03 223764606 way "Center For Biological Diversity, 378, North Main Avenue, El Presidio, Tucson, Pima County, Arizona, 85701, United States" building yes 0.401 United States FALSE
+clay mathematics institute us Americas Northern America FALSE 7 2021-02-03 186024492 way "Institute for Pure and Applied Mathematics, 460, Portola Plaza, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" building yes 0.43181178765026 United States FALSE
+collins us Americas Northern America FALSE 7 2021-02-03 258356239 relation "Collins, Story County, Iowa, United States" boundary administrative 0.534140648717751 United States FALSE
+colorado state university in fort collins us Americas Northern America FALSE 7 2021-02-03 259127396 relation "Colorado State University, Spring Park Drive, Fort Collins, Larimer County, Colorado, 80525-1424, United States" amenity university 1.09485313259475 United States FALSE
+district of columbia us Americas Northern America FALSE 7 2021-02-03 258375899 relation "District of Columbia, United States" boundary administrative 0.712065652038613 United States FALSE
+dupont us Americas Northern America FALSE 7 2021-02-03 257884857 relation "DuPont, Pierce County, Washington, 98327, United States" boundary administrative 0.487992348356751 United States FALSE
+engineering and medicine us Americas Northern America FALSE 7 2021-02-03 101669661 way "Fitzpatrick Center for Interdisciplinary Engineering, Medicine and Applied Sciences (FCIEMAS), 101, Science Drive, Durham, Durham County, North Carolina, 27705, United States" building yes 0.301 United States FALSE
+government accountability office us Americas Northern America FALSE 7 2021-02-03 103419777 way "Government Accountability Office, 441, G Street Northwest, Penn Quarter, Washington, District of Columbia, 20548, United States" building house 0.435420222661424 United States FALSE
+iowa state university us Americas Northern America FALSE 7 2021-02-03 258786807 relation "Iowa State University, US 30, Ames, Story County, Iowa, 50011, United States" amenity university 0.829769585619443 United States FALSE
+keystone us Americas Northern America FALSE 7 2021-02-03 257787992 relation "Keystone, Benton County, Iowa, 52249, United States" boundary administrative 0.534676120369013 United States FALSE
+lockheed martin us Americas Northern America FALSE 7 2021-02-03 69800309 node "Lockheed Martin, North Mathilda Avenue, Sunnyvale, Santa Clara County, California, 94089, United States" railway station 0.51689306175332 United States FALSE
+marine biological laboratory us Americas Northern America FALSE 7 2021-02-03 20613776 node "Marine Biological Laboratory, Marine Biological Lab Street, Woods Hole, Falmouth, Barnstable County, Massachusetts, 02543, United States" amenity school 0.301 United States FALSE
+michigan technological university us Americas Northern America FALSE 7 2021-02-03 214188897 way "Michigan Technological University, 1400, Townsend Drive, Houghton, Portage Township, Houghton County, Michigan, 49931, United States" amenity university 0.728748587005153 United States FALSE
+monterey bay aquarium research institute us Americas Northern America FALSE 7 2021-02-03 57262992 node "Monterey Bay Aquarium Research Institute, 7700, Sandholdt Road, Moss Landing, Monterey County, California, 95039, United States" office research 0.501 United States FALSE
+national marine fisheries service us Americas Northern America FALSE 7 2021-02-03 98716401 way "National Marine Fisheries Service, Santa Cruz, Santa Cruz County, California, United States" boundary administrative 0.525 United States FALSE
+national radio astronomy observatory us Americas Northern America FALSE 7 2021-02-03 103730706 way "National Radio Astronomy Observatory, East End Road, Saint Croix District, United States Virgin Islands, United States" building yes 0.401 United States FALSE
+national weather service us Americas Northern America FALSE 7 2021-02-03 226762473 way "National Weather Service, Valley, Douglas County, Nebraska, United States" landuse commercial 0.5 United States FALSE
+new york law school us Americas Northern America FALSE 7 2021-02-03 153073848 way "New York Law School, 185, Worth Street, Tribeca, Manhattan Community Board 1, Manhattan, New York County, New York, 10013, United States" building university 0.805751306412585 United States FALSE
+oak ridge national laboratory us Americas Northern America FALSE 7 2021-02-03 162828025 way "Oak Ridge National Laboratory, Oak Ridge, Roane County, Tennessee, United States" landuse industrial 0.6 United States FALSE
+office of science us Americas Northern America FALSE 7 2021-02-03 258762307 relation "Science, East Reserve Street, Officers Row, Vancouver, Clark County, Washington, 98661, United States" building yes 0.301 United States FALSE
+oppenheimer us Americas Northern America FALSE 7 2021-02-03 490611 node "Oppenheimer, Bedford Township, Bedford County, Pennsylvania, United States" place hamlet 0.35 United States FALSE
+sangamo us Americas Northern America FALSE 7 2021-02-03 87502152 way "Sangamo Drive, Belaire Estates, Greenville County, South Carolina, 29611, United States" highway residential 0.2 United States FALSE
+temple university us Americas Northern America FALSE 7 2021-02-03 202219991 way "Temple University, Dondill Place, Yorktown, Philadelphia, Philadelphia County, Pennsylvania, 19122, United States" amenity university 0.73236936447695 United States FALSE
+university of central florida us Americas Northern America FALSE 7 2021-02-03 258129364 relation "University of Central Florida, Mercury Circle, Alafaya, Orange County, Florida, 32816, United States" amenity university 0.896770959418636 United States FALSE
+university of connecticut us Americas Northern America FALSE 7 2021-02-03 150779544 way "University of Connecticut, Middle Turnpike, Mansfield Four Corners, Mansfield, Tolland County, Connecticut, 06269, United States" amenity university 0.845434458950227 United States FALSE
+university of wisconsin-madison us Americas Northern America FALSE 7 2021-02-03 259436351 relation "University of Wisconsin-Madison, Lake Mendota Drive, Madison, Dane County, Wisconsin, 53705, United States" amenity university 0.980768897517013 United States FALSE
+vermont us Americas Northern America FALSE 7 2021-02-03 257728022 relation "Vermont, United States" boundary administrative 0.790877987357213 United States FALSE
+virginia tech us Americas Northern America FALSE 7 2021-02-03 258252884 relation "Virginia Polytechnic Institute and State University, Drillfield Drive, Blacksburg, Montgomery County, Virginia, 24061, United States" amenity university 0.724377849520944 United States FALSE
+weill cornell medicine us Americas Northern America FALSE 7 2021-02-03 73119338 node "Weill Cornell Internal Medicine Associates at Wright, 1484, 1st Avenue, Upper East Side, Manhattan Community Board 8, Manhattan, New York County, New York, 10075, United States" amenity clinic 0.301 United States FALSE
+wildlife conservation society us Americas Northern America FALSE 7 2021-02-03 105840797 way "Prospect Park Zoo, 450, Flatbush Avenue, Prospect Heights, Brooklyn, Kings County, New York, 11225, United States" tourism zoo 0.360507920897054 United States FALSE
+institute of medicine ua Europe Eastern Europe FALSE 7 2021-02-03 5595802 node "МедуниверÑ<81>итет, бульвар Ленина, Железнодорожный район, Симферополь, СимферопольÑ<81>кий городÑ<81>кой Ñ<81>овет, 295006, Україна" highway bus_stop 0.001 Україна FALSE
+academia sinica tw Asia Eastern Asia FALSE 7 2021-02-03 125761439 way "ä¸å¤®ç ”究院, 128, ç ”ç©¶é™¢è·¯äºŒæ®µ, ä¸ç ”里, å<8d>—港å<8d>€, 三é‡<8d>埔, 臺北市, 11529, 臺ç<81>£" amenity research_institute 0.586985895897651 臺ç<81>£ FALSE
+national university of singapore sg Asia South-Eastern Asia FALSE 7 2021-02-03 105581168 way "National University of Singapore, Business Link, Queenstown, Southwest, 119613, Singapore" amenity university 0.924762239536787 Singapore FALSE
+chalmers university of technology se Europe Northern Europe FALSE 7 2021-02-03 98299775 way "Chalmers Tekniska Högskola, Guldhedsgatan, Johanneberg, Centrum, Göteborg, Göteborgs Stad, Västra Götalands län, 40530, Sverige" amenity university 0.101 Sverige FALSE
+umeå university se Europe Northern Europe FALSE 7 2021-02-03 70819385 node "Datorföreningen Academic Computer Club UmeÃ¥ Universitet, Petrus Laestadius väg, Lilljansberget, Universitets- och sjukhusomrÃ¥det, UmeÃ¥, UmeÃ¥ kommun, Västerbottens län, 907 13, Sverige" office association 0.101 Sverige FALSE
+university of gothenburg se Europe Northern Europe FALSE 7 2021-02-03 95030421 way "Göteborgs Universitet, 100, Universitetsplatsen, Vasastaden, Centrum, Göteborg, Göteborgs Stad, Västra Götalands län, 405 30, Sverige" amenity university 0.001 Sverige FALSE
+shell ru Europe Eastern Europe FALSE 7 2021-02-03 61004484 node "Shell, вл2Ð<90>, МКÐ<90>Д, 1-й километр, Южное Измайлово, район ИвановÑ<81>кое, МоÑ<81>ква, Центральный федеральный округ, 111531, РоÑ<81>Ñ<81>иÑ<8f>" amenity fuel 0.684546645920874 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+digital science ro Europe Eastern Europe FALSE 7 2021-02-03 74464037 node "Digital Science, Strada Melodiei, Iași, Podul Roș, Iași, Zona Metropolitană Iași, Iași, 700050, România" office yes 0.201 România FALSE
+national university ph Asia South-Eastern Asia FALSE 7 2021-02-03 127228015 way "National University, 551, Mansanas, Sampaloc, 4th District, Manila, First District, Metro Manila, 1008, Luzon" amenity university 0.60242374951 Luzon FALSE
+public citizen ph Asia South-Eastern Asia FALSE 7 2021-02-03 56406294 node "Public WI-FI (PISO WI-FI 011216), S.G. Calulo Street, Citizen Village, Polomolok, South Cotabato, Soccsksargen, 9504, Luzon" amenity cafe 0.201 Luzon FALSE
+allen institute for artificial intelligence NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+american public health association NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of clinical oncology NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology industry organization NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg new energy finance NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian society for the advancement of science NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+cansino biologics NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+cooperative institute for research in environmental sciences NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of energy's office of science NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+evidence for democracy NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of european neuroscience societies NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+global carbon project NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+gran sasso national laboratory NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard open access project NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+hhmi NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+national nuclear security administration NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands environmental assessment agency NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel assembly NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian academy of science and letters NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean observatories initiative NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+physical sciences research council NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+pnas NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+"royal holloway, university of london" NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of dresden NONE NA NA FALSE 7 2021-02-03 NA NA NA NA NA NA NA FALSE
+milky way nl Europe Western Europe FALSE 7 2021-02-03 155504451 way "Melkweg, Lijnbaansgracht, Centrum, Amsterdam, Noord-Holland, Nederland, 1017PH, Nederland" amenity theatre 0.413510524610342 Nederland FALSE
+radboud university nijmegen nl Europe Western Europe FALSE 7 2021-02-03 85314411 way "Radboud Universiteit, Erasmuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525 EX, Nederland" amenity university 0.652553099500867 Nederland FALSE
+tilburg university nl Europe Western Europe FALSE 7 2021-02-03 99323909 way "Tilburg University, Universiteitslaan, West, Tilburg, Noord-Brabant, Nederland, 5037AB, Nederland" amenity university 0.626171455933285 Nederland FALSE
+conservation international mg Africa Eastern Africa FALSE 7 2021-02-03 68745674 node "Conservation International, N 7, Mahamanina, Antsororokavo, Tanana Ambany, Fianarantsoa, District de Fianarantsoa, Matsiatra Ambony, Province de Fianarantsoa, 301, Madagasikara" office ngo 0.201 Madagasikara FALSE
+liberal party jp Asia Eastern Asia FALSE 7 2021-02-03 122578456 way "自由民主会館, 23, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8910, 日本" office political_party 0.001 日本 FALSE
+national graduate institute for policy studies jp Asia Eastern Asia FALSE 7 2021-02-03 114338072 way "政ç–ç ”ç©¶å¤§å¦é™¢å¤§å¦, å…本木トンãƒ<8d>ル, å…本木七ä¸<81>ç›®, å…本木, 麻布, 港区, æ<9d>±äº¬éƒ½, 106-0033, 日本" amenity university 0.400318800773851 日本 FALSE
+science council of japan jp Asia Eastern Asia FALSE 7 2021-02-03 125087351 way "日本å¦è¡“会è°, 319, å…本木七ä¸<81>ç›®, å…本木, 麻布, 港区, æ<9d>±äº¬éƒ½, 106-0033, 日本" building yes 0.44541340693117 日本 FALSE
+tokyo institute of technology jp Asia Eastern Asia FALSE 7 2021-02-03 258519927 relation "æ<9d>±äº¬å·¥æ¥å¤§å¦ 大岡山ã‚ャンパス, 轟橋, 目黒区, æ<9d>±äº¬éƒ½, 158, 日本" amenity university 0.508521601885091 日本 FALSE
+efsa it Europe Southern Europe FALSE 7 2021-02-03 258983516 relation "EFSA, 1A, Via Carlo Magno, Cornocchio, Pablo, Parma, Emilia-Romagna, 43126, Italia" office government 0.55558864174307 Italia FALSE
+fermi it Europe Southern Europe FALSE 7 2021-02-03 15584094 node "Fermi, Via Edmondo De Amicis, Borgata Paradiso, Collegno, Torino, Piemonte, 10093, Italia" railway station 0.394028740055238 Italia FALSE
+sapienza university of rome it Europe Southern Europe FALSE 7 2021-02-03 716518 node "Università La Sapienza sede distaccata Architettura, Piazza Borghese, Rione IV Campo Marzio, Municipio Roma I, Roma, Roma Capitale, Lazio, 00186, Italia" amenity university 0.101 Italia FALSE
+academy of medical sciences ir Asia Southern Asia FALSE 7 2021-02-03 249549450 way "Ù<81>رهنگستان علوم پزشکی, اراضی عباس آباد, منطقه Û³ شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1919816311, ایران" highway tertiary 0.1 ایران FALSE
+nimh ir Asia Southern Asia FALSE 7 2021-02-03 79156398 node "کوه Ù†Ù<90>مه, دهستان سولقان, بخش Ú©Ù†, شهرستان تهران, استان تهران, ایران" natural ridge 0.2 ایران FALSE
+communist party in Asia Southern Asia FALSE 7 2021-02-03 251592329 way "Communist Party, Vengode- Venjaramoodu Road, Thiruvananthapuram, Kerala, 695313, India" office political_party 0.201 India FALSE
+department of commerce in Asia Southern Asia FALSE 7 2021-02-03 247702407 way "Department of Commerce, Adoor - Vandiperiyar Highway, Makkamkunnu, Pathanamthitta, Kerala, 683647, India" building college 0.301 India FALSE
+inter-university centre for astronomy and astrophysics in Asia Southern Asia FALSE 7 2021-02-03 113630721 way "Inter University Center for Astronomy & Astrophysics, Breman Chowk - Khadki Bazar Road, Mandalay Lines, Khadki, Pune City, Pune District, Maharashtra, 411007, India" building yes 0.601 India FALSE
+trinity college dublin ie Europe Northern Europe FALSE 7 2021-02-03 165744701 way "Trinity College Dublin, College Green, Mansion House A ED, Dublin, Dublin 2, Leinster, D02 HR67, Éire / Ireland" amenity university 0.820634411605724 Éire / Ireland FALSE
+cancer research uk gb Europe Northern Europe FALSE 7 2021-02-03 25437189 node "Cancer Research UK, 22-24, High Street, Enmore Green, Shaftesbury, Dorset, South West England, England, SP7 8JG, United Kingdom" place houses 0.35 United Kingdom FALSE
+center for global development gb Europe Northern Europe FALSE 7 2021-02-03 191950659 way "Center for Global Development, Wilton Road, Victoria, City of Westminster, London, Greater London, England, SW1V 1HN, United Kingdom" office ngo 0.401 United Kingdom FALSE
+european bioinformatics institute gb Europe Northern Europe FALSE 7 2021-02-03 259174699 relation "European Bioinformatics Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SD, United Kingdom" amenity research_institute 0.754244998383175 United Kingdom FALSE
+financial times gb Europe Northern Europe FALSE 7 2021-02-03 103776457 way "Financial Times, 1, Friday Street, Blackfriars, City of London, Greater London, England, EC4M 9BT, United Kingdom" office newspaper 0.756792051580292 United Kingdom FALSE
+lancaster university gb Europe Northern Europe FALSE 7 2021-02-03 95263873 way "Lancaster University, Scotforth Road, Lower Burrow, Hala, Bailrigg, Lancaster, Lancashire, North West England, England, LA2 0PH, United Kingdom" amenity university 0.201 United Kingdom FALSE
+liverpool school of tropical medicine gb Europe Northern Europe FALSE 7 2021-02-03 296757298 way "Liverpool School of Tropical Medicine, Pembroke Place, Knowledge Quarter, Liverpool, North West England, England, L3 5QA, United Kingdom" amenity university 0.884723197268746 United Kingdom FALSE
+mrc laboratory of molecular biology gb Europe Northern Europe FALSE 7 2021-02-03 125035001 way "MRC Laboratory of Molecular Biology (LMB), Francis Crick Avenue, Cambridge, Cambridgeshire, East of England, England, CB2 0AA, United Kingdom" building university 0.501 United Kingdom FALSE
+national oceanography centre gb Europe Northern Europe FALSE 7 2021-02-03 257842880 relation "National Oceanography Centre, European Way, Port of Southampton, St Mary's, Southampton, South East, England, SO14 3ZH, United Kingdom" building yes 0.557277503353622 United Kingdom FALSE
+research councils uk gb Europe Northern Europe FALSE 7 2021-02-03 258509732 relation "UK Research Councils, North Star Avenue, Gorse Hill, Central Swindon North, Swindon, South West England, England, SN2 1ET, United Kingdom" building office 0.301 United Kingdom FALSE
+swansea university gb Europe Northern Europe FALSE 7 2021-02-03 4265317 node "Swansea University, Mumbles Road, Blackpill, Sketty, Swansea, Cymru / Wales, SA2 0AX, United Kingdom" highway bus_stop 0.201 United Kingdom FALSE
+philae fr Europe Western Europe FALSE 7 2021-02-03 242087546 way "Philae, Sainte-Radegonde, Tours, Indre-et-Loire, Centre-Val de Loire, France métropolitaine, France" landuse residential 0.3 France FALSE
+national research agency fi Europe Northern Europe FALSE 7 2021-02-03 54517775 node "The Finnish Brain Research and Rehabilitation Center Neuron, Kortesalmi, Kuopio, Kuopion seutukunta, Pohjois-Savo, Itä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" amenity hospital 0.101 Suomi / Finland FALSE
+csic es Europe Southern Europe FALSE 7 2021-02-03 258925679 relation "Museo Nacional de Ciencias Naturales, 2, Calle de José Gutiérrez Abascal, El Viso, ChamartÃn, Madrid, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28006, España" tourism museum 0.348159836291227 España FALSE
+state council eg Africa Northern Africa FALSE 7 2021-02-03 197019864 way "مجلس الدولة, شارع شارل ديجول, شارع الدقى, الجيزة, 11551, مصر" amenity courthouse 0.001 مصر FALSE
+max planck institute de Europe Western Europe FALSE 7 2021-02-03 95363379 way "Max-Planck-Institute, Büsnau, Vaihingen, Stuttgart, Baden-Württemberg, 70569, Deutschland" landuse commercial 0.5 Deutschland FALSE
+max planck institute for astrophysics de Europe Western Europe FALSE 7 2021-02-03 65732258 node "Max-Planck-Institut für Astrophysik, 1, Karl-Schwarzschild-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" office research 0.664296579375046 Deutschland FALSE
+ucs de Europe Western Europe FALSE 7 2021-02-03 225927055 way "UCS, Veddel, Hamburg-Mitte, Hamburg, 20539, Deutschland" landuse commercial 0.3 Deutschland FALSE
+proton cz Europe Eastern Europe FALSE 7 2021-02-03 44452898 node "Proton, HÅ™ensko, okres DÄ›Ä<8d>Ãn, Ústecký kraj, Severozápad, 407 14, ÄŒesko" natural peak 0.4 ÄŒesko FALSE
+shanghai jiao tong university cn Asia Eastern Asia FALSE 7 2021-02-03 124491612 way "上海交通大å¦ï¼ˆå¾<90>æ±‡æ ¡åŒºï¼‰, å<8d>Žå±±è·¯, å¾<90>汇区, 200030, ä¸å›½" amenity university 0.501020559978481 ä¸å›½ FALSE
+wuhan institute of virology cn Asia Eastern Asia FALSE 7 2021-02-03 240734527 way "ä¸å›½ç§‘å¦é™¢æ¦æ±‰ç—…æ¯’ç ”ç©¶æ‰€, 金龙大街, 纸å<9d>Šè¡—, 江å¤<8f>区, 湖北çœ<81>, ä¸å›½" amenity research_institute 0.001 ä¸å›½ FALSE
+air force cm Africa Middle Africa FALSE 7 2021-02-03 66242004 node "AIR FORCE, Baladji, Ngaoundéré, Communauté urbaine de Ngaoundéré, Vina, Adamaoua, BP 353/NGAOUNDÉRÉ, Cameroun" place PETIT MARCHE 0.4 Cameroun FALSE
+epfl ch Europe Western Europe FALSE 7 2021-02-03 95072766 way "École Polytechnique Fédérale de Lausanne, Route de la Sorge, Quartier Sorge, Ecublens, District de l'Ouest lausannois, Vaud, 1015, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.483095905643059 Schweiz/Suisse/Svizzera/Svizra FALSE
+tess ch Europe Western Europe FALSE 7 2021-02-03 258262464 relation "Diesse, Plateau de Diesse, Arrondissement administratif du Jura bernois, Région administrative du Jura bernois, Bern/Berne, 2517, Schweiz/Suisse/Svizzera/Svizra" boundary administrative 0.34859234613195 Schweiz/Suisse/Svizzera/Svizra FALSE
+wmo ch Europe Western Europe FALSE 7 2021-02-03 89750216 way "Organisation Météorologique Mondiale, 7 bis, Avenue de la Paix, Sécheron, Pâquis, Genève, 1211, Schweiz/Suisse/Svizzera/Svizra" office government 0.474195817992651 Schweiz/Suisse/Svizzera/Svizra FALSE
+york university ca Americas Northern America FALSE 7 2021-02-03 259467282 relation "York University, 120, Ian Macdonald Boulevard, Humber River—Black Creek, North York, Toronto, Golden Horseshoe, Ontario, M7A 2C5, Canada" railway station 0.558338814941197 Canada FALSE
+moderna br Americas South America FALSE 7 2021-02-03 52890773 node "Moderna, Sertânia, Região Geográfica Imediata de Arcoverde, Região Geográfica Intermediária de Caruaru, Pernambuco, Região Nordeste, Brasil" place village 0.375 Brasil FALSE
+benin bj Africa Western Africa FALSE 7 2021-02-03 258030246 relation Bénin boundary administrative 0.667613308618136 Bénin FALSE
+exxonmobil be Europe Western Europe FALSE 7 2021-02-03 92996065 way "ExxonMobil, Antwerpen, Vlaanderen, 2030, België / Belgique / Belgien" landuse industrial 0.3 België / Belgique / Belgien FALSE
+macquarie university au Oceania Australia and New Zealand FALSE 7 2021-02-03 139533038 way "Macquarie University, University Avenue, Macquarie Park, Sydney, Council of the City of Ryde, New South Wales, 2113, Australia" amenity university 0.669953649018245 Australia FALSE
+queensland university of technology au Oceania Australia and New Zealand FALSE 7 2021-02-03 94497763 way "Queensland University of Technology, Kelvin Grove Road, Kelvin Grove, Brisbane City, Queensland, 4059, Australia" amenity university 0.401 Australia FALSE
+university of buenos aires ar Americas South America FALSE 7 2021-02-03 59478624 node "universidad de Morón, 221, Lima, Monserrat, Buenos Aires, Comuna 1, Ciudad Autónoma de Buenos Aires, 1076, Argentina" amenity school 0.201 Argentina FALSE
+stellenbosch university za Africa Southern Africa FALSE 6 2021-02-03 208348417 way "Universiteit Stellenbosch, Smuts, Stellenbosch Ward 9, Dalsig, Stellenbosch Local Municipality, Cape Winelands District Municipality, Western Cape, 7599, South Africa" amenity university 0.554011689337226 South Africa FALSE
+falcon ve Americas South America FALSE 6 2021-02-03 1238826 node "Falcón, Región Centroccidental, Venezuela" place state 0.55 Venezuela FALSE
+alphabet us Americas Northern America FALSE 6 2021-02-03 225684906 way "Alphabet, Horace Mann, Japantown, San Jose, Santa Clara County, California, 95112-3580, United States" highway footway 0.175 United States FALSE
+american university us Americas Northern America FALSE 6 2021-02-03 99772807 way "American University, 4400, Massachusetts Avenue Northwest, Cathedral Heights, Washington, District of Columbia, 20016, United States" amenity university 0.717014338477232 United States FALSE
+arc us Americas Northern America FALSE 6 2021-02-03 101560700 way "Ames Research Center, Santa Clara County, California, 94035-0016, United States" landuse industrial 0.567592905439716 United States FALSE
+brandeis university us Americas Northern America FALSE 6 2021-02-03 128290139 way "Brandeis University, Boynton Street, Banks Square, Riverview, Waltham, Middlesex County, Massachusetts, 02453-2728, United States" amenity university 0.201 United States FALSE
+brookings institution us Americas Northern America FALSE 6 2021-02-03 42626050 node "The Brookings Institution, 1755, Massachusetts Avenue Northwest, Dupont Circle and surrunding block, Dupont Circle, Washington, District of Columbia, 20036, United States" place house 0.201 United States FALSE
+capitol hill us Americas Northern America FALSE 6 2021-02-03 2913454 node "Capitol Hill, Washington, District of Columbia, 20540, United States" place locality 0.633871158129342 United States FALSE
+children's hospital boston us Americas Northern America FALSE 6 2021-02-03 146447101 way "Boston Children's Hospital, 300, Blackfan Street, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.763455742331178 United States FALSE
+city university of new york us Americas Northern America FALSE 6 2021-02-03 179360561 way "Queens College, City University of New York, 152nd Street, Queens, Queens County, New York, 11367, United States" amenity university 0.9318394385017 United States FALSE
+cleveland clinic us Americas Northern America FALSE 6 2021-02-03 181161483 way "Cleveland Clinic, 9500, Euclid Avenue, Hough, University Circle, Cleveland, Cuyahoga County, Ohio, 44195, United States" amenity hospital 0.607266933591874 United States FALSE
+diamond us Americas Northern America FALSE 6 2021-02-03 257115549 relation "Diamond, Grundy County, Illinois, United States" boundary administrative 0.534194405720176 United States FALSE
+hughes us Americas Northern America FALSE 6 2021-02-03 258255449 relation "Hughes County, South Dakota, 57501, United States" boundary administrative 0.571820093574305 United States FALSE
+institute for advanced study in princeton us Americas Northern America FALSE 6 2021-02-03 96388432 way "Institute for Advanced Study, Goldman Lane, Princeton, Mercer County, New Jersey, 08540, United States" amenity university 1.1343793531708 United States FALSE
+institute of mathematical sciences us Americas Northern America FALSE 6 2021-02-03 55398385 node "Courant Institute of Mathematical Sciences, 251, Mercer Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States" amenity university 0.822385266730329 United States FALSE
+kent state university us Americas Northern America FALSE 6 2021-02-03 134730614 way "Kent State University, Health Center Drive, Kent, Portage County, Ohio, 44242-0001, United States" amenity university 0.781992451472996 United States FALSE
+labor party us Americas Northern America FALSE 6 2021-02-03 205366515 way "Socialist Labor Party Hall, 46, Barre, Barre City, Washington County, Vermont, 496, United States" boundary protected_area 0.405371759161912 United States FALSE
+laval university us Americas Northern America FALSE 6 2021-02-03 91625841 way "Laval Drive, Blackberry Estates, University City, Saint Louis County, Missouri, 63132, United States" highway residential 0.3 United States FALSE
+liberal us Americas Northern America FALSE 6 2021-02-03 258136520 relation "Liberal, Seward County, Kansas, United States" boundary administrative 0.57453184281069 United States FALSE
+manoa us Americas Northern America FALSE 6 2021-02-03 7215417 node "Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" place suburb 0.412408728172101 United States FALSE
+montana state university us Americas Northern America FALSE 6 2021-02-03 165822886 way "Montana State University, West College Street, Bozeman, Gallatin County, Montana, 59715, United States" amenity university 0.729796188420265 United States FALSE
+new democratic party us Americas Northern America FALSE 6 2021-02-03 229030677 way "Democratic Party, 46, South Main Street, Marshall, Madison County, North Carolina, 28753, United States" office political_party 0.201 United States FALSE
+nyu us Americas Northern America FALSE 6 2021-02-03 114164826 way "New York University, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States" amenity university 0.634621425344776 United States FALSE
+ok us Americas Northern America FALSE 6 2021-02-03 258391951 relation "Oklahoma, United States" boundary administrative 0.814016195392348 United States FALSE
+pentagon us Americas Northern America FALSE 6 2021-02-03 258346723 relation "Pentagon, Corridor 6, Arlington, Arlington County, Virginia, 20310, United States" military office 0.666673809290972 United States FALSE
+princeton plasma physics laboratory us Americas Northern America FALSE 6 2021-02-03 96034748 way "Princeton Plasma Physics Laboratory, 100, Stellarator Road, Plainsboro Township, Princeton, Middlesex County, New Jersey, 08540, United States" amenity research_institute 0.776937105996802 United States FALSE
+san francisco state university us Americas Northern America FALSE 6 2021-02-03 96725450 way "San Francisco State University, 19th Avenue, San Francisco, San Francisco City and County, California, 94132, United States" amenity university 0.902969926456814 United States FALSE
+smithsonian us Americas Northern America FALSE 6 2021-02-03 5566830 node "Smithsonian American Art Museum, 750, 9th Street Northwest, Penn Quarter, Washington, District of Columbia, 20001, United States" tourism museum 0.591127986916952 United States FALSE
+snyder us Americas Northern America FALSE 6 2021-02-03 259276147 relation "Snyder, Scurry County, Texas, United States" boundary administrative 0.571174722238935 United States FALSE
+tulane university us Americas Northern America FALSE 6 2021-02-03 97823120 way "Tulane University, South Claiborne Avenue, Broadmoor, Uptown, New Orleans, Orleans Parish, Louisiana, 70118, United States" amenity university 0.72920861071119 United States FALSE
+utc us Americas Northern America FALSE 6 2021-02-03 130801377 way "University Teaching Center, 105, East 21st Street, The Drag, Austin, Travis County, Texas, 78705, United States" building university 0.135420222661424 United States FALSE
+yale university in new haven us Americas Northern America FALSE 6 2021-02-03 258788418 relation "Yale University, West Haven, New Haven County, Connecticut, 06516, United States" amenity university 1.05963616015799 United States FALSE
+tunisia tn Africa Northern Africa FALSE 6 2021-02-03 258390327 relation تونس boundary administrative 0.734006780061664 تونس FALSE
+ska th Asia South-Eastern Asia FALSE 6 2021-02-03 301424908 relation "จังหวัดสงขลา, ประเทศไทย" boundary administrative 0.486153860067244 ประเทศไทย FALSE
+snp sk Europe Eastern Europe FALSE 6 2021-02-03 258637575 relation "SNP, Považská Bystrica, okres Považská Bystrica, TrenÄ<8d>iansky kraj, Západné Slovensko, Slovensko" boundary administrative 0.35 Slovensko FALSE
+slovenia si Europe Southern Europe FALSE 6 2021-02-03 258398896 relation Slovenija boundary administrative 0.768267137056828 Slovenija FALSE
+swedish museum of natural history se Europe Northern Europe FALSE 6 2021-02-03 217046 node "Naturhistoriska riksmuseet, Frescativägen, Ekhagen, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 18, Sverige" tourism museum 0.431447409196647 Sverige FALSE
+samsung ru Europe Eastern Europe FALSE 6 2021-02-03 298004709 relation "Samsung, ЛиговÑ<81>кий проÑ<81>пект, округ Лиговка-ЯмÑ<81>каÑ<8f>, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" craft electronics_repair 0.681482163173531 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+us securities and exchange commission pk Asia Southern Asia FALSE 6 2021-02-03 226472772 way "Securities and Exchange Commission, Leckil Road, Central Business District, Sultanabad, Lyari, کراچی, سنڌ, 72500, پاکستان" office government 0.501 پاکستان FALSE
+committee ph Asia South-Eastern Asia FALSE 6 2021-02-03 94937180 way "Committee, Batasan Hills, 2nd District, Quezon City, Metro Manila, 1126, Luzon" highway residential 0.2 Luzon FALSE
+department of agriculture ph Asia South-Eastern Asia FALSE 6 2021-02-03 106739978 way "Department of Agriculture, Vasra, 1st District, Quezon City, Metro Manila, 1128, Luzon" landuse commercial 0.5 Luzon FALSE
+american association of physical anthropologists NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for cell biology NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+aquabounty technologies NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of universities for research in astronomy NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrophysical journal letters NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+california institute for regenerative medicine NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of leuven NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's lamont-doherty earth observatory NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+culham centre for fusion energy NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+frankfurt institute for advanced studies NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+free university of amsterdam NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+free university of brussels NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+fundamental science review NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+german cancer research center NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+gfz german research centre for geosciences NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+global biological standards institute NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+high energy accelerator research organization NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for health metrics and evaluation NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+lux research NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centers for environmental information NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on drug abuse NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural environment research council NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature neuroscience NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew charitable trusts NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken center for developmental biology NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+simons foundation NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for american archaeology NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+spitzer space telescope NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford university school of medicine NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+stratospheric observatory for infrared astronomy NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss federal institute of technology zurich NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations convention on biological diversity NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of freiburg NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+world health assembly NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale university school of medicine NONE NA NA FALSE 6 2021-02-03 NA NA NA NA NA NA NA FALSE
+european patent office nl Europe Western Europe FALSE 6 2021-02-03 99793708 way "European Patent Office, Rijswijk, Zuid-Holland, Nederland" landuse commercial 0.5 Nederland FALSE
+european space research and technology centre nl Europe Western Europe FALSE 6 2021-02-03 296384894 way "European Space Research and Technology Centre, Noordwijk, Zuid-Holland, Nederland, 2201AZ, Nederland" landuse commercial 1.01579756663961 Nederland FALSE
+wageningen university nl Europe Western Europe FALSE 6 2021-02-03 235168671 way "Wageningen University & Research, Bornsesteeg, Wageningen, Gelderland, Nederland, 6708PE, Nederland" amenity university 0.285440647712364 Nederland FALSE
+nicaragua ni Americas Central America FALSE 6 2021-02-03 258223262 relation Nicaragua boundary administrative 0.795002067004934 Nicaragua FALSE
+peta ng Africa Western Africa FALSE 6 2021-02-03 258544920 relation "Peta, Kwaya Kusar, Borno, Nigeria" boundary administrative 0.45 Nigeria FALSE
+ross ice shelf NA Africa Southern Africa FALSE 6 2021-02-03 258745006 relation Ross Ice Shelf natural glacier 0.793636263858092 NA FALSE
+mrsa my Asia South-Eastern Asia FALSE 6 2021-02-03 247579802 way "Malaysia Remote Sensing Agency, Mentakab, Temerloh, Pahang, Malaysia" landuse industrial 0.2 Malaysia FALSE
+agu mx Americas Central America FALSE 6 2021-02-03 258383817 relation "Aguascalientes, México" boundary administrative 0.651698731260612 México FALSE
+university grants commission lk Asia Southern Asia FALSE 6 2021-02-03 48686537 node "University Grants Commission, Ward Place, TownHall, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 800, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office government 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+korea advanced institute of science and technology kr Asia Eastern Asia FALSE 6 2021-02-03 107053417 way "í•œêµê³¼í•™ê¸°ìˆ ì›<90>, 291, 대학로, 온천2ë<8f>™, 온천ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 34141, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+euratom it Europe Southern Europe FALSE 6 2021-02-03 233423450 way "Joint Research Centre, Barza, Ispra, Varese, Lombardia, Italia" landuse industrial 0.363793454953531 Italia FALSE
+allen institute in Asia Southern Asia FALSE 6 2021-02-03 300497581 node "Allen Career Institute Jalahalli East, MS Ramaiah Road, Doddabomasandra, Dodda Bommasandra, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560014, India" office educational_institution 0.201 India FALSE
+cbd in Asia Southern Asia FALSE 6 2021-02-03 3342193 node "Car Nicobar Air Force Station, Car Nicobar, Nicobar, Andaman and Nicobar Islands, India" military airfield 0.416945583987361 India FALSE
+department of biotechnology in Asia Southern Asia FALSE 6 2021-02-03 129892474 way "Department of Biotechnology, Calicut University Villooniyal Road, Villoonniyal, Thenhipalam, Tirurangadi, Malappuram, Kerala, 673635, India" building university 0.301 India FALSE
+tata institute of fundamental research in Asia Southern Asia FALSE 6 2021-02-03 259525635 relation "Tata Institute of Fundamental Research (TIFR), Survey No.36/P, Gopanpally - Wipro Road, Ward 105 Gachibowli, Hyderabad, Serilingampalle mandal, Rangareddy, Telangana, 500107, India" office research 0.722549534893346 India FALSE
+israel institute of technology il Asia Western Asia FALSE 6 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+id id Asia South-Eastern Asia FALSE 6 2021-02-03 257918359 relation Indonesia boundary administrative 0.815582040548682 Indonesia FALSE
+amnesty international gb Europe Northern Europe FALSE 6 2021-02-03 299249192 way "Amnesty International, Magdalen Road, Robin Hood, Oxford, Oxfordshire, South East, England, OX4 1RQ, United Kingdom" office association 0.201 United Kingdom FALSE
+bis gb Europe Northern Europe FALSE 6 2021-02-03 154731847 way "Business, Energy & Industrial Strategy, 1, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1H 0ET, United Kingdom" office government 0.414108902120048 United Kingdom FALSE
+department for international development gb Europe Northern Europe FALSE 6 2021-02-03 98247145 way "Department for International Development, 22-24, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2WH, United Kingdom" office government 0.401 United Kingdom FALSE
+energy and industrial strategy gb Europe Northern Europe FALSE 6 2021-02-03 154731847 way "Business, Energy & Industrial Strategy, 1, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1H 0ET, United Kingdom" office government 0.814108902120048 United Kingdom FALSE
+great britain gb Europe Northern Europe FALSE 6 2021-02-03 302503364 relation "Great Britain, United Kingdom" place island 0.896790110521564 United Kingdom FALSE
+interior department gb Europe Northern Europe FALSE 6 2021-02-03 88415175 way "The Department, Lawton Street, Ropewalks, Liverpool, North West England, England, L1 1FS, United Kingdom" building yes 0.101 United Kingdom FALSE
+international institute for environment and development gb Europe Northern Europe FALSE 6 2021-02-03 42420083 node "International Institute for Environment and Development, 4, Hanover Street, New Town, New Town/Broughton, City of Edinburgh, Scotland, EH2 2EN, United Kingdom" office yes 0.601 United Kingdom FALSE
+international whaling commission gb Europe Northern Europe FALSE 6 2021-02-03 130872832 way "International Whaling Commission, Station Road, Impington, South Cambridgeshire, Cambridgeshire, East of England, England, CB24 9LF, United Kingdom" building yes 0.301 United Kingdom FALSE
+microsoft research gb Europe Northern Europe FALSE 6 2021-02-03 139659987 way "Microsoft Research, 21, Station Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB1 2FB, United Kingdom" building commercial 0.201 United Kingdom FALSE
+royal astronomical society gb Europe Northern Europe FALSE 6 2021-02-03 2216371 node "Royal Astronomical Society, Burlington Arcade, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1J 0ET, United Kingdom" amenity learned_society;library 0.794024211333493 United Kingdom FALSE
+science and technology facilities council gb Europe Northern Europe FALSE 6 2021-02-03 103985987 way "Royal Observatory, Edinburgh, Observatory Road, Blackford Hill, Blackford, City of Edinburgh, Scotland, EH9 3HJ, United Kingdom" tourism attraction 0.460151663261328 United Kingdom FALSE
+unicef gb Europe Northern Europe FALSE 6 2021-02-03 112681341 way "UNICEF, 30a, Great Sutton Street, Farringdon, Clerkenwell, London Borough of Islington, London, Greater London, England, EC1V 0DU, United Kingdom" office ngo 0.694034602256172 United Kingdom FALSE
+university of kent gb Europe Northern Europe FALSE 6 2021-02-03 130686043 way "University of Kent, Giles Lane, Hales Place, Tyler Hill, Canterbury, Kent, South East, England, CT2 7NJ, United Kingdom" amenity university 0.789199447242987 United Kingdom FALSE
+aix-marseille university fr Europe Western Europe FALSE 6 2021-02-03 99572106 way "Aix-Marseille Université - Campus de Saint-Charles, Avenue Général Leclerc, Saint-Lazare, 3e Arrondissement, Marseille, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13003, France" amenity university 0.669227485691559 France FALSE
+iau fr Europe Western Europe FALSE 6 2021-02-03 80025084 node "International Astronomical Union, 98 bis, Boulevard Arago, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" office company 0.628915221808463 France FALSE
+university of paris-sud fr Europe Western Europe FALSE 6 2021-02-03 125512473 way "Université Paris 1 Panthéon-Sorbonne Centre Pierre Mendès-France, 90, Rue de Tolbiac, Cité Florale, Quartier de la Maison-Blanche, Paris 13e Arrondissement, Paris, Île-de-France, France métropolitaine, 75013, France" amenity university 0.320860870373788 France FALSE
+european chemicals agency fi Europe Northern Europe FALSE 6 2021-02-03 228733010 way "ECHA, 6, Telakkakatu, Viiskulma, Punavuori, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00150, Suomi / Finland" office government 0.58713884113187 Suomi / Finland FALSE
+university of barcelona es Europe Southern Europe FALSE 6 2021-02-03 87708249 way "Universitat de Barcelona, Gran Via de les Corts Catalanes, l'Antiga Esquerra de l'Eixample, Eixample, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España" amenity university 0.420054390558144 España FALSE
+ec ec Americas South America FALSE 6 2021-02-03 258316020 relation Ecuador boundary administrative 0.839288603689881 Ecuador FALSE
+democratic dz Africa Northern Africa FALSE 6 2021-02-03 258028956 relation Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر boundary administrative 0.758319025069823 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+european space operations centre de Europe Western Europe FALSE 6 2021-02-03 112384523 way "European Space Operations Centre, Waldkolonie, Darmstadt-Nord, Darmstadt, Hessen, 64293, Deutschland" landuse institutional 0.6 Deutschland FALSE
+goethe university de Europe Western Europe FALSE 6 2021-02-03 682490 node "Goethe-Denkmal, Edsger-W.-Dijkstra-Gedächtnisweg, Universitätsviertel, Martinsviertel-West, Darmstadt-Nord, Darmstadt, Hessen, 64289, Deutschland" historic memorial 0.219931111449547 Deutschland FALSE
+max planck institute for biological cybernetics de Europe Western Europe FALSE 6 2021-02-03 258094329 relation "Max-Planck-Institut für Biologische Kybernetik, 8, Max-Planck-Ring, Max-Planck-Institut, Schönblick / Winkelwiese, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland" building office 0.515802194348806 Deutschland FALSE
+max planck institute of molecular cell biology and genetics de Europe Western Europe FALSE 6 2021-02-03 95773291 way "Max-Planck-Institut für molekulare Zellbiologie und Genetik, 108, Pfotenhauerstraße, Johannstadt-Nord, Johannstadt, Altstadt, Dresden, Sachsen, 01307, Deutschland" office research 0.624670737896991 Deutschland FALSE
+mpa de Europe Western Europe FALSE 6 2021-02-03 100723451 way "MPA, Wiesenau, Brieskow-Finkenheerd, Oder-Spree, Brandenburg, 15295, Deutschland" landuse farmyard 0.3 Deutschland FALSE
+university of bonn de Europe Western Europe FALSE 6 2021-02-03 20122302 node "Rheinische Friedrich-Wilhelms-Universität Bonn, Arkadenhof, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.790223294922313 Deutschland FALSE
+university of münster de Europe Western Europe FALSE 6 2021-02-03 258955070 relation "Westfälische Wilhelms-Universität, 2, Schlossplatz, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland" amenity university 0.65844573834098 Deutschland FALSE
+venus express de Europe Western Europe FALSE 6 2021-02-03 16140825 node "Syrisches Pizza, 53, Bahnhofstraße, Breddeviertel, Witten-Mitte, Witten, Ennepe-Ruhr-Kreis, Nordrhein-Westfalen, 58452, Deutschland" amenity fast_food 0.001 Deutschland FALSE
+center for food safety cn Asia Eastern Asia FALSE 6 2021-02-03 302473941 way "食物安全ä¸å¿ƒ Centre for Food Safety, 磅巷 Pound Lane, 西å<8d>Šå±± Mid-Levels West, å<8d>Šå±±å<8d>€ Mid-Levels, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, N/A, ä¸å›½" building yes 0.301 ä¸å›½ FALSE
+china national space administration cn Asia Eastern Asia FALSE 6 2021-02-03 226170093 way "ä¸å›½ç©ºé—´æŠ€æœ¯ç ”究院, å”<90>家å²æ<9d>‘, 海淀区, 北京市, ä¸å›½" landuse commercial 0.370940340656356 ä¸å›½ FALSE
+china university of geosciences cn Asia Eastern Asia FALSE 6 2021-02-03 259360085 relation "ä¸å›½åœ°è´¨å¤§å¦ï¼ˆæ¦æ±‰ï¼‰, 388å<8f>·, é²<81>磨路, 关山街é<81>“, 洪山区, 湖北çœ<81>, 430074, ä¸å›½" amenity university 0.382526166251558 ä¸å›½ FALSE
+chinese academy of agricultural sciences cn Asia Eastern Asia FALSE 6 2021-02-03 299451471 way "ä¸å›½å†œä¸šç§‘å¦é™¢, 北三环, 万柳地区, 海淀区, 北京市, 100098, ä¸å›½" amenity research_institute 0.001 ä¸å›½ FALSE
+city university of hong kong cn Asia Eastern Asia FALSE 6 2021-02-03 258416888 relation "é¦™æ¸¯åŸŽå¸‚å¤§å¸ City University of Hong Kong, 煙墩山隧é<81>“ Beacon Hill Tunnel, 顯田 Hin Tin, 深水埗å<8d>€ Sham Shui Po District, ä¹<9d>é¾<8d> Kowloon, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, 000000, ä¸å›½" amenity university 0.995013581495974 ä¸å›½ FALSE
+hainan cn Asia Eastern Asia FALSE 6 2021-02-03 258588983 relation "æµ·å<8d>—çœ<81>, ä¸å›½" boundary administrative 0.61214060827491 ä¸å›½ FALSE
+instagram cn Asia Eastern Asia FALSE 6 2021-02-03 174127886 way "Instagram Pier, 石塘咀 Shek Tong Tsui, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" highway service 0.357277503353622 ä¸å›½ FALSE
+tsinghua cn Asia Eastern Asia FALSE 6 2021-02-03 259261903 relation "清å<8d>Žå¤§å¦, 30, å<8f>Œæ¸…è·¯, 五é<81>“å<8f>£, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100084, ä¸å›½" amenity university 0.540801021048672 ä¸å›½ FALSE
+university of science and technology of china cn Asia Eastern Asia FALSE 6 2021-02-03 155145876 way "ä¸å›½ç§‘å¦æŠ€æœ¯å¤§å¦ åŒ—æ ¡åŒº, 黄山路, 通和大厦, 三里庵街é<81>“, å<90>ˆè‚¥å¸‚区, å<90>ˆè‚¥å¸‚, 230022, ä¸å›½" amenity university 0.464121550533476 ä¸å›½ FALSE
+eth zurich ch Europe Western Europe FALSE 6 2021-02-03 45376322 node "ETH Merchandise Store, 3, Sonneggstrasse, Oberstrass, Kreis 6, Zürich, Bezirk Zürich, Zürich, 8092, Schweiz/Suisse/Svizzera/Svizra" shop clothes 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+world intellectual property organization ch Europe Western Europe FALSE 6 2021-02-03 75817483 node "World Intellectual Property Organization, Chemin des Colombettes, Moillebeau, Petit-Saconnex et Servette, Genève, 1209, Schweiz/Suisse/Svizzera/Svizra" office yes 0.401 Schweiz/Suisse/Svizzera/Svizra FALSE
+central african republic cf Africa Middle Africa FALSE 6 2021-02-03 257558721 relation Ködörösêse tî Bêafrîka - République Centrafricaine boundary administrative 0.669810150148004 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+woods hole research center cd Africa Middle Africa FALSE 6 2021-02-03 24158480 node "Woods Hole Research Center, Avenue Clinique, Ibanga, Mbandaka, Équateur, République démocratique du Congo" office ngo 0.401 République démocratique du Congo FALSE
+carleton university ca Americas Northern America FALSE 6 2021-02-03 88329470 way "Carleton University, 1125, Colonel By Drive, Capital, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1S 5B7, Canada" amenity university 0.698422783543645 Canada FALSE
+mcmaster university in hamilton ca Americas Northern America FALSE 6 2021-02-03 95450699 way "McMaster University, Main Street West, Westdale, Hamilton, Golden Horseshoe, Ontario, L8S 1B3, Canada" amenity university 0.904585752093457 Canada FALSE
+national health commission ca Americas Northern America FALSE 6 2021-02-03 128238070 way "Boundary Trails Health Centre, Boundary Commission Trail, Morden, Stanley, Manitoba, R6M 1P3, Canada" amenity hospital 0.201 Canada FALSE
+triton ca Americas Northern America FALSE 6 2021-02-03 16414366 node "Triton, unincorporated Newfoundland, Newfoundland, Newfoundland and Labrador, Canada" place town 0.4 Canada FALSE
+bulgaria bg Europe Eastern Europe FALSE 6 2021-02-03 257859201 relation БългaриÑ<8f> boundary administrative 0.785388247880598 БългaриÑ<8f> FALSE
+european council be Europe Western Europe FALSE 6 2021-02-03 76246823 node "EUCO, 175, Rue de la Loi - Wetstraat, Quartier européen - Europese Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1048, België / Belgique / Belgien" office government 0.001 België / Belgique / Belgien FALSE
+ghent university be Europe Western Europe FALSE 6 2021-02-03 114264163 way "Universiteit Gent Vakgroep Textielkunde, 70A, Technologiepark-Zwijnaarde, Wetenschapspark Ardoyen, Zwijnaarde, Gent, Oost-Vlaanderen, Vlaanderen, 9052, België / Belgique / Belgien" building yes 0.513953996266395 België / Belgique / Belgien FALSE
+national academies of sciences be Europe Western Europe FALSE 6 2021-02-03 16772906 node "Académie royale des Sciences, des Lettres et des Beaux-Arts de Belgique, Rue Ducale - Hertogstraat, Quartier Royal - Koninklijke Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1000, België / Belgique / Belgien" office yes 0.201 België / Belgique / Belgien FALSE
+university of liège be Europe Western Europe FALSE 6 2021-02-03 123758853 way "HEC Liège, Rue Reynier, Saint-Laurent, Glain, Liège, Wallonie, 4000, België / Belgique / Belgien" amenity university 0.101 België / Belgique / Belgien FALSE
+flinders university au Oceania Australia and New Zealand FALSE 6 2021-02-03 145152966 way "Flinders University, Shepherds Hill Road, Bellevue Heights, Adelaide, City of Mitcham, South Australia, 5050, Australia" amenity university 0.201 Australia FALSE
+science & technology australia au Oceania Australia and New Zealand FALSE 6 2021-02-03 99632951 way "Science 1 (N25), Technology Lane, Nathan, Brisbane City, Queensland, 4111, Australia" building university 0.301 Australia FALSE
+academy of science of south africa za Africa Southern Africa FALSE 5 2021-02-03 234711560 way "Cape Academy of Maths, Science and Technology, Cushat Close, Sweet Valley, Constantia, City of Cape Town, Western Cape, 7806, South Africa" amenity college 0.601 South Africa FALSE
+university of kwazulu-natal za Africa Southern Africa FALSE 5 2021-02-03 118132354 way "University of KwaZulu-Natal, Fairfield Avenue, Scottsville, Msunduzi Ward 33, Pietermaritzburg, Msunduzi Local Municipality, uMgungundlovu District Municipality, KwaZulu-Natal, 3200, South Africa" amenity university 0.401 South Africa FALSE
+university of witwatersrand za Africa Southern Africa FALSE 5 2021-02-03 95936135 way "University of the Witwatersrand, Empire Road, Parktown, Johannesburg Ward 87, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" amenity university 0.77569370880422 South Africa FALSE
+vanuatu vu Oceania Melanesia FALSE 5 2021-02-03 258495458 relation Vanuatu boundary administrative 0.741390776726574 Vanuatu FALSE
+marie curie university vn Asia South-Eastern Asia FALSE 5 2021-02-03 164542463 way "Marie Curie, Vietnam National University HCMC, PhÆ°á»<9d>ng Ä<90>ông Hòa, Thà nh phố DÄ© An, Tỉnh Bình DÆ°Æ¡ng, 7200000, Việt Nam" highway residential 0.4 Việt Nam FALSE
+virgin islands vg Americas Caribbean FALSE 5 2021-02-03 258226789 relation British Virgin Islands boundary administrative 0.809067636380411 British Virgin Islands FALSE
+american statistical association us Americas Northern America FALSE 5 2021-02-03 144357197 way "American Statistical Association, 732, North Washington Street, Jefferson Houston, Alexandria, Virginia, 22314, United States" office foundation 0.301 United States FALSE
+avac us Americas Northern America FALSE 5 2021-02-03 126885480 way "AVAC Equipment Control Building, 4930, Caribbean Way, Bay Lake, Reedy Creek Improvement District, Orange County, Florida, 32830, United States" craft hvac 0.101 United States FALSE
+bard college us Americas Northern America FALSE 5 2021-02-03 166142313 way "Bard College, 30, Campus Road, Annandale-on-Hudson, Town of Red Hook, Dutchess County, New York, 12504, United States" amenity college 0.665268080528699 United States FALSE
+baylor us Americas Northern America FALSE 5 2021-02-03 258348836 relation "Baylor County, Texas, 76380, United States" boundary administrative 0.656007857309354 United States FALSE
+boston children's hospital us Americas Northern America FALSE 5 2021-02-03 146447101 way "Boston Children's Hospital, 300, Blackfan Street, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.763455742331178 United States FALSE
+boston college us Americas Northern America FALSE 5 2021-02-03 168144245 way "Boston College, 140, Commonwealth Avenue, Newton Centre, Newton, Middlesex County, Massachusetts, 02467, United States" amenity university 0.743540689832249 United States FALSE
+boston university school of medicine us Americas Northern America FALSE 5 2021-02-03 14708091 node "Boston University School of Medicine, Harrison Avenue, South End, Boston, Suffolk County, Massachusetts, 02118, United States" amenity university 0.501 United States FALSE
+brigham young university us Americas Northern America FALSE 5 2021-02-03 97425595 way "Brigham Young University, Campus Drive, Provo, Utah County, Utah, 84604, United States" amenity university 0.852231384786617 United States FALSE
+caledonia us Americas Northern America FALSE 5 2021-02-03 258349656 relation "Caledonia, Boone County, Illinois, United States" boundary administrative 0.522709819346418 United States FALSE
+california academy of sciences us Americas Northern America FALSE 5 2021-02-03 97642823 way "California Academy of Sciences, 55, Music Concourse Drive, San Francisco, San Francisco City and County, California, 94118, United States" tourism museum 0.401 United States FALSE
+central intelligence agency us Americas Northern America FALSE 5 2021-02-03 134865123 way "Central Intelligence Agency, Clearview Manor, McLean, Fairfax County, Virginia, United States" landuse government 0.5 United States FALSE
+columbia university medical center us Americas Northern America FALSE 5 2021-02-03 235180475 way "Columbia University, Reunion Plaza, Morningside Heights, Manhattan Community Board 9, Manhattan, New York County, New York, United States" amenity university 0.872550278643288 United States FALSE
+dsm us Americas Northern America FALSE 5 2021-02-03 258271826 relation "Des Moines International Airport, IA 28, Des Moines, Polk County, Iowa, 50321, United States" aeroway aerodrome 0.393012981942171 United States FALSE
+etc group us Americas Northern America FALSE 5 2021-02-03 194468754 way "ETC Group, 1997, 1100 East, Sugar House, Salt Lake City, Salt Lake County, Utah, 84106, United States" office engineering 0.201 United States FALSE
+florida international university us Americas Northern America FALSE 5 2021-02-03 116704484 way "Florida International University, East Campus Circle, Miami-Dade County, Florida, 33199, United States" amenity university 0.842176759304101 United States FALSE
+gemini observatory us Americas Northern America FALSE 5 2021-02-03 163883937 way "Gemini Observatory, 670, North Aohoku Place, Hilo CDP, Hawaiʻi County, Hawaii, 96720, United States" building yes 0.201 United States FALSE
+gilead us Americas Northern America FALSE 5 2021-02-03 299882604 relation "Gilead, Oxford County, Maine, United States" boundary administrative 0.485438474922168 United States FALSE
+harvard school of public health us Americas Northern America FALSE 5 2021-02-03 146383535 way "Harvard School of Public Health, Huntington Avenue, Roxbury, Boston, Suffolk County, Massachusetts, 02120, United States" amenity university 0.885556884947779 United States FALSE
+institute us Americas Northern America FALSE 5 2021-02-03 451003 node "Institute, Jefferson, Kanawha County, West Virginia, 25064, United States" place hamlet 0.454934934074513 United States FALSE
+inter-american development bank us Americas Northern America FALSE 5 2021-02-03 102806036 way "Inter-American Development Bank, 1300, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" office government 0.883362660493124 United States FALSE
+james clerk maxwell telescope us Americas Northern America FALSE 5 2021-02-03 5561092 node "James Clerk Maxwell Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.761564502190835 United States FALSE
+kansas state university us Americas Northern America FALSE 5 2021-02-03 258613534 relation "Kansas State University, College Avenue, Manhattan, Riley County, Kansas, 66506â€<90>1600, United States" amenity university 0.807972174654867 United States FALSE
+kennedy space center us Americas Northern America FALSE 5 2021-02-03 99967594 way "Kennedy Space, Bus Drop-Off, Brevard County, Florida, United States" amenity parking 0.201 United States FALSE
+lowell observatory us Americas Northern America FALSE 5 2021-02-03 138722097 way "Lowell Observatory, 1400, West Mars Hill Road, Flagstaff Townsite, Flagstaff, Coconino County, Arizona, 86001, United States" tourism attraction 0.720435832121165 United States FALSE
+myriad genetics us Americas Northern America FALSE 5 2021-02-03 99496081 way "Myriad Genetics, Wakara Way, Research Park, Salt Lake City, Salt Lake County, Utah, 84113, United States" building yes 0.201 United States FALSE
+national academy of sciences usa us Americas Northern America FALSE 5 2021-02-03 106787905 way "National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States" office ngo 1.00593943258948 United States FALSE
+national ecological observatory network us Americas Northern America FALSE 5 2021-02-03 39615877 node "National Ecological Observatory Network, 1685, 38th Street, Boulder, Boulder County, Colorado, 80301, United States" office research 0.401 United States FALSE
+ncar us Americas Northern America FALSE 5 2021-02-03 100783959 way "National Center for Atmospheric Research Mesa Lab, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" building government 0.491849073716688 United States FALSE
+newport news us Americas Northern America FALSE 5 2021-02-03 488126 node "Newport News, Virginia, 23607, United States" place city 0.686660556787456 United States FALSE
+office of research and development us Americas Northern America FALSE 5 2021-02-03 174203885 way "Office of Research and Development, Basil Street, Mobile, Mobile County, Alabama, 36603, United States" building college 0.501 United States FALSE
+ohio university us Americas Northern America FALSE 5 2021-02-03 181314709 way "Ohio University, Edgehill Drive, Athens, Athens County, Ohio, 45701, United States" amenity university 0.701814895980315 United States FALSE
+oklahoma state university us Americas Northern America FALSE 5 2021-02-03 140754357 way "Oklahoma State University, North Jefferson Street, Downtown Stillwater, Stillwater, Payne County, Oklahoma, 74078, United States" amenity university 0.764352569168409 United States FALSE
+pacific biosciences us Americas Northern America FALSE 5 2021-02-03 95009258 way "Pacific Biosciences, 1305, O'Brien Drive, Menlo Park, San Mateo County, California, 94025, United States" office company 0.201 United States FALSE
+plato us Americas Northern America FALSE 5 2021-02-03 258393720 relation "Plato, McLeod County, Minnesota, United States" boundary administrative 0.52505981939652 United States FALSE
+princeton us Americas Northern America FALSE 5 2021-02-03 258098921 relation "Princeton, Mercer County, New Jersey, United States" boundary administrative 0.6656381585396 United States FALSE
+rhic us Americas Northern America FALSE 5 2021-02-03 100399334 way "Renaissance Circle, Brookhaven National Laboratory, Suffolk County, New York, United States" highway residential 0.392697726015046 United States FALSE
+rockefeller us Americas Northern America FALSE 5 2021-02-03 320163 node "Rockefeller, Ogden, Weber County, Utah, 84403, United States" place locality 0.225 United States FALSE
+sandia national laboratories us Americas Northern America FALSE 5 2021-02-03 100715239 way "Sandia National Laboratories, Oakville Lane, Livermore, Alameda County, California, 94550, United States" amenity science_park 0.744009006305759 United States FALSE
+slac us Americas Northern America FALSE 5 2021-02-03 299175282 way "Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States" amenity research_center 0.427082745074033 United States FALSE
+smithsonian national museum of natural history us Americas Northern America FALSE 5 2021-02-03 107528703 way "National Museum of Natural History, Smithsonian Pollinator Garden Path, Penn Quarter, Washington, District of Columbia, 20560, United States" tourism museum 1.09276993072723 United States FALSE
+st jude children's research hospital us Americas Northern America FALSE 5 2021-02-03 258425834 relation "St. Jude Children's Research Hospital, 262, Danny Thomas Place, Lauderdale Courts, Memphis, Shelby County, Tennessee, 38105, United States" amenity hospital 1.00269308307499 United States FALSE
+university at buffalo us Americas Northern America FALSE 5 2021-02-03 106901822 way "University at Buffalo, The State University of New York, South Campus, Parkridge Avenue, University Heights, Buffalo, Erie County, New York, 14215, United States" amenity university 0.301 United States FALSE
+university of alaska us Americas Northern America FALSE 5 2021-02-03 208243462 way "University of Alaska, 45, Baranov Road, Cold Bay, Aleutians East, Alaska, 99571, United States" amenity university 0.301 United States FALSE
+university of colorado denver us Americas Northern America FALSE 5 2021-02-03 104339205 way "University of Colorado Denver, Cherry Creek Trail, Lower Downtown, Denver, Denver County, Colorado, 80217, United States" amenity university 0.66358119422997 United States FALSE
+university of eastern piedmont us Americas Northern America FALSE 5 2021-02-03 54983360 node "Clark University Graduate School of Geography, 936, Main Street, Main South, South Worcester, Worcester, Worcester County, Massachusetts, 01610, United States" office educational_institution 0.201 United States FALSE
+university of nevada us Americas Northern America FALSE 5 2021-02-03 253996236 way "University of Nevada, Las Vegas, 4505, East Tropicana Avenue, Midtown UNLV, Las Vegas, Clark County, Nevada, 89154, United States" amenity university 0.783772660357429 United States FALSE
+university of rhode island us Americas Northern America FALSE 5 2021-02-03 147160757 way "University of Rhode Island, Old North Road, Kingston, South Kingstown, South County, Rhode Island, 02881, United States" amenity university 0.860862691066137 United States FALSE
+university of vermont us Americas Northern America FALSE 5 2021-02-03 258538939 relation "University of Vermont, South Prospect Street, Burlington, Chittenden County, Vermont, 05401, United States" amenity university 0.80032620600642 United States FALSE
+us coast guard us Americas Northern America FALSE 5 2021-02-03 164331997 way "US Coast Guard, Berlin, Worcester County, Maryland, United States" landuse military 0.5 United States FALSE
+us department of the interior us Americas Northern America FALSE 5 2021-02-03 148880750 way "Rincon Mountain Visitor Center, 3693, South Old Spanish Trail, Tucson, Pima County, Arizona, 85748, United States" tourism information 0.001 United States FALSE
+usaid us Americas Northern America FALSE 5 2021-02-03 19295624 node "US Agency for International Development, 14th Street Northwest, Washington, District of Columbia, 20230, United States" office government 0.498819499208192 United States FALSE
+vassar college us Americas Northern America FALSE 5 2021-02-03 2621574 node "Vassar College, 124, Raymond Avenue, Town of Poughkeepsie, Dutchess County, New York, 12604, United States" amenity college 0.707352256464993 United States FALSE
+wake forest university us Americas Northern America FALSE 5 2021-02-03 2618233 node "Wake Forest University, 1834, Wake Forest Road, Reynolda Village, Winston-Salem, Forsyth County, North Carolina, 27106, United States" amenity university 0.804120989443361 United States FALSE
+whoi us Americas Northern America FALSE 5 2021-02-03 190610226 way "WHOI - Rose Garden, Falmouth, Barnstable County, Massachusetts, United States" leisure park 0.25 United States FALSE
+united nations development programme ug Africa Eastern Africa FALSE 5 2021-02-03 44309116 node "United Nations Development Programme, Yusuf Lule Road, Kitante, Wandegeya, Kampala Capital City, Kampala, Central Region, 29880, Uganda" office quango 0.401 Uganda FALSE
+tuvalu tv Oceania Polynesia FALSE 5 2021-02-03 258343085 relation Tuvalu boundary administrative 0.717228207678876 Tuvalu FALSE
+hbp sk Europe Eastern Europe FALSE 5 2021-02-03 184618893 way "303/237, HBP a.s. - baňa Čáry, Čáry, okres Senica, Trnavský kraj, Západné Slovensko, 90843, Slovensko" landuse industrial 0.3 Slovensko FALSE
+karolinska university hospital se Europe Northern Europe FALSE 5 2021-02-03 119648320 way "Karolinska universitetssjukhuset, Ninni Kronbergs Gata, Hagastaden, Vasastaden, Norrmalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 113 65, Sverige" amenity hospital 0.44859234613195 Sverige FALSE
+national congress sd Africa Northern Africa FALSE 5 2021-02-03 143923175 way "National Congress, شارع المعونة, Al-Kadaro, SalÄ<81>mat al BÄ<81>shÄ<81>, الخرطوم, ولاية الخرطوم, 13311, السودان" amenity public_building 0.201 السودان FALSE
+starlink qa Asia Western Asia FALSE 5 2021-02-03 57040217 node "Starlink, شارع المنصورة, المنصورة, الدوØØ©, 10849, قطر" shop yes 0.101 قطر FALSE
+palestinian authority ps Asia Western Asia FALSE 5 2021-02-03 102008206 way "Palestinian Monetry Authority, Al Shuhadaa, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" amenity public_building 0.201 Palestinian Territory FALSE
+skype ps Asia Western Asia FALSE 5 2021-02-03 72916230 node "Skype, شارع الكركÙ<81>Ø©, Øارة التراجمة, بيت Ù„ØÙ…, منطقة Ø£, الضÙ<81>Ø© الغربية, 9045634, Palestinian Territory" amenity restaurant 0.101 Palestinian Territory FALSE
+chemical society pk Asia Southern Asia FALSE 5 2021-02-03 58642829 node "Pak Petro Chemical Pvt Ltd, قومی شاÛ<81>راÛ<81>, Sindhi Jamat Housing Society, Dogar Dairy Farm, Shah Latif Town, کراچی, سنڌ, 75030, پاکستان" office company 0.201 پاکستان FALSE
+department of the interior pe Americas South America FALSE 5 2021-02-03 182000790 way "Ministerio del Interior, Calle 21, Corpac, San Isidro, Lima, AN ISIDRO 15036, Perú" office government 0.33461374284578 Perú FALSE
+gns science nz Oceania Australia and New Zealand FALSE 5 2021-02-03 156362879 way "GNS Science, 1, Fairway Drive, Avalon, Lower Hutt City, Wellington, 5040, New Zealand / Aotearoa" office research 0.521073131097349 New Zealand / Aotearoa FALSE
+world wildlife fund np Asia Southern Asia FALSE 5 2021-02-03 19138585 node "World Wildlife Fund, Pabitra Pyara Marg, Kiran Chok, Baluwatar, Kathmandu Metropolitan Ward 4, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 44616, नेपाल" office ngo 0.301 नेपाल FALSE
+african academy of sciences NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred wegener institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred wegener institute for polar and marine research NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance for regenerative medicine NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+american psychological association NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing genomics institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomedical advanced research and development authority NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+breakthrough science society NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+british chiropractic association NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+british medical journal NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of louvain NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+cell press NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+chan zuckerberg initiative NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese center for disease control and prevention NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for epidemic preparedness innovations NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee of concerned scientists NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on publication ethics NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+confederation of spanish scientific societies NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep space climate observatory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+european atomic energy community NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+european commission's joint research centre NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+european planetary science congress NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+european science foundation NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal university of rio grande do norte NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+fusion power associates NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+gilead sciences of foster city NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+harbin veterinary research institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education policy institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+holtzbrinck publishing group NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+howard hughes medical institute's janelia research campus NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for climate change and development NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+jenner institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+jodrell bank observatory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+jülich research centre NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+ligo laboratory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunenfeld-tanenbaum research institute NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for meteorology NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for radio astronomy NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of science, technology and innovation" NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa goddard space flight center NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academies of science NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national children's study NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council for scientific and technological development NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for nuclear physics NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of general medical sciences NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature biotechnology NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york academy of sciences NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york stem cell foundation NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university's langone medical center NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel foundation NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford nanopore technologies NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific northwest national laboratory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+public employees for environmental responsibility NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+são paulo research foundation NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+smithsonian institution's national museum of natural history NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+university corporation for atmospheric research NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland school of medicine NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of general medical sciences NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+us naval research laboratory NONE NA NA FALSE 5 2021-02-03 NA NA NA NA NA NA NA FALSE
+eindhoven university of technology nl Europe Western Europe FALSE 5 2021-02-03 86000613 way "Technische Universiteit Eindhoven, 2, De Rondom, Centrum, Eindhoven, Noord-Brabant, Nederland, 5600MB, Nederland" amenity university 0.550731319596144 Nederland FALSE
+ema nl Europe Western Europe FALSE 5 2021-02-03 302037271 node "European Medicines Agency, 6, Domenico Scarlattilaan, Drentepark, Zuid, Amsterdam, Noord-Holland, Nederland, 1083HS, Nederland" office government 0.49651736792561 Nederland FALSE
+leiden university medical center nl Europe Western Europe FALSE 5 2021-02-03 257776634 relation "Leiden, Zuid-Holland, Nederland" boundary administrative 0.719246276766776 Nederland FALSE
+max planck institute for psycholinguistics nl Europe Western Europe FALSE 5 2021-02-03 157832152 way "Max Planck Institute for Psycholinguistics, Comeniuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525XD, Nederland" office research 0.828369791841981 Nederland FALSE
+tesla motors nl Europe Western Europe FALSE 5 2021-02-03 32789620 node "Tesla Motors, 29, Pieter Cornelisz. Hooftstraat, Museumkwartier, Amsterdam, Noord-Holland, Nederland, 1071BM, Nederland" shop car 0.703999921130091 Nederland FALSE
+university of twente nl Europe Western Europe FALSE 5 2021-02-03 164997651 way "ITC - Faculty of Geo-Information Science and Earth Observation, 99, Hengelosestraat, Schuttersveld, Enschede, Overijssel, Nederland, 7514, Nederland" amenity university 0.330361546636441 Nederland FALSE
+rts my Asia South-Eastern Asia FALSE 5 2021-02-03 133258714 way "Johor Bahru–Singapore Rapid Transit System / Sistem Transit Aliran Johor Bahru–Singapura, Jalan Lingkaran Dalam, Johor Bahru, Iskandar Malaysia, Johor, 80730, Malaysia" railway construction 0.373004776697036 Malaysia FALSE
+wmap my Asia South-Eastern Asia FALSE 5 2021-02-03 638414 node "Kluang Airstrip, 881 Army Aviation Regiment, Jalan Delima, Kluang, Johor, 86000, Malaysia" aeroway aerodrome 0.217338060184506 Malaysia FALSE
+mauritius mu Africa Eastern Africa FALSE 5 2021-02-03 258556432 relation Mauritius boundary administrative 0.769831293338391 Mauritius FALSE
+court of justice mt Europe Southern Europe FALSE 5 2021-02-03 123844812 way "Court of Justice, Triq ir-Repubblika, Valletta, Xlokk, 1112, Malta" tourism attraction 0.633256970094253 Malta FALSE
+usc md Europe Eastern Europe FALSE 5 2021-02-03 259256589 relation "Universitatea de Stat „Bogdan Petriceicu HaÈ™deuâ€<9d> din Cahul, 1, PiaÈ›a IndependenÈ›ei, Centru, Cahul, Raionul Cahul, Moldova" amenity college 0.256321943137092 Moldova FALSE
+european investment bank lu Europe Western Europe FALSE 5 2021-02-03 259404813 relation "European Investment Bank, Boulevard Konrad Adenauer, Quartier Européen Nord, Kirchberg, Luxembourg, Canton Luxembourg, 1115, Lëtzebuerg" building office 0.301 Lëtzebuerg FALSE
+lithuania lt Europe Northern Europe FALSE 5 2021-02-03 258088012 relation Lietuva boundary administrative 0.755558712203811 Lietuva FALSE
+keio university jp Asia Eastern Asia FALSE 5 2021-02-03 117198676 way "慶應義塾日å<90>‰ã‚ャンパス, 綱島街é<81>“, 港北区, 横浜市, 神奈å·<9d>県, 231-0017, 日本" amenity university 0.579652848044229 日本 FALSE
+international seabed authority jm Americas Caribbean FALSE 5 2021-02-03 177833065 way "International Seabed Authority HQ, Duke Street, Kingston, Surrey County, KINGSTON CSO, Jamaica" building yes 0.301 Jamaica FALSE
+jamaica jm Americas Caribbean FALSE 5 2021-02-03 258485445 relation Jamaica boundary administrative 0.807261561694498 Jamaica FALSE
+university of pisa it Europe Southern Europe FALSE 5 2021-02-03 95844002 way "Reserved university parking, Via Emanuele Filiberto (Duca d'Aosta), Pratale, Pisa, Toscana, 56127, Italia" amenity parking 0.201 Italia FALSE
+university of turin it Europe Southern Europe FALSE 5 2021-02-03 59730551 node "Università degli Studi di Torino - Dipartimento di Chimica, Via Pietro Giuria, San Salvario, Circoscrizione 8, Torino, Piemonte, 10125, Italia" amenity university 0.001 Italia FALSE
+indian institute of science education and research in Asia Southern Asia FALSE 5 2021-02-03 136293867 way "Indian Institute of Science, Education and Research, 1st Cross Road, Duttabad, FB Block, Rajarhat, North 24 Parganas, West Bengal, 700097, India" amenity university 0.701 India FALSE
+institute of astrophysics in Asia Southern Asia FALSE 5 2021-02-03 99960273 way "Indian Institute of Astrophysics, Koramangala 2nd Block, Koramangala, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, India" boundary wall 0.689453166408414 India FALSE
+national centre for biological sciences in Asia Southern Asia FALSE 5 2021-02-03 301582936 way "NCBS Bangalore, 5th Main Road, Canara Bank Layout, Vidyaranyapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560065, India" amenity research_institute 0.001 India FALSE
+weizmann institute il Asia Western Asia FALSE 5 2021-02-03 17630960 node "מכון ויצמן, הרצל, ×ž×¢×•× ×•×ª וולפסון, × ×•×•×” יהודה, רחובות, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל" highway bus_stop 0.001 ישר×<90>ל FALSE
+department of defense ie Europe Northern Europe FALSE 5 2021-02-03 258792189 relation "Department of Defense, Station Road, Morristownbiller ED, The Municipal District of Kildare — Newbridge, County Kildare, Leinster, W12 AD93, Éire / Ireland" office government 0.622075306013723 Éire / Ireland FALSE
+news & views ie Europe Northern Europe FALSE 5 2021-02-03 17702681 node "News and Views, Main Street, Bundoran Urban ED, Donegal Municipal District, County Donegal, Éire / Ireland" shop convenience 0.201 Éire / Ireland FALSE
+science policy research unit gh Africa Western Africa FALSE 5 2021-02-03 74607278 node "Science and Technology Policy Research Institute, Research Crescent, Maamobi, Kokomlemle, Accra Metropolitan, Greater Accra Region, 16033, Ghana" office research 0.301 Ghana FALSE
+airbus gb Europe Northern Europe FALSE 5 2021-02-03 227109417 way "Airbus, Filton, South Gloucestershire, South West England, England, BS34, United Kingdom" landuse industrial 0.3 United Kingdom FALSE
+antarctic survey gb Europe Northern Europe FALSE 5 2021-02-03 258339816 relation "British Antarctic Survey, High Cross, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0ET, United Kingdom" office research 0.201 United Kingdom FALSE
+british museum gb Europe Northern Europe FALSE 5 2021-02-03 257845646 relation "British Museum, Great Russell Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1B 3DG, United Kingdom" tourism museum 0.834130826976438 United Kingdom FALSE
+grantham research institute on climate change gb Europe Northern Europe FALSE 5 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.872343749103071 United Kingdom FALSE
+institute of neuroscience gb Europe Northern Europe FALSE 5 2021-02-03 258398614 relation "Institute of Psychiatry, Psychology & Neuroscience, 16, De Crespigny Park, Denmark Hill, Camberwell, London Borough of Southwark, London, Greater London, England, SE5 8AF, United Kingdom" building university 0.642242222837154 United Kingdom FALSE
+institute of zoology gb Europe Northern Europe FALSE 5 2021-02-03 100713929 way "Institute of Zoology, Outer Circle, Chalk Farm, London Borough of Camden, London, Greater London, England, NW1 4RY, United Kingdom" amenity research_institute 0.517338060184507 United Kingdom FALSE
+queen mary university of london gb Europe Northern Europe FALSE 5 2021-02-03 104273414 way "Queen Mary University of London, Mile End Road, Globe Town, Mile End, London Borough of Tower Hamlets, London, Greater London, England, E1 4NS, United Kingdom" amenity university 0.962411757792441 United Kingdom FALSE
+tea party gb Europe Northern Europe FALSE 5 2021-02-03 62281634 node "Tea Party, Friern Barnet Lane, Whetstone, London Borough of Barnet, London, Greater London, England, N20 0ND, United Kingdom" tourism artwork 0.201 United Kingdom FALSE
+trinity college gb Europe Northern Europe FALSE 5 2021-02-03 116907164 way "Trinity College, Parks Road, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 3PA, United Kingdom" amenity university 0.67805930713623 United Kingdom FALSE
+uk met office gb Europe Northern Europe FALSE 5 2021-02-03 259459361 relation "The Met Office, Fitzroy Road, Met Office, Monkerton, Exeter, Devon, South West England, England, EX1 3PB, United Kingdom" office weather 0.660932371570306 United Kingdom FALSE
+university and college union gb Europe Northern Europe FALSE 5 2021-02-03 146247548 way "University and College Union, Carlow Street, Somers Town, London Borough of Camden, London, Greater London, England, NW1 7LL, United Kingdom" office trade_union 0.401 United Kingdom FALSE
+vertex pharmaceuticals gb Europe Northern Europe FALSE 5 2021-02-03 74733580 node "Vertex Pharmaceuticals (U.K.) Limited, 2, Kingdom Street, Paddington Central, Paddington, City of Westminster, London, Greater London, England, W2 6PY, United Kingdom" office company 0.201 United Kingdom FALSE
+gabon ga Africa Middle Africa FALSE 5 2021-02-03 257869964 relation Gabon boundary administrative 0.777596981965525 Gabon FALSE
+aas fr Europe Western Europe FALSE 5 2021-02-03 258712681 relation "Aast, Pau, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64460, France" boundary administrative 0.654926295858348 France FALSE
+cgiar fr Europe Western Europe FALSE 5 2021-02-03 132938773 way "Groupe Consultatif pour la Recherche Agronomique Internationale, Rond-Point Professeur Louis Malassis, Aiguelongue, Hôpitaux-Facultés, Montpellier, Hérault, Occitanie, France métropolitaine, France" office research 0.001 France FALSE
+international bureau of weights and measures fr Europe Western Europe FALSE 5 2021-02-03 131402735 way "Bureau International des Poids et Mesures, Allée du Mail, Saint-Cloud, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92210, France" amenity public_building 0.558338814941197 France FALSE
+irb fr Europe Western Europe FALSE 5 2021-02-03 259557803 relation "IRB, Rue du Truel, Hôpitaux-Facultés, Montpellier, Hérault, Occitanie, France métropolitaine, 34090, France" building yes 0.101 France FALSE
+labor fr Europe Western Europe FALSE 5 2021-02-03 258575224 relation "Lavaur, Sarlat-la-Canéda, Dordogne, Nouvelle-Aquitaine, France métropolitaine, 24550, France" boundary administrative 0.540322729036538 France FALSE
+national assembly fr Europe Western Europe FALSE 5 2021-02-03 131548816 way "Assemblée nationale, Quai d'Orsay, Quartier des Invalides, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75007, France" tourism attraction 0.709325210617418 France FALSE
+oa fr Europe Western Europe FALSE 5 2021-02-03 258047884 relation "Aube, Grand Est, France métropolitaine, France" boundary administrative 0.608913204678366 France FALSE
+paris observatory fr Europe Western Europe FALSE 5 2021-02-03 108610831 way "Observatoire de Paris, Avenue de l'Observatoire, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" man_made observatory 0.607006976013631 France FALSE
+sanofi-aventis fr Europe Western Europe FALSE 5 2021-02-03 104705121 way "Sanofi-Aventis, Mosson, Montpellier, Hérault, Occitanie, France métropolitaine, France" landuse industrial 0.4 France FALSE
+ugc fr Europe Western Europe FALSE 5 2021-02-03 218698221 way "UGC Ciné-Cité Les Halles, 7, Allée Baltard, Quartier des Halles, Quartier Les Halles, Paris 1er Arrondissement, Paris, Île-de-France, France métropolitaine, 75001, France" amenity cinema 0.359145294756841 France FALSE
+university of helsinki fi Europe Northern Europe FALSE 5 2021-02-03 192168896 way "Helsingin yliopisto, Fabianinkatu, Kaisaniemi, Kluuvi, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00130, Suomi / Finland" amenity university 0.685481368803326 Suomi / Finland FALSE
+asm er Africa Eastern Africa FALSE 5 2021-02-03 187428690 way "ኣህጉራዊ መዓáˆá<8d>Ž áŠ<90>á<8d>ˆáˆá‰² ኣስመራ مطار أسمرة الدولي, ጎደና ሕዳá‹, ኣስመራ Asmara أسمرة, ዞባ ማእከáˆ<8d> Maekel zone المنطقة المركزية, 00291, ኤáˆá‰µáˆ« Eritrea إرتريا" aeroway aerodrome 0.470033965507204 ኤáˆá‰µáˆ« Eritrea إرتريا FALSE
+estonia ee Europe Northern Europe FALSE 5 2021-02-03 257915995 relation Eesti boundary administrative 0.751423093770254 Eesti FALSE
+ecj ec Americas South America FALSE 5 2021-02-03 188019987 way "ECJ, Avenida El Inca, El Carmen, Kennedy, Quito, Pichincha, EC170138, Ecuador" shop car_repair 0.101 Ecuador FALSE
+bayer de Europe Western Europe FALSE 5 2021-02-03 54102872 node "Bayer, Dippoldiswalde, Sächsische Schweiz-Osterzgebirge, Sachsen, 01734, Deutschland" natural peak 0.4 Deutschland FALSE
+humboldt university of berlin de Europe Western Europe FALSE 5 2021-02-03 257729496 relation "Humboldt-Universität zu Berlin, 6, Unter den Linden, Mitte, Berlin, 10117, Deutschland" building university 0.827161448874237 Deutschland FALSE
+johannes gutenberg university de Europe Western Europe FALSE 5 2021-02-03 185604791 way "Johannes-Bobrowski-Straße, Stadtrandsiedlung, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" highway living_street 0.2 Deutschland FALSE
+nsfc de Europe Western Europe FALSE 5 2021-02-03 42904305 node "NSFC, 1, Kaiserstraße, Gewerbegebiet Haderwald, Kaiserslautern, Rheinland-Pfalz, 67661, Deutschland" amenity fast_food 0.101 Deutschland FALSE
+nwo de Europe Western Europe FALSE 5 2021-02-03 248010374 way "NWO, Emsbüren, Landkreis Emsland, Niedersachsen, 48488, Deutschland" man_made pipeline 0.303130333992136 Deutschland FALSE
+lisa cu Americas Caribbean FALSE 5 2021-02-03 46086136 node "La Lisa, 13500, Cuba" place county 0.55 Cuba FALSE
+beijing normal university cn Asia Eastern Asia FALSE 5 2021-02-03 98084241 way "北京师范大å¦, 19, æ–°è¡—å<8f>£å¤–大街, 海淀区, 北京市, 100875, ä¸å›½" amenity university 0.477635896973777 ä¸å›½ FALSE
+china agricultural university cn Asia Eastern Asia FALSE 5 2021-02-03 104756267 way "ä¸å›½å†œä¸šå¤§å¦è¥¿æ ¡åŒº, 2å<8f>·, 圆明å›è¥¿è·¯, 马连洼æ<9d>‘, 海淀区, 北京市, 100093, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+chinese communist party cn Asia Eastern Asia FALSE 5 2021-02-03 178219809 way "ä¸å…±ä¸€å¤§ä¼šå<9d>€, 374, 黄陂å<8d>—è·¯, æº<90>æˆ<90>里å°<8f>区, 淮海ä¸è·¯è¡—é<81>“, 上海市, 黄浦区, 200021, ä¸å›½" tourism museum 0.406597918617146 ä¸å›½ FALSE
+hebei university of science and technology cn Asia Eastern Asia FALSE 5 2021-02-03 127875964 way "河北科技大å¦, 科技大å¦ä¸œé—¨å<8f>£, 裕翔街é<81>“, 裕å<8d>ŽåŒº, 石家庄市, 桥西区, 河北çœ<81>, 050024, ä¸å›½" amenity university 0.34859234613195 ä¸å›½ FALSE
+huazhong university of science and technology cn Asia Eastern Asia FALSE 5 2021-02-03 259583364 relation "å<8d>Žä¸ç§‘技大å¦, 1037å<8f>·, ç<8f>žå–»è·¯, 东湖新技术开å<8f>‘区, 关东街é<81>“, 东湖新技术开å<8f>‘区(托管), 洪山区, 湖北çœ<81>, 430074, ä¸å›½" amenity university 0.438450184063098 ä¸å›½ FALSE
+hunan cn Asia Eastern Asia FALSE 5 2021-02-03 258328378 relation "æ¹–å<8d>—çœ<81>, ä¸å›½" boundary administrative 0.69379355759446 ä¸å›½ FALSE
+institute of vertebrate paleontology cn Asia Eastern Asia FALSE 5 2021-02-03 154175740 way "Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½" amenity public_building 0.401 ä¸å›½ FALSE
+national people's congress cn Asia Eastern Asia FALSE 5 2021-02-03 143598039 way "湛江人民代表大会 Congrès National du Peuple de Zhanjiang, 人民四西路, 工农街é<81>“, 霞山区, 湛江市, 广东çœ<81>, ä¸å›½" building yes 0.201 ä¸å›½ FALSE
+wuhan university cn Asia Eastern Asia FALSE 5 2021-02-03 259347472 relation "æ¦æ±‰å¤§å¦, 299å<8f>·, 八一路, ç<8f>žç<8f>ˆå±±è¡—é<81>“, æ¦æ˜ŒåŒº, 湖北çœ<81>, 430072, ä¸å›½" amenity university 0.472024029849061 ä¸å›½ FALSE
+zhejiang university cn Asia Eastern Asia FALSE 5 2021-02-03 201716562 way "浙江大å¦ä¹‹æ±Ÿæ ¡åŒº, 之江路, 西湖街é<81>“, 西湖区, æ<9d>州市, 浙江çœ<81>, 310008, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+university of chile cl Americas South America FALSE 5 2021-02-03 67050535 node "UTEM, Universidad Tecnológica Metropolitana. Escuela de Arquitectura, 232, Dieciocho, Santiago, Provincia de Santiago, Región Metropolitana de Santiago, 8330180, Chile" amenity university 0.101 Chile FALSE
+university of basel ch Europe Western Europe FALSE 5 2021-02-03 51795099 node "Faculty of Psychology, University of Basel, 60-62, Missionsstrasse, Am Ring, Grossbasel, Basel, Basel-Stadt, 4055, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.301 Schweiz/Suisse/Svizzera/Svizra FALSE
+perimeter institute for theoretical physics ca Americas Northern America FALSE 5 2021-02-03 150705575 way "Perimeter Institute for Theoretical Physics, 31, Caroline Street North, Uptown, Waterloo, Region of Waterloo, Southwestern Ontario, Ontario, N2L 2Y5, Canada" building university 0.845725205949526 Canada FALSE
+yukon ca Americas Northern America FALSE 5 2021-02-03 258448219 relation "Yukon, Canada" boundary administrative 0.69549941569725 Canada FALSE
+federal university of minas gerais br Americas South America FALSE 5 2021-02-03 38865061 node "Universidade Federal de Itajubá, 1301, Pinheirinho, Itajubá, Microrregião de Itajubá, Região Geográfica Intermediária de Pouso Alegre, Minas Gerais, Região Sudeste, 37500183, Brasil" leisure park 0.45 Brasil FALSE
+inpe br Americas South America FALSE 5 2021-02-03 126630542 way "Instituto Nacional de Pesquisas Espaciais, 1758, Avenida dos Astronautas, Jardim da Granja, São José dos Campos, Região Imediata de São José dos Campos, Região Metropolitana do Vale do ParaÃba e Litoral Norte, Região Geográfica Intermediária de São José dos Campos, São Paulo, Região Sudeste, 12227010, Brasil" amenity research_institute 0.412372663380163 Brasil FALSE
+sbpc br Americas South America FALSE 5 2021-02-03 120770712 way "Aeroporto de Poços de Caldas - Embaixador Walther Moreira Salles, Rua Manoel Marquês de Oliveira, São Bento, Região Urbana Homogênea XII, Poços de Caldas, Microrregião Poços de Caldas, Região Geográfica Intermediária de Pouso Alegre, Minas Gerais, Região Sudeste, 37713326, Brasil" aeroway aerodrome 0.200804307025448 Brasil FALSE
+university of brasilia br Americas South America FALSE 5 2021-02-03 258734158 relation "Cidade Universitária Armando de Salles Oliveira, Rua Francisco dos Santos, Butantã, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05587-050, Brasil" amenity university 0.543129165494252 Brasil FALSE
+bahrain bh Asia Western Asia FALSE 5 2021-02-03 258524311 relation البØرين boundary administrative 0.681587845635736 البØرين FALSE
+la trobe university au Oceania Australia and New Zealand FALSE 5 2021-02-03 59775555 node "La Trobe University, Arnold Street, Bendigo, City of Greater Bendigo, Victoria, 3550, Australia" amenity university 0.301 Australia FALSE
+uc au Oceania Australia and New Zealand FALSE 5 2021-02-03 257740098 relation Australia boundary administrative 0.852135063915112 Australia FALSE
+university of newcastle au Oceania Australia and New Zealand FALSE 5 2021-02-03 127867749 way "University of Newcastle, Callaghan Campus, University Drive, Callaghan, Newcastle, Newcastle City Council, New South Wales, 2308, Australia" amenity university 0.301 Australia FALSE
+csir za Africa Southern Africa FALSE 4 2021-02-03 217011667 way "CSIR, Carlow Road, Melville, Johannesburg Ward 87, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" building commercial 0.101 South Africa FALSE
+observatory za Africa Southern Africa FALSE 4 2021-02-03 258312938 relation "Observatory, Cape Town Ward 57, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" place suburb 0.433807263030136 South Africa FALSE
+university of the western cape za Africa Southern Africa FALSE 4 2021-02-03 106377209 way "University of the Western Cape, Chancellor Street, Belhar, Cape Town Ward 22, City of Cape Town, Western Cape, 7493, South Africa" amenity university 0.883144349963485 South Africa FALSE
+ccs ve Americas South America FALSE 4 2021-02-03 245233315 way "Aeropuerto Internacional de MaiquetÃa Simón BolÃvar, Avenida La Entrada, Playa Grande, Parroquia Raul Leoni, Municipio Vargas, La Guaira, 1262, Venezuela" aeroway aerodrome 0.437029786068705 Venezuela FALSE
+veritas ve Americas South America FALSE 4 2021-02-03 64466466 node "Veritas, Calabozo, Parroquia Calabozo, Municipio Francisco de Miranda, Guárico, 2312, Venezuela" place suburb 0.375 Venezuela FALSE
+alnylam us Americas Northern America FALSE 4 2021-02-03 43655569 node "Alnylam Pharmaceuticals, 300, Third Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" office research 0.101 United States FALSE
+arecibo us Americas Northern America FALSE 4 2021-02-03 258975408 relation "Arecibo, Puerto Rico, United States" boundary administrative 0.563856464536119 United States FALSE
+arizona state us Americas Northern America FALSE 4 2021-02-03 257489274 relation "Arizona, United States" boundary administrative 0.923799492478004 United States FALSE
+bell us Americas Northern America FALSE 4 2021-02-03 258273678 relation "Bell County, Texas, United States" boundary administrative 0.658702837946413 United States FALSE
+buck institute for research us Americas Northern America FALSE 4 2021-02-03 175713833 way "Buck Institute for Research on Aging, 8001, Redwood Boulevard, Novato, Marin County, California, 94945, United States" place house 0.712019878936673 United States FALSE
+children's hospital us Americas Northern America FALSE 4 2021-02-03 146447101 way "Boston Children's Hospital, 300, Blackfan Street, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.663455742331178 United States FALSE
+democratic party us Americas Northern America FALSE 4 2021-02-03 227065873 way "Democratic Party, 42, South Main Street, Marshall, Madison County, North Carolina, 28753, United States" office political_party 0.201 United States FALSE
+department of homeland security us Americas Northern America FALSE 4 2021-02-03 128703019 way "Department Of Homeland Security, Upper Express Drive, O'Hare, Chicago, Jefferson Township, Cook County, Illinois, 60666, United States" building yes 0.401 United States FALSE
+dlr us Americas Northern America FALSE 4 2021-02-03 41377326 node "Disneyland Resort, 1313, South Harbor Boulevard, Anaheim Resort District, Anaheim, Orange County, California, 92802, United States" tourism theme_park 0.484442064603758 United States FALSE
+environmental research us Americas Northern America FALSE 4 2021-02-03 145493547 way "Environmental Research, South Euclid Avenue, Boise, Ada County, Idaho, 83706, United States" building yes 0.201 United States FALSE
+environmental sciences us Americas Northern America FALSE 4 2021-02-03 143791307 way "Environmental Sciences, East Ermina Avenue, Chief Garry Park, Spokane, Spokane County, Washington, 99211, United States" building yes 0.201 United States FALSE
+green bank us Americas Northern America FALSE 4 2021-02-03 102881650 way "Green Bank Telescope, Slavin Hollow Road, Pocahontas County, West Virginia, 24944, United States" man_made telescope 0.590988572487363 United States FALSE
+greens us Americas Northern America FALSE 4 2021-02-03 447523 node "The Greens, Fayetteville, Cumberland County, North Carolina, 28311, United States" place hamlet 0.35 United States FALSE
+humboldt university us Americas Northern America FALSE 4 2021-02-03 209573488 way "William Howard Taft Road, University Village Business District, Mount Auburn, Cincinnati, Hamilton County, Ohio, 45219, United States" highway secondary 0.2 United States FALSE
+icesat us Americas Northern America FALSE 4 2021-02-03 203547980 way "ICESat Road, Glenn Dale, Prince George's County, Maryland, 20771, United States" highway unclassified 0.2 United States FALSE
+iea us Americas Northern America FALSE 4 2021-02-03 258149110 relation "Iowa, United States" boundary administrative 0.721883953901863 United States FALSE
+ilc us Americas Northern America FALSE 4 2021-02-03 233280716 way "Interactive Learning Center, 2120, West University Drive, Boise, Ada County, Idaho, 83725, United States" building university 0.001 United States FALSE
+interior us Americas Northern America FALSE 4 2021-02-03 257566293 relation "Interior, Jackson County, South Dakota, United States" boundary administrative 0.441036070852761 United States FALSE
+international union us Americas Northern America FALSE 4 2021-02-03 123308556 way "Newark Liberty International Airport, Basilone Road, Elizabeth, Union County, New Jersey, 07114, United States" aeroway aerodrome 0.707744508540787 United States FALSE
+jila us Americas Northern America FALSE 4 2021-02-03 96516634 way "Joint Institute for Lab Astrophysics, 1900, Colorado Avenue, The Hill, Boulder, Boulder County, Colorado, 80309, United States" building university 0.326239076957718 United States FALSE
+king us Americas Northern America FALSE 4 2021-02-03 258455752 relation "King County, Texas, 79236, United States" boundary administrative 0.652064928459235 United States FALSE
+la jolla institute for immunology us Americas Northern America FALSE 4 2021-02-03 149701516 way "La Jolla Institute for Allergy and Immunology, Athena Circle, Science Research Park, University City, San Diego, San Diego County, California, 92039, United States" building university 0.501 United States FALSE
+lockheed martin space systems us Americas Northern America FALSE 4 2021-02-03 22515675 node "Lockheed Martin Space Company Fire Department, Empire Grade, Lockheed Martin Space Systems Company, Santa Cruz County, California, United States" amenity fire_station 0.401 United States FALSE
+lunar reconnaissance orbiter us Americas Northern America FALSE 4 2021-02-03 16186893 node "Lunar Reconnaissance Orbiter Camera Visitor Gallery, 1100, South Cady Mall, Tempe, Maricopa County, Arizona, 85287, United States" tourism information 0.301 United States FALSE
+md anderson cancer center us Americas Northern America FALSE 4 2021-02-03 103450497 way "University of Texas MD Anderson Cancer Center, 1515, Holcombe Boulevard, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity hospital 0.743190432299382 United States FALSE
+memorial sloan-kettering cancer center us Americas Northern America FALSE 4 2021-02-03 210339215 way "Memorial Sloan Kettering Cancer Center, 1275, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity hospital 0.894052338771708 United States FALSE
+national academy of medicine us Americas Northern America FALSE 4 2021-02-03 101801329 way "Academy of Medicine, 7th Street Northeast, Atlanta, Fulton County, Georgia, 30308, United States" amenity school 0.428160971568546 United States FALSE
+national air and space museum us Americas Northern America FALSE 4 2021-02-03 106698268 way "National Air and Space Museum, 655, Jefferson Drive Southwest, Washington, District of Columbia, 20560, United States" tourism museum 0.942899315724623 United States FALSE
+nationwide children's hospital us Americas Northern America FALSE 4 2021-02-03 259214398 relation "Nationwide Children's Hospital, 700, Children's Drive, Livingston Park, Columbus, Franklin, Ohio, 43205, United States" amenity hospital 0.649182950422608 United States FALSE
+naval research laboratory us Americas Northern America FALSE 4 2021-02-03 105823802 way "United States Naval Research Laboratory, Washington, District of Columbia, 20375, United States" landuse military 0.730026590181569 United States FALSE
+nnsa us Americas Northern America FALSE 4 2021-02-03 170892516 way "NNSA Gun Range, North Base Road, Kern County, California, United States" building industrial 0.101 United States FALSE
+nrf us Americas Northern America FALSE 4 2021-02-03 236034264 way "Naval Reactors Facility, Butte County, Idaho, United States" landuse industrial 0.2 United States FALSE
+orbital sciences us Americas Northern America FALSE 4 2021-02-03 247187997 way "Orbital Sciences, New South Road, Santa Barbara County, California, United States" building yes 0.201 United States FALSE
+pan american health organization us Americas Northern America FALSE 4 2021-02-03 106697416 way "Pan-American Health Organization, 2121, Virginia Avenue Northwest, Foggy Bottom, Washington, District of Columbia, 20037, United States" office government 1.00046431649804 United States FALSE
+regeneron us Americas Northern America FALSE 4 2021-02-03 155139757 way "Regeneron, 1, Rockwood Road, Archville, Town of Mount Pleasant, Westchester, New York, 10591, United States" building yes 0.101 United States FALSE
+regeneron pharmaceuticals us Americas Northern America FALSE 4 2021-02-03 12282651 node "Regeneron Pharmaceuticals, Garden Way, Clinton Park, Town of East Greenbush, Rensselaer County, New York, 12144, United States" landuse industrial 0.201 United States FALSE
+republican party us Americas Northern America FALSE 4 2021-02-03 147349004 way "Ohio Republican Party, South Fifth Street, Market Mohawk District, Columbus, Franklin, Ohio, 43216, United States" office political_party 0.582152257727352 United States FALSE
+sandoz us Americas Northern America FALSE 4 2021-02-03 356860 node "Sandoz, Calaveras County, California, United States" place hamlet 0.35 United States FALSE
+santa clara university us Americas Northern America FALSE 4 2021-02-03 258949006 relation "Santa Clara University, El Camino Real, Santa Clara, Santa Clara County, California, 95050, United States" amenity university 0.787796879524132 United States FALSE
+santa fe institute us Americas Northern America FALSE 4 2021-02-03 259309786 relation "Santa Fe Institute, Ann Nitze Hiking Trail, Santa Fe, Santa Fe County, New Mexico, 87501, United States" office educational_institution 0.301 United States FALSE
+scripps research us Americas Northern America FALSE 4 2021-02-03 2879141 node "Scripps Research Institute, 10666, Coast Highway, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States" office research 0.201 United States FALSE
+spacex falcon us Americas Northern America FALSE 4 2021-02-03 207518194 way "Falcon 9 Booster B1019, Jack Northrop Avenue, Hawthorne, Los Angeles County, California, 90250-4638, United States" tourism attraction 0.101 United States FALSE
+st. jude children's research hospital us Americas Northern America FALSE 4 2021-02-03 258425834 relation "St. Jude Children's Research Hospital, 262, Danny Thomas Place, Lauderdale Courts, Memphis, Shelby County, Tennessee, 38105, United States" amenity hospital 1.00269308307499 United States FALSE
+tufts university school of medicine us Americas Northern America FALSE 4 2021-02-03 69247818 node "Tufts University School of Medicine, 136, Harrison Avenue, Chinatown, Financial District, Boston, Suffolk County, Massachusetts, 02111, United States" amenity college 0.835161875786798 United States FALSE
+uc berkeley us Americas Northern America FALSE 4 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 0.748194378261701 United States FALSE
+ucsd us Americas Northern America FALSE 4 2021-02-03 94305187 way "University of California, San Diego, 9500, Gilman Drive, San Diego, San Diego County, California, 92093, United States" amenity university 0.549388364219268 United States FALSE
+un general assembly us Americas Northern America FALSE 4 2021-02-03 50098618 node "General Assembly, 675, Ponce de Leon Avenue Northeast, Atlanta, Fulton County, Georgia, 30306, United States" amenity school 0.301 United States FALSE
+university of arkansas us Americas Northern America FALSE 4 2021-02-03 199918736 way "University of Arkansas, North Oakland Avenue, Fayetteville, Washington County, Arkansas, 72701, United States" amenity university 0.820276506570897 United States FALSE
+university of california at berkeley us Americas Northern America FALSE 4 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.1481943782617 United States FALSE
+university of genoa us Americas Northern America FALSE 4 2021-02-03 208081496 way "Cleary University, 3750, Cleary Drive, Howell, Livingston County, Michigan, 48843, United States" building university 0.408817475555606 United States FALSE
+university of lyon us Americas Northern America FALSE 4 2021-02-03 143873364 way "Southwest Minnesota State University, Birch Street, Marshall, Lyon County, Minnesota, 56258, United States" amenity university 0.541762590849456 United States FALSE
+university of maine us Americas Northern America FALSE 4 2021-02-03 129690497 way "University of Maine Orono, Charles Street, Orono, Penobscot County, Maine, 04473, United States" amenity university 0.782803577509063 United States FALSE
+university of mississippi us Americas Northern America FALSE 4 2021-02-03 99276437 way "University of Mississippi, Rebel Drive, University, Lafayette County, Mississippi, 38677, United States" amenity university 0.811795442599009 United States FALSE
+university of naples us Americas Northern America FALSE 4 2021-02-03 2738023 node "Walden University, Bahia Point, Naples, Collier County, Florida, 34103, United States" amenity school 0.201 United States FALSE
+university of potsdam us Americas Northern America FALSE 4 2021-02-03 114514033 way "State University of New York at Potsdam, 44, Pierrepont Avenue, Potsdam, Saint Lawrence County, New York, 13676, United States" amenity university 0.665126099291008 United States FALSE
+university of texas health science center us Americas Northern America FALSE 4 2021-02-03 2459452 node "The University of Texas Health Science Center, 7000, Fannin Street, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity university 0.938041195081873 United States FALSE
+us army corps of engineers us Americas Northern America FALSE 4 2021-02-03 211349908 way "US Army Corps of Engineers, DeKalb County, Tennessee, United States" landuse commercial 0.7 United States FALSE
+us department of homeland security us Americas Northern America FALSE 4 2021-02-03 137867886 way "US Department of Homeland Security, Randolph Road Southeast, Kirtland Addition, Albuquerque, Bernalillo County, New Mexico, 87106-5117, United States" building yes 0.501 United States FALSE
+us department of labor us Americas Northern America FALSE 4 2021-02-03 196192727 way "Department of Labor, 550, South 16th Street, Capitol View, Haymarket, Lincoln, Lancaster County, Nebraska, 68508, United States" office government 0.301 United States FALSE
+us district court us Americas Northern America FALSE 4 2021-02-03 133238357 way "US District Court, 401, Courthouse Square, Lyles-Crouch, Alexandria, Virginia, 22314, United States" amenity courthouse 0.301 United States FALSE
+us national radio astronomy observatory us Americas Northern America FALSE 4 2021-02-03 103730706 way "National Radio Astronomy Observatory, East End Road, Saint Croix District, United States Virgin Islands, United States" building yes 0.401 United States FALSE
+us state department us Americas Northern America FALSE 4 2021-02-03 69248957 node "C Street & 20th Street Northwest (State Department), C Street Northwest, Washington, District of Columbia, 20037, United States" highway bus_stop 0.201 United States FALSE
+wayne state university us Americas Northern America FALSE 4 2021-02-03 259372324 relation "Wayne State University, Commonwealth Street, Woodbridge, Midtown, Detroit, Wayne County, Michigan, 48208, United States" amenity university 0.805217009868445 United States FALSE
+wellesley college us Americas Northern America FALSE 4 2021-02-03 119472640 way "Wellesley College, Cross Street, College Heights, Wellesley, Norfolk County, Massachusetts, 02482, United States" amenity college 0.70312816120194 United States FALSE
+western university us Americas Northern America FALSE 4 2021-02-03 2863345 node "Western University, Easthill Drive, Jamacha, San Diego, San Diego County, California, 91945, United States" amenity school 0.201 United States FALSE
+wilson center us Americas Northern America FALSE 4 2021-02-03 198959606 way "Wilson Center, 240, Nassau Street, Princeton, Mercer County, New Jersey, 08540, United States" building yes 0.201 United States FALSE
+anatolia tr Asia Western Asia FALSE 4 2021-02-03 56798024 node "Asia Minor, Polatlı, Ankara, İç Anadolu Bölgesi, Türkiye" place peninsula 0.602668374396159 Türkiye FALSE
+jwst tr Asia Western Asia FALSE 4 2021-02-03 58940448 node "Just inn Hotel, 18, Ibni-Kemal Caddesi, Hocapaşa Mahallesi, İstanbul, Fatih, İstanbul, Marmara Bölgesi, 34112, Türkiye" tourism hotel 0.001 Türkiye FALSE
+tencent th Asia South-Eastern Asia FALSE 4 2021-02-03 57503349 node "Tencent, ถนนรัชดาภิเษà¸<81>, รัชดาภิเษà¸<81>, à¹<81>ขวงรัชดาภิเษà¸<81>, เขตดินà¹<81>ดง, à¸<81>รุงเทพมหานคร, 10400, ประเทศไทย" shop computer 0.101 ประเทศไทย FALSE
+seti td Africa Middle Africa FALSE 4 2021-02-03 258517069 relation Tchad تشاد boundary administrative 0.662462283081021 Tchad تشاد FALSE
+tms st Africa Middle Africa FALSE 4 2021-02-03 128146184 way "Aeroporto Internacional de São Tomé, ES14, Bairro de Aeroporto, Praia Gamboa, Ã<81>gua Grande, ProvÃncia de São Tomé, 461, São Tomé e PrÃncipe" aeroway aerodrome 0.356849137603517 São Tomé e PrÃncipe FALSE
+duke-nus medical school sg Asia South-Eastern Asia FALSE 4 2021-02-03 131651364 way "Duke-NUS Medical School, 8, College Road, Bukit Merah, Singapore, Central, 169857, Singapore" building university 0.69350420583069 Singapore FALSE
+nus medical school sg Asia South-Eastern Asia FALSE 4 2021-02-03 131651364 way "Duke-NUS Medical School, 8, College Road, Bukit Merah, Singapore, Central, 169857, Singapore" building university 0.59350420583069 Singapore FALSE
+genzyme se Europe Northern Europe FALSE 4 2021-02-03 78318285 node "Genzyme, 42, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 82, Sverige" office company 0.101 Sverige FALSE
+seychelles sc Africa Eastern Africa FALSE 4 2021-02-03 258464914 relation Sesel boundary administrative 0.647100293229899 Sesel FALSE
+kaist ru Europe Eastern Europe FALSE 4 2021-02-03 205795897 way "КаиÑ<81>Ñ‚, городÑ<81>кое поÑ<81>еление ВерхнетуломÑ<81>кий, КольÑ<81>кий район, МурманÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Северо-Западный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" waterway river 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+nikon ru Europe Eastern Europe FALSE 4 2021-02-03 55215823 node "Nikon, 1, 2-й СыромÑ<8f>тничеÑ<81>кий переулок, КошельнаÑ<8f> Ñ<81>лобода, ТаганÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 105120, РоÑ<81>Ñ<81>иÑ<8f>" shop electronics 0.101 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+russian federation ru Europe Eastern Europe FALSE 4 2021-02-03 258410737 relation РоÑ<81>Ñ<81>иÑ<8f> boundary administrative 0.852192362078589 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+palau pw Oceania Micronesia FALSE 4 2021-02-03 258530413 relation Belau boundary administrative 0.62710039879367 Belau FALSE
+polish academy of sciences pl Europe Eastern Europe FALSE 4 2021-02-03 82565029 node "Polska Akademia Nauk, 72, Nowy Świat, Centrum, Śródmieście Północne, Śródmieście, Warszawa, województwo mazowieckie, 00-330, Polska" amenity research_institute 0.551024356739357 Polska FALSE
+university of warsaw pl Europe Eastern Europe FALSE 4 2021-02-03 96031290 way "Uniwersytet Warszawski, Krakowskie Przedmieście, Centrum, Śródmieście Północne, Śródmieście, Warszawa, województwo mazowieckie, 00-046, Polska" amenity university 0.59809205701364 Polska FALSE
+oman om Asia Western Asia FALSE 4 2021-02-03 258236468 relation عمان boundary administrative 0.680326025870515 عمان FALSE
+research council om Asia Western Asia FALSE 4 2021-02-03 200491619 way "The Research Council, سكة 4854, مسقط, 1858, عمان" office research 0.201 عمان FALSE
+magellan nz Oceania Australia and New Zealand FALSE 4 2021-02-03 57692135 node "Magellan, Westland District, West Coast, New Zealand / Aotearoa" natural peak 0.4 New Zealand / Aotearoa FALSE
+massey university nz Oceania Australia and New Zealand FALSE 4 2021-02-03 18195819 node "Massey University, Turitea Road, Fitzherbert, Palmerston North City, Manawatū-Whanganui, 4118, New Zealand / Aotearoa" building yes 0.637234715266229 New Zealand / Aotearoa FALSE
+national party nz Oceania Australia and New Zealand FALSE 4 2021-02-03 26266228 node "National Party, 510, Grey Street, Hamilton East, Hamilton City, Waikato, 3247, New Zealand / Aotearoa" office political_party 0.201 New Zealand / Aotearoa FALSE
+advanced research projects agency-energy NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+american council on education NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+american psychiatric association NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+amyris biotechnologies NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of american publishers NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian strategic policy institute NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+board of land and natural resources NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+board of scientific counselors NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+cayetano heredia university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for drug evaluation and research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international climate research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+central ethical review board NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+charité medical university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of tibetan plateau research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+cold spring harbor laboratory press NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on data for science and technology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on gender balance and diversity in research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+complutense university of madrid NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke university school of medicine NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+eliza hall institute of medical research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+european innovation council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+fastercures NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of american scientists NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+feinstein institute for medical research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+forth institute of molecular biology and biotechnology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national centre for scientific research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+friends of cancer research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+geological society of america NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education statistics agency NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of representatives committee NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+human heredity and health NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for governance and sustainable development NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of advanced scientific studies NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of electrical and electronics engineers NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of genomics and integrative biology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+international agency for research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cancer genome consortium NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+international council on clean transportation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+ipbes NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins university school of medicine NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint united nations programme NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+justice and development party NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+leiden observatory NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+liverpool john moores university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+louisiana universities marine consortium NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+ludwig institute for cancer research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+macarthur foundation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for biophysical chemistry NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for ornithology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of quantum optics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+mctic NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+nagpra NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academy of engineering NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for advancing translational sciences NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for biotechnology information NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national health and medical research council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of nuclear physics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national postdoctoral association NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science advisory board for biosecurity NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+national scientific and technical research council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural sciences and engineering research council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature genetics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature photonics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands institute of ecology NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+nigeria centre for disease control NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of oceanic and atmospheric research NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+paris institute of earth physics NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+pompeu fabra university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+pontifical catholic university of chile NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+public patent foundation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+robert koch institute NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+scholarly publishing and academic resources coalition NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+science is vital NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+science philanthropy alliance NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+seismological society of america NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+ska organisation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+space policy institute NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+space policy institute at george washington university NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+sputnik planum NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+stamina foundation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford law school NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+statistical manual of mental disorders NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+tmt international observatory NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations security council NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of paris south NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of puerto rico NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of rome la sapienza NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of rome tor vergata NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington school of medicine NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington's institute for health metrics and evaluation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of wisconsin law school NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+urgenda foundation NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+us global change research program NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academies of science NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national center for biotechnology information NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+wfirst NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale school of public health NONE NA NA FALSE 4 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands cancer institute nl Europe Western Europe FALSE 4 2021-02-03 790330 node "Antoni van Leeuwenhoek, 121, Plesmanlaan, Park Haagseweg, Amsterdam, Noord-Holland, Nederland, 1066CX, Nederland" amenity hospital 0.250254845255209 Nederland FALSE
+gwas ng Africa Western Africa FALSE 4 2021-02-03 4173335 node "Kurmin Gwas, Kwaturu, Kachia, Kaduna, Nigeria" place village 0.375 Nigeria FALSE
+european court of auditors lu Europe Western Europe FALSE 4 2021-02-03 178152493 way "European Court of Auditors, 12, Rue Alcide de Gasperi, Quartier Européen Nord, Kirchberg, Luxembourg, Canton Luxembourg, 1615, Lëtzebuerg" office government 0.881520550885057 Lëtzebuerg FALSE
+us department of state lr Africa Western Africa FALSE 4 2021-02-03 203675491 way "Mitigating Local Dispute In Liberia (MLDL) US department Of State, Saclepea Road, Gbalagbein, Zone 2, Garr-Bain, Nimba County, Liberia" man_made yes 0.401 Liberia FALSE
+ulsan national institute of science and technology kr Asia Eastern Asia FALSE 4 2021-02-03 130579694 way "ìš¸ì‚°ê³¼í•™ê¸°ìˆ ì›<90>, ìœ ë‹ˆìŠ¤íŠ¸ê¸¸, 울주군, 울산, 44926, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+kiribati ki Oceania Micronesia FALSE 4 2021-02-03 258555103 relation Kiribati boundary administrative 0.718215660119049 Kiribati FALSE
+astronautical science jp Asia Eastern Asia FALSE 4 2021-02-03 115578298 way "宇宙科å¦ç ”究所 (Institute of Space and Astronautical Science), 銀河北通り, ä¸å¤®åŒº, 相模原市, 神奈å·<9d>県, 252-0234, 日本" office research 0.201 日本 FALSE
+fukushima daiichi jp Asia Eastern Asia FALSE 4 2021-02-03 114047090 way "ç¦<8f>島第一 原å<90>力発電所, 大熊町, å<8f>Œè‘‰éƒ¡, ç¦<8f>島県, 日本" landuse industrial 0.479852659697918 日本 FALSE
+institute of space and astronautical science jp Asia Eastern Asia FALSE 4 2021-02-03 115578298 way "宇宙科å¦ç ”究所 (Institute of Space and Astronautical Science), 銀河北通り, ä¸å¤®åŒº, 相模原市, 神奈å·<9d>県, 252-0234, 日本" office research 0.601 日本 FALSE
+japan proton accelerator research complex jp Asia Eastern Asia FALSE 4 2021-02-03 42542030 node "JPARC, 国é<81>“245å<8f>·, æ<9d>±æµ·æ<9d>‘, é‚£ç<8f>‚郡, 茨城県, 〒319-1112, 日本" landuse industrial 0.001 日本 FALSE
+bari it Europe Southern Europe FALSE 4 2021-02-03 301984442 relation "Bari, Puglia, Italia" boundary administrative 0.718718321253269 Italia FALSE
+university of technology iq Asia Western Asia FALSE 4 2021-02-03 109742498 way "الجامعة التكنلوجية, سريع Ù…Øمد القاسم, Sinaa', البلدية الكرادة, بغداد, ناØية الكرادة, قضاء الرصاÙ<81>Ø©, Ù…ØاÙ<81>ظة بغداد, 3241, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" amenity university 0.3689594008139 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+centre for cellular and molecular biology in Asia Southern Asia FALSE 4 2021-02-03 102044629 way "Center for Cellular and molecular biology, Habsiguda Main Road, Tarnaka, Ward 6 Nacharam, Greater Hyderabad Municipal Corporation East Zone, Hyderabad, Uppal mandal, Medchal–Malkajgiri, Telangana, 500003, India" office research 0.501 India FALSE
+council of scientific and industrial research in Asia Southern Asia FALSE 4 2021-02-03 24264243 node "Council of Scientific & Industrial Research (CSIR), kuzhvila lane, Pappanamcode, 38 MSP Nagar, Thiruvananthapuram, Kerala, 695019, India" amenity research_institute 0.501 India FALSE
+indian institute of technology in Asia Southern Asia FALSE 4 2021-02-03 1396119 node "Indian Institute Of Technology, IIT Delhi Main Road, Mehrauli Tehsil, South Delhi, Delhi, 110 067, India" amenity university 0.788558306414252 India FALSE
+mmr in Asia Southern Asia FALSE 4 2021-02-03 67922341 node "Manmad Junction, NH752G, Railway Colony, Manmad, Nandgaon, Nashik, Maharashtra, 423104, India" railway station 0.363116169023831 India FALSE
+ngc in Asia Southern Asia FALSE 4 2021-02-03 68608272 node "New Guwahati, Ambika giri nagar, Ambikagiri Nagar, Assam, Dispur, Kamrup Metropolitan, 781024, India" railway station 0.249182950422608 India FALSE
+royal institution in Asia Southern Asia FALSE 4 2021-02-03 246099153 way "institution, Salem-Kochi-Kanyakumari Road, Karthikappally, Alappuzha, Kerala, 690548, India" building yes 0.111 India FALSE
+serum institute of india in Asia Southern Asia FALSE 4 2021-02-03 79442200 node "Serum Institute of India Pvt. Ltd., 212/2, Hadapsar, Solapur Road, Pune City, Pune District, Maharashtra, 411028, India" place house 0.401 India FALSE
+workers' party ie Europe Northern Europe FALSE 4 2021-02-03 60364423 node "The Workers' Party, 24/25a, Hill Street, Rotunda A ED, Dublin, Dublin 1, Leinster, D01 P5W9, Éire / Ireland" office political_party 0.201 Éire / Ireland FALSE
+bca id Asia South-Eastern Asia FALSE 4 2021-02-03 82555649 node "BCA, 29-31, Jalan Jenderal Sudirman, RW 02, Setiabudi, Daerah Khusus Ibukota Jakarta, 12920, Indonesia" amenity bank 0.48265030002841 Indonesia FALSE
+gns id Asia South-Eastern Asia FALSE 4 2021-02-03 216515106 way "Bandar Udara Binaka, Nias, Sumatera Utara, Indonesia" aeroway aerodrome 0.382027115756698 Indonesia FALSE
+indonesian institute of sciences id Asia South-Eastern Asia FALSE 4 2021-02-03 118440854 way "Lembaga Ilmu Pengetahuan Indonesia, Jalan Jenderal Gatot Subroto, RW 01, Kuningan Barat, Mampang Prapatan, Daerah Khusus Ibukota Jakarta, 12950, Indonesia" man_made works 0.001 Indonesia FALSE
+eötvös loránd university hu Europe Eastern Europe FALSE 4 2021-02-03 123965591 way "Eötvös Loránd Tudományegyetem Bölcsészettudományi Kar, 4-8, Múzeum körút, Belváros, V. kerület, Budapest, Közép-Magyarország, 1088, Magyarország" amenity university 0.759079404587545 Magyarország FALSE
+honduras hn Americas Central America FALSE 4 2021-02-03 257416285 relation Honduras boundary administrative 0.801423826610442 Honduras FALSE
+guatemala gt Americas Central America FALSE 4 2021-02-03 258193481 relation Guatemala boundary administrative 0.810709287382318 Guatemala FALSE
+university of crete gr Europe Southern Europe FALSE 4 2021-02-03 52030770 node "House of Europe, Μακεδονίας, Δήμος ΡεθÏ<8d>μνης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΡεθÏ<8d>μνης, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 74123, Ελλάδα" tourism hotel 0.101 Ελλάδα FALSE
+equatorial guinea gq Africa Middle Africa FALSE 4 2021-02-03 257904282 relation Guinea Ecuatorial boundary administrative 0.751043770650231 Guinea Ecuatorial FALSE
+university of ghana gh Africa Western Africa FALSE 4 2021-02-03 164347766 way "University of Ghana, Lower Hill Drive, Little Legon, Accra Metropolitan, Greater Accra Region, BOX LG25, Ghana" amenity university 0.736359020811001 Ghana FALSE
+department for education gb Europe Northern Europe FALSE 4 2021-02-03 97291141 way "Department for Education, 20, Great Smith Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3BT, United Kingdom" office government 0.301 United Kingdom FALSE
+economist gb Europe Northern Europe FALSE 4 2021-02-03 186500188 way "The Economist, 25, St. James's Street, St. James's, Mayfair, City of Westminster, London, Greater London, England, SW1A 1HJ, United Kingdom" office newspaper 0.241913844040538 United Kingdom FALSE
+labour party gb Europe Northern Europe FALSE 4 2021-02-03 72659499 node "Labour Party, Jamaica Road, Butler's Wharf, Bermondsey, London Borough of Southwark, London, Greater London, England, SE16 4RX, United Kingdom" office political_party 0.201 United Kingdom FALSE
+liberal democrat gb Europe Northern Europe FALSE 4 2021-02-03 64051674 node "Aylesbury Liberal Democrat Headquarters, Castle Street, Walton, Aylesbury, Buckinghamshire, South East, England, HP20 2QL, United Kingdom" office political_party 0.201 United Kingdom FALSE
+ministry of defence gb Europe Northern Europe FALSE 4 2021-02-03 98588582 way "Ministry of Defence, Horse Guards Avenue, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2HB, United Kingdom" military office 0.831875732226719 United Kingdom FALSE
+national physical laboratory gb Europe Northern Europe FALSE 4 2021-02-03 178419620 way "National Physical Laboratory, Hampton Hill, London Borough of Richmond upon Thames, London, Greater London, England, United Kingdom" landuse commercial 0.5 United Kingdom FALSE
+nhs gb Europe Northern Europe FALSE 4 2021-02-03 97017893 way "Queen Alexandra Hospital, Old London Road, Cosham, Portsmouth, South East, England, PO6 3ES, United Kingdom" amenity hospital 0.217338060184506 United Kingdom FALSE
+pirbright institute gb Europe Northern Europe FALSE 4 2021-02-03 96398766 way "The Pirbright Institute, Pirbright, Guildford, Surrey, South East, England, GU24 0NF, United Kingdom" landuse industrial 0.4 United Kingdom FALSE
+rothamsted research gb Europe Northern Europe FALSE 4 2021-02-03 134923114 way "Rothamsted Research, Rothamsted Avenue, Roundwood, Harpenden, St Albans, Hertfordshire, East of England, England, AL5 2TW, United Kingdom" amenity university 0.201 United Kingdom FALSE
+rutherford appleton laboratory gb Europe Northern Europe FALSE 4 2021-02-03 107529003 way "Rutherford Appleton Laboratory, Roman Fields, Chilton, Vale of White Horse, Oxfordshire, South East, England, OX11 0UF, United Kingdom" amenity laboratory 0.650918373098637 United Kingdom FALSE
+sainsbury laboratory gb Europe Northern Europe FALSE 4 2021-02-03 120833906 way "Sainsbury Laboratory, Middle Walk, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 8BP, United Kingdom" building university 0.560862131063799 United Kingdom FALSE
+soas university of london gb Europe Northern Europe FALSE 4 2021-02-03 259443457 relation "SOAS University of London, Woburn Square, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0AA, United Kingdom" amenity university 0.887548679886816 United Kingdom FALSE
+the nih gb Europe Northern Europe FALSE 4 2021-02-03 257838544 relation "Northern Ireland, United Kingdom" boundary administrative 0.810837420058351 United Kingdom FALSE
+uk national health service gb Europe Northern Europe FALSE 4 2021-02-03 136097374 way "Boots, 40, Hampstead High Street, Vale of Health, Belsize Park, London Borough of Camden, London, Greater London, England, NW3 1QE, United Kingdom" shop chemist 0.101 United Kingdom FALSE
+university college gb Europe Northern Europe FALSE 4 2021-02-03 115937498 way "University College, Logic Lane, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4EX, United Kingdom" amenity university 0.683844730994415 United Kingdom FALSE
+university of surrey gb Europe Northern Europe FALSE 4 2021-02-03 258855441 relation "University of Surrey, Richard Meyjes Road, Park Barn, Guildford, Surrey, South East, England, GU2 7XH, United Kingdom" amenity university 0.774083401364362 United Kingdom FALSE
+cepi fr Europe Western Europe FALSE 4 2021-02-03 258248385 relation "Cépie, Limoux, Aude, Occitanie, France métropolitaine, 11300, France" boundary administrative 0.530539717499056 France FALSE
+committee on space research fr Europe Western Europe FALSE 4 2021-02-03 80463846 node "Committee on Space Research, 2, Place Maurice Quentin, Quartier des Halles, Quartier Les Halles, Paris 1er Arrondissement, Paris, Île-de-France, France métropolitaine, 75001, France" office research 0.862953287025885 France FALSE
+european synchrotron radiation facility fr Europe Western Europe FALSE 4 2021-02-03 257718140 relation "European Synchrotron Radiation Facility, A 480, Polygone Scientifique, Secteur 1, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38000, France" building office 0.760151663261328 France FALSE
+gilead sciences fr Europe Western Europe FALSE 4 2021-02-03 57632761 node "Gilead Sciences, Quai Georges Gorse, Rives de Seine, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" office company 0.201 France FALSE
+lilly fr Europe Western Europe FALSE 4 2021-02-03 258366075 relation "Lilly, Les Andelys, Eure, Normandie, France métropolitaine, 27480, France" boundary administrative 0.646329478200412 France FALSE
+space agency fr Europe Western Europe FALSE 4 2021-02-03 91413915 way "European Space Agency, Square Lowendal, Quartier Necker, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France" office government 0.799350436637207 France FALSE
+university of paris fr Europe Western Europe FALSE 4 2021-02-03 108596882 way "Université Paris-Dauphine, 1, Place du Maréchal de Lattre de Tassigny, Quartier de la Porte-Dauphine, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75116, France" amenity university 0.577529588367216 France FALSE
+university of strasbourg fr Europe Western Europe FALSE 4 2021-02-03 102280471 way "International Space University, Rue Mathias Ringmann, Parc d'Innovation Technologique d'Illkirch, Illkirch-Graffenstaden, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67400, France" amenity university 0.587650262005596 France FALSE
+echa fi Europe Northern Europe FALSE 4 2021-02-03 228733010 way "ECHA, 6, Telakkakatu, Viiskulma, Punavuori, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00150, Suomi / Finland" office government 0.68713884113187 Suomi / Finland FALSE
+nato fi Europe Northern Europe FALSE 4 2021-02-03 142732534 way "Nåtö, Lemland, Ålands landsbygd, Landskapet Åland, Suomi / Finland" place island 0.325 Suomi / Finland FALSE
+addis ababa university et Africa Eastern Africa FALSE 4 2021-02-03 76411915 node "Addis Ababa University, Botswana Street, Sidist Kilo, Gulale, አዲስ አበባ / Addis Ababa, 1176, ኢትዮጵያ" amenity university 0.301 ኢትዮጵያ FALSE
+institute of photonic sciences es Europe Southern Europe FALSE 4 2021-02-03 108665081 way "Institute of Photonic Sciences, 3, Avinguda de Carl Friedrich Gauss, Mar-i-sol, Castelldefels, Baix Llobregat, Barcelona, Catalunya, 08860, España" office research 0.401 España FALSE
+la niña es Europe Southern Europe FALSE 4 2021-02-03 131047530 way "La Niña, Muelle de la reina, Palos de la Frontera, Comarca Metropolitana de Huelva, Huelva, AndalucÃa, 21819, España" tourism attraction 0.545044178032674 España FALSE
+cihr dz Africa Northern Africa FALSE 4 2021-02-03 258722348 relation "Chir ⵛⵉⵔ شير, Daïra Teniet El Abed, Batna ⵜⴱⴰⵜⴻâµ<8f>ⵜ باتنة, 05108, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" boundary administrative 0.394871386033001 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+dominican republic do Americas Caribbean FALSE 4 2021-02-03 257680231 relation República Dominicana boundary administrative 0.808236599440443 República Dominicana FALSE
+mit media lab dk Europe Northern Europe FALSE 4 2021-02-03 73788074 node "Dit og Mit Randers, Ribevej, Randers SV, Randers, Randers Kommune, 8940, Danmark" amenity fast_food 0.101 Danmark FALSE
+biontech de Europe Western Europe FALSE 4 2021-02-03 126159487 way "12, BioNTech, Oberstadt, Mainz, Rheinland-Pfalz, 55131, Deutschland" landuse commercial 0.3 Deutschland FALSE
+embl de Europe Western Europe FALSE 4 2021-02-03 123328960 way "EMBL, 85 Gebäude 25a, Notkestraße, Bahrenfeld, Altona, Hamburg, 22607, Deutschland" office research 0.101 Deutschland FALSE
+esoc de Europe Western Europe FALSE 4 2021-02-03 112384523 way "European Space Operations Centre, Waldkolonie, Darmstadt-Nord, Darmstadt, Hessen, 64293, Deutschland" landuse institutional 0.2 Deutschland FALSE
+federal research institute for animal health de Europe Western Europe FALSE 4 2021-02-03 199023224 way "Friedrich-Loeffler-Institut Riems, Südufer, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17493, Deutschland" office research 0.001 Deutschland FALSE
+ifr de Europe Western Europe FALSE 4 2021-02-03 73912341 node "Institut für Flugmechanik und Flugregelung, 27, Pfaffenwaldring, Pfaffenwald, Vaihingen, Stuttgart, Baden-Württemberg, 70569, Deutschland" office yes 0.001 Deutschland FALSE
+ihme de Europe Western Europe FALSE 4 2021-02-03 257378365 relation "Ihme, Hannover, Region Hannover, Niedersachsen, 30449, Deutschland" waterway river 0.405003945962319 Deutschland FALSE
+karlsruhe institute of technology de Europe Western Europe FALSE 4 2021-02-03 258575634 relation "Karlsruher Institut für Technologie, Ehingen (Donau), Gemeindeverwaltungsverband Ehingen (Donau), Alb-Donau-Kreis, Baden-Württemberg, 89584, Deutschland" amenity university 0.611397516611859 Deutschland FALSE
+max planck institute for infection biology de Europe Western Europe FALSE 4 2021-02-03 53762784 node "Max-Planck-Institut für Infektionsbiologie, 12, Virchowweg, Mitte, Berlin, 10117, Deutschland" office research 0.505872022275768 Deutschland FALSE
+sfi de Europe Western Europe FALSE 4 2021-02-03 174161539 way "Laserzentrum, Fröhden, Jüterbog, Teltow-Fläming, Brandenburg, 14913, Deutschland" landuse commercial 0.2 Deutschland FALSE
+thales alenia space de Europe Western Europe FALSE 4 2021-02-03 121548045 way "Thales Alenia Space, Ditzingen, Landkreis Ludwigsburg, Baden-Württemberg, 71254, Deutschland" landuse commercial 0.747092386151836 Deutschland FALSE
+university of bremen de Europe Western Europe FALSE 4 2021-02-03 258700328 relation "Universität Bremen, 1, Bibliothekstraße, Lehe, Horn-Lehe, Stadtbezirk Bremen-Ost, Bremen, 28359, Deutschland" amenity university 0.587526066641517 Deutschland FALSE
+university of cologne de Europe Western Europe FALSE 4 2021-02-03 259569292 relation "Universität zu Köln, Albertus-Magnus-Platz, Lindenthal, Köln, Nordrhein-Westfalen, 50931, Deutschland" amenity university 0.559121890158648 Deutschland FALSE
+university of göttingen de Europe Western Europe FALSE 4 2021-02-03 101743013 way "Mathematische Fakultät, 3-5, Bunsenstraße, Südstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland" building university 0.101 Deutschland FALSE
+us army de Europe Western Europe FALSE 4 2021-02-03 104158774 way "US Army, Finthen, Layenhof, Mainz, Rheinland-Pfalz, 55126, Deutschland" landuse military 0.4 Deutschland FALSE
+academy of sciences cn Asia Eastern Asia FALSE 4 2021-02-03 52408051 node "科å¦é™¢ç«™, 天æº<90>è·¯, 龙洞街é<81>“, 天河区, 广州市, 广东çœ<81>, 510650, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+center for disease control and prevention cn Asia Eastern Asia FALSE 4 2021-02-03 41562327 node "疾控ä¸å¿ƒ, 工农å<8d>—è·¯, 文峰街é<81>“, å´‡å·<9d>区, å<8d>—通市, 226000, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+china food and drug administration cn Asia Eastern Asia FALSE 4 2021-02-03 60378418 node "柳州市食å“<81>è<8d>¯å“<81>监ç<9d>£ç®¡ç<90>†å±€, 海关路西一巷, æ¡‚ä¸ç¤¾åŒº, 城ä¸åŒº, 柳州市, 广西壮æ—<8f>自治区, 545006, ä¸å›½" office government 0.001 ä¸å›½ FALSE
+institute of high energy physics cn Asia Eastern Asia FALSE 4 2021-02-03 160099538 way "ä¸å›½ç§‘å¦é™¢é«˜èƒ½ç‰©ç<90>†ç ”究所, 19å<8f>·ä¹™, 玉泉路, ç”°æ<9d>‘, 海淀区, 北京市, 100049, ä¸å›½" amenity research_institute 0.001 ä¸å›½ FALSE
+life technologies cn Asia Eastern Asia FALSE 4 2021-02-03 54415927 node "Just Life restaurant, å<9d>‚雪岗大é<81>“ BÇŽnxuÄ› GÇŽng Av, å<8d>Žä¸ºæŠ€æœ¯æœ‰é™<90>å…¬å<8f>¸, 龙岗区, 深圳市, 广东çœ<81>, 518100, ä¸å›½" tourism attraction 0.101 ä¸å›½ FALSE
+national space science center cn Asia Eastern Asia FALSE 4 2021-02-03 48238029 node "ä¸å›½ç§‘å¦é™¢å›½å®¶ç©ºé—´ç§‘å¦ä¸å¿ƒ, 1, ä¸å…³æ<9d>‘å<8d>—四街, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" office research 0.001 ä¸å›½ FALSE
+peking union medical college cn Asia Eastern Asia FALSE 4 2021-02-03 190689755 way "北京å<8d><8f>和医院, 1, 帅府å›èƒ¡å<90>Œ, 东城区, 北京市, 100010, ä¸å›½" amenity hospital 0.312408728172101 ä¸å›½ FALSE
+people's liberation army cn Asia Eastern Asia FALSE 4 2021-02-03 113303197 way "ä¸åœ‹äººæ°‘解放è»<8d>é§<90>香港部隊大廈 Chinese People's Liberation Army Forces Hong Kong Building, æ·»è<8f>¯é<81>“ Tim Wa Avenue, 金é<90>˜ Admiralty, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" building yes 0.655351334110971 ä¸å›½ FALSE
+qinghai cn Asia Eastern Asia FALSE 4 2021-02-03 257865875 relation "é<9d>’æµ·çœ<81>, ä¸å›½" boundary administrative 0.610517291768724 ä¸å›½ FALSE
+south china agricultural university cn Asia Eastern Asia FALSE 4 2021-02-03 259059311 relation "å<8d>Žå<8d>—农业大å¦, 金钟山路, å<8d>Žå<8d>—ç<90>†å·¥å¤§å¦å<8d>—æ–°æ<9d>‘, 五山街é<81>“, 天河区, 广州市, 广东çœ<81>, 510630, ä¸å›½" amenity university 0.398715419165327 ä¸å›½ FALSE
+tgo cn Asia Eastern Asia FALSE 4 2021-02-03 124970678 way "通辽机场, G111, 育新镇, 科尔æ²<81>区, 通辽市, 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½" aeroway aerodrome 0.425184329336588 ä¸å›½ FALSE
+tongji university cn Asia Eastern Asia FALSE 4 2021-02-03 95605064 way "å<90>ŒæµŽå¤§å¦, 1239, 四平路, æ<9d>¨æµ¦åŒº, 200092, ä¸å›½" amenity university 0.469803068930215 ä¸å›½ FALSE
+university of nottingham ningbo china cn Asia Eastern Asia FALSE 4 2021-02-03 148245237 way "å®<81>波诺ä¸<81>汉大å¦, 199, 康泰ä¸è·¯, 首å<8d>—è¡—é<81>“, 鄞州区, å®<81>波市, 浙江çœ<81>, 315100, ä¸å›½" amenity university 0.368648909480289 ä¸å›½ FALSE
+wuhan university of technology cn Asia Eastern Asia FALSE 4 2021-02-03 130531770 way "æ¦æ±‰ç<90>†å·¥å¤§å¦ä½™å®¶å¤´æ ¡åŒº, ç<90>†å·¥äºŒæ¡¥, æ<9d>¨å›è¡—é<81>“, æ¦æ˜ŒåŒº, 湖北çœ<81>, 430080, ä¸å›½" amenity university 0.411679724670082 ä¸å›½ FALSE
+xinhua cn Asia Eastern Asia FALSE 4 2021-02-03 258772903 relation "新化县, 娄底市, æ¹–å<8d>—çœ<81>, 417625, ä¸å›½" boundary administrative 0.490764246652934 ä¸å›½ FALSE
+cerro tololo inter-american observatory cl Americas South America FALSE 4 2021-02-03 122415298 way "Cerro Tololo Inter American Observatory, Vicuña, Provincia de Elqui, Región de Coquimbo, Chile" landuse observatory 0.7 Chile FALSE
+côte d'ivoire ci Africa Western Africa FALSE 4 2021-02-03 257869389 relation Côte d’Ivoire boundary administrative 1.00385204918839 Côte d’Ivoire FALSE
+international telecommunication union ch Europe Western Europe FALSE 4 2021-02-03 109351662 way "Union Internationale des Télécommunications (UIT), Place des Nations, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building yes 0.433228686818865 Schweiz/Suisse/Svizzera/Svizra FALSE
+world economic forum ch Europe Western Europe FALSE 4 2021-02-03 49134466 node "World Economic Forum, 91, Route de la Capite, Ruth, Cologny, Genève, 1253, Schweiz/Suisse/Svizzera/Svizra" office foundation 0.301 Schweiz/Suisse/Svizzera/Svizra FALSE
+bc ca Americas Northern America FALSE 4 2021-02-03 258447774 relation "British Columbia, Canada" boundary administrative 0.71215515233974 Canada FALSE
+icao ca Americas Northern America FALSE 4 2021-02-03 114910153 way "Organisation de l'Aviation Civile Internationale, 999, Boulevard Robert-Bourassa, René-Lévesque, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3C 5H7, Canada" office international_organization 0.001 Canada FALSE
+nova scotia ca Americas Northern America FALSE 4 2021-02-03 257999774 relation "Nova Scotia, Canada" boundary administrative 0.864078179426287 Canada FALSE
+oxford university ca Americas Northern America FALSE 4 2021-02-03 98502897 way "Cumberland Terrace, 820, Yonge Street, Yorkville, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M4W 2G8, Canada" shop mall 0.317338060184506 Canada FALSE
+trent university ca Americas Northern America FALSE 4 2021-02-03 239067020 way "Trent University, 1600, West Bank Drive, Peterborough, Central Ontario, Ontario, K9J 6X5, Canada" amenity university 0.629853869659265 Canada FALSE
+belize bz Americas Central America FALSE 4 2021-02-03 258422412 relation Belize boundary administrative 0.760897982846959 Belize FALSE
+bahamas bs Americas Caribbean FALSE 4 2021-02-03 258050699 relation The Bahamas boundary administrative 0.774909342902589 The Bahamas FALSE
+minas gerais br Americas South America FALSE 4 2021-02-03 258409868 relation "Minas Gerais, Região Sudeste, Brasil" boundary administrative 0.869760787811772 Brasil FALSE
+university of campinas br Americas South America FALSE 4 2021-02-03 56537260 node "Universidade de São José, 97, Rua SÃlvia Maria Fabro, Kobrasol, Campinas, São José, Região Geográfica Imediata de Florianópolis, Região Geográfica Intermediária de Florianópolis, Santa Catarina, Região Sul, 88102-130, Brasil" amenity university 0.101 Brasil FALSE
+antarctic division au Oceania Australia and New Zealand FALSE 4 2021-02-03 101676576 way "Australian Antarctic Division, Kingston, Hobart, Kingborough, Tasmania, Australia" landuse commercial 0.4 Australia FALSE
+bond university au Oceania Australia and New Zealand FALSE 4 2021-02-03 2922698 node "Bond University, University Drive, Robina, Gold Coast City, Queensland, 4227, Australia" highway bus_stop 0.201 Australia FALSE
+centre for medical research and innovation au Oceania Australia and New Zealand FALSE 4 2021-02-03 151744793 way "Centre for Medical Research, Royal Parade, Melbourne Innovation District, Parkville, Melbourne, City of Melbourne, Victoria, 3000, Australia" building yes 0.501 Australia FALSE
+griffith university au Oceania Australia and New Zealand FALSE 4 2021-02-03 226907634 way "Griffith University, South East Busway, Mount Gravatt, Brisbane City, Queensland, 4121, Australia" amenity bus_station 0.201 Australia FALSE
+national space council au Oceania Australia and New Zealand FALSE 4 2021-02-03 300387881 way "Rend-a-space, Marsden Park, Sydney, Blacktown City Council, New South Wales, 2765, Australia" landuse commercial 0.4 Australia FALSE
+sirius au Oceania Australia and New Zealand FALSE 4 2021-02-03 209425686 way "Sirius, 36-50, Cumberland Street, Dawes Point, Sydney, Council of the City of Sydney, New South Wales, 2000, Australia" building apartments 0.358218474293395 Australia FALSE
+university of south australia au Oceania Australia and New Zealand FALSE 4 2021-02-03 44559024 node "University of South Australia, Wireless Road West, Suttontown, Mount Gambier, City of Mount Gambier, South Australia, 5290, Australia" building university 0.401 Australia FALSE
+bec at Europe Western Europe FALSE 4 2021-02-03 258128656 relation "Wien, Österreich" boundary administrative 0.769412325825045 Österreich FALSE
+armenia am Asia Western Asia FALSE 4 2021-02-03 257747794 relation Õ€Õ¡ÕµÕ¡Õ½Õ¿Õ¡Õ¶ boundary administrative 0.731601485333362 Õ€Õ¡ÕµÕ¡Õ½Õ¿Õ¡Õ¶ FALSE
+dfid zm Africa Eastern Africa FALSE 3 2021-02-03 57737308 node "Department for International Development (DFID), Independence Avenue, Ridgeway, Lusaka, Lusaka District, Lusaka Province, 10101, Zambia" office government 0.101 Zambia FALSE
+south african astronomical observatory za Africa Southern Africa FALSE 3 2021-02-03 149374012 way "South African Astronomical Observatory, Observatory, Cape Town Ward 57, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" landuse observatory 0.6 South Africa FALSE
+university of johannesburg za Africa Southern Africa FALSE 3 2021-02-03 112776222 way "University of Johannesburg, Kingsway Avenue, Rossmore, Johannesburg Ward 69, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" amenity university 0.301 South Africa FALSE
+nsb ye Asia Western Asia FALSE 3 2021-02-03 12427666 node "نصب, مديرية ميدي, Ù…ØاÙ<81>ظة Øجة, اليمن" place island 0.325 اليمن FALSE
+uzbekistan uz Asia Central Asia FALSE 3 2021-02-03 257555259 relation Oʻzbekiston boundary administrative 0.709755684022544 Oʻzbekiston FALSE
+aamc us Americas Northern America FALSE 3 2021-02-03 113401404 way "Anne Arundel Medical Center, 2001, Medical Parkway, Bestgate Terrace, Annapolis, Anne Arundel County, Maryland, 21401, United States" amenity hospital 0.271596680569804 United States FALSE
+academy us Americas Northern America FALSE 3 2021-02-03 259255631 relation "Academy, City of Saint Louis, Missouri, United States" boundary administrative 0.386244954737813 United States FALSE
+accuweather us Americas Northern America FALSE 3 2021-02-03 177586041 way "AccuWeather, 385, Science Park Road, Science Park, State College, Centre County, Pennsylvania, 16803, United States" office company 0.101 United States FALSE
+american association us Americas Northern America FALSE 3 2021-02-03 165272985 way "Japanese American Citizens League, 12937, Cortez Avenue, Cortez Growers Association, Turlock, Merced County, California, 95380, United States" building public 0.201 United States FALSE
+american medical association us Americas Northern America FALSE 3 2021-02-03 124480513 way "American Medical Association, 515, North State Street, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States" building office 0.301 United States FALSE
+american meteorological society us Americas Northern America FALSE 3 2021-02-03 80718663 node "American Meteorological Society, 45, Beacon Street, Downtown Crossing, Beacon Hill, Boston, Suffolk County, Massachusetts, 02108, United States" office association 0.301 United States FALSE
+animal and plant health inspection service us Americas Northern America FALSE 3 2021-02-03 27351108 node "Animal & Plant Health Inspection Service, Concourse Drive, Thornecrest, Roanoke County, Virginia, 24017, United States" office government 0.501 United States FALSE
+appalachian state university us Americas Northern America FALSE 3 2021-02-03 202064702 way "Appalachian State University, Blowing Rock Road, Downtown, Boone, Watauga County, North Carolina, 28607, United States" amenity university 0.739395713780889 United States FALSE
+arianespace us Americas Northern America FALSE 3 2021-02-03 79847733 node "Arianespace, Inc., 5335, Wisconsin Avenue Northwest, Friendship Heights, Washington, District of Columbia, 20007, United States" office company 0.101 United States FALSE
+army corps of engineers us Americas Northern America FALSE 3 2021-02-03 184369940 way "Army Corps of Engineers, Fort Street, Norfolk Redevelopment and Housing Authority, Norfolk, Virginia, 23510, United States" building garage 0.401 United States FALSE
+associated press us Americas Northern America FALSE 3 2021-02-03 152093424 way "Associated Press, 1299, Broadway, Bushwick, Brooklyn, Kings County, New York, 11221, United States" shop supermarket 0.201 United States FALSE
+auburn university us Americas Northern America FALSE 3 2021-02-03 259125839 relation "Auburn University, Lem Morrison Drive, Woodfield, Auburn, Lee County, Alabama, 36849, United States" amenity university 0.726936083135026 United States FALSE
+bell laboratories us Americas Northern America FALSE 3 2021-02-03 18501662 node "Bell Laboratories, Berkeley Heights, Union County, New Jersey, 07974, United States" place locality 0.325 United States FALSE
+cabell us Americas Northern America FALSE 3 2021-02-03 399746 node "Cabell, Wayne County, Kentucky, United States" place hamlet 0.35 United States FALSE
+caltech submillimeter observatory us Americas Northern America FALSE 3 2021-02-03 103887235 way "Caltech Submillimeter Observatory, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made observatory 0.662945678183792 United States FALSE
+cambridge university us Americas Northern America FALSE 3 2021-02-03 95023289 way "Cambridge Drive, University Park, Markham, Bremen Township, Cook County, Illinois, 60428, United States" highway residential 0.3 United States FALSE
+carnegie institution us Americas Northern America FALSE 3 2021-02-03 106777669 way "Carnegie Institution Building, 1530, P Street Northwest, Logan Circle/Shaw, Dupont Circle, Washington, District of Columbia, 2005, United States" building yes 0.374617736328324 United States FALSE
+cascades volcano observatory us Americas Northern America FALSE 3 2021-02-03 3002655 node "David A Johnston Cascades Volcano Observatory, Southeast Tech Center Drive, Columbia Tech Center, Vancouver, Clark County, Washington, 98683, United States" building yes 0.301 United States FALSE
+cedars-sinai medical center us Americas Northern America FALSE 3 2021-02-03 205008828 way "Cedars-Sinai Medical Center, 8700, Beverly Boulevard, Beverly Grove, Los Angeles, Los Angeles County, California, 90048, United States" amenity hospital 0.820535495325755 United States FALSE
+centre for research us Americas Northern America FALSE 3 2021-02-03 100783959 way "National Center for Atmospheric Research Mesa Lab, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" building government 0.591849073716688 United States FALSE
+chimp haven us Americas Northern America FALSE 3 2021-02-03 23953062 node "Chimp Haven, 13600, Caddo Drive, Caddo Parish, Louisiana, 71047, United States" tourism zoo 0.398387040368712 United States FALSE
+city college of new york us Americas Northern America FALSE 3 2021-02-03 115546934 way "The City College of New York, 160, Convent Avenue, Sugar Hill, Manhattan Community Board 9, Manhattan, New York County, New York, 10031, United States" amenity university 1.01231196067725 United States FALSE
+cleveland museum of natural history us Americas Northern America FALSE 3 2021-02-03 258196323 relation "Cleveland Museum of Natural History, 1, Wade Oval Drive, Magnolia-Wade Park Historic District, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States" tourism museum 0.839306791900516 United States FALSE
+cornell university library us Americas Northern America FALSE 3 2021-02-03 259012417 relation "Johnson Museum of Art, 114, Central Avenue, Ithaca, Ithaca Town, Tompkins County, New York, 14853, United States" tourism museum 0.378680902821112 United States FALSE
+cowen us Americas Northern America FALSE 3 2021-02-03 258460482 relation "Cowen, Webster County, West Virginia, 26206, United States" boundary administrative 0.453558714867367 United States FALSE
+creative commons us Americas Northern America FALSE 3 2021-02-03 2584381 node "Creative Learning Center School, Avenue of the Commons, Shrewsbury, Monmouth County, New Jersey, 07702, United States" amenity school 0.201 United States FALSE
+department of space us Americas Northern America FALSE 3 2021-02-03 2969423 node "Houston Fire Department Station 71, Space Center Boulevard, Houston, Harris County, Texas, 77058, United States" amenity fire_station 0.201 United States FALSE
+donald danforth plant science center us Americas Northern America FALSE 3 2021-02-03 257849720 way "Donald Danforth Plant Science Center, 975, North Warson Road, Olivette, Saint Louis County, Missouri, 63131, United States" office research 0.501 United States FALSE
+drexel university us Americas Northern America FALSE 3 2021-02-03 104178294 way "Drexel University, West Bank Greenway, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19104-2892, United States" amenity university 0.682066632905469 United States FALSE
+earth institute us Americas Northern America FALSE 3 2021-02-03 197272744 way "Southwestern College & New Earth Institute, 3960, San Felipe Road, Santa Fe, Santa Fe County, New Mexico, 87507, United States" amenity college 0.366903631515068 United States FALSE
+earth system research laboratory us Americas Northern America FALSE 3 2021-02-03 153944153 way "NOAA - Earth System Research Laboratory, 325, Broadway, Boulder, Boulder County, Colorado, 80305, United States" office government 0.401 United States FALSE
+eli lilly of indianapolis us Americas Northern America FALSE 3 2021-02-03 149502343 way "Eli Lilly Aviation, 2800, South High School Road, Indianapolis, Indiana, 46241, United States" aeroway hangar 0.301 United States FALSE
+emory us Americas Northern America FALSE 3 2021-02-03 259132524 relation "Emory, Rains County, Texas, United States" boundary administrative 0.565817363739394 United States FALSE
+environmental science & technology us Americas Northern America FALSE 3 2021-02-03 136610917 way "Environmental Education, Science & Technology (ENV SCI), 1704, West Mulberry Street, Denton, Denton County, Texas, 76201, United States" building university 0.301 United States FALSE
+exelon us Americas Northern America FALSE 3 2021-02-03 158115010 way "Exelon, Winfield Road, Warrenville, DuPage County, Illinois, 60563, United States" office company 0.101 United States FALSE
+exxon us Americas Northern America FALSE 3 2021-02-03 101855069 way "Exxon, Flower Mound, Denton County, Texas, United States" landuse retail 0.3 United States FALSE
+exxon mobil us Americas Northern America FALSE 3 2021-02-03 242205522 way "Exxon Mobil, Helena, Lewis and Clark County, Montana, United States" landuse industrial 0.4 United States FALSE
+florida atlantic university us Americas Northern America FALSE 3 2021-02-03 259120576 relation "Florida Atlantic University, 111, East Las Olas Boulevard, Fort Lauderdale, Broward County, Florida, 33301, United States" building yes 0.301 United States FALSE
+florida institute of technology us Americas Northern America FALSE 3 2021-02-03 159357166 way "Florida Institute of Technology, East Ashley Court, Melbourne, Brevard County, Florida, 32901, United States" amenity university 0.401 United States FALSE
+fordham university us Americas Northern America FALSE 3 2021-02-03 59136214 node "Fordham University, East Fordham Road, The Bronx, Bronx County, New York, 10458, United States" tourism information 0.201 United States FALSE
+foundation us Americas Northern America FALSE 3 2021-02-03 49534292 node "Foundation, Monahans, Ward County, Texas, 79756, United States" place neighbourhood 0.35 United States FALSE
+foundation for biomedical research us Americas Northern America FALSE 3 2021-02-03 2988264 node "Worcester Foundation for Biomedical Research, 222, Maple Avenue, Fairlawn, Shrewsbury, Worcester County, Massachusetts, 01545, United States" building yes 0.401 United States FALSE
+fox news us Americas Northern America FALSE 3 2021-02-03 64775737 node "Fox News, Terminal C, Grapevine, Tarrant County, Texas, 75261, United States" shop convenience 0.201 United States FALSE
+goldman us Americas Northern America FALSE 3 2021-02-03 386477 node "Goldman, Jefferson County, Missouri, United States" place hamlet 0.370074815609084 United States FALSE
+grinnell college us Americas Northern America FALSE 3 2021-02-03 97140884 way "Grinnell College, 1115, 8th Avenue, Grinnell, Poweshiek County, Iowa, 50112, United States" amenity university 0.634194405720176 United States FALSE
+guam us Americas Northern America FALSE 3 2021-02-03 258022039 relation "Guam, Santa Rita Municipality, Guam, United States" place island 0.789784943797409 United States FALSE
+harvard law school us Americas Northern America FALSE 3 2021-02-03 2990245 node "Harvard Law School Library, 1545, Massachusetts Avenue, Old Cambridge, Cambridge, Middlesex County, Massachusetts, 02138-2903, United States" amenity library 0.301 United States FALSE
+heart association us Americas Northern America FALSE 3 2021-02-03 167716675 way "Sacred Heart Church Hall, South Military Street, Morley Area Residents Association, Dearborn, Wayne County, Michigan, 481241, United States" amenity place_of_worship 0.201 United States FALSE
+homestake us Americas Northern America FALSE 3 2021-02-03 337921 node "Homestake, Jefferson County, Montana, United States" place hamlet 0.35 United States FALSE
+hubble us Americas Northern America FALSE 3 2021-02-03 417215 node "Hubble, Lincoln County, Kentucky, United States" place hamlet 0.307534521399027 United States FALSE
+hunter college us Americas Northern America FALSE 3 2021-02-03 113732474 way "Hunter College, 695, Park Avenue, Carnegie Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity college 0.682460766298975 United States FALSE
+incorporated research institutions for seismology us Americas Northern America FALSE 3 2021-02-03 127043663 way "IRIS PASSCAL Offices, South Road, Socorro, Socorro County, New Mexico, 87801, United States" office research 0.001 United States FALSE
+institute for astronomy us Americas Northern America FALSE 3 2021-02-03 253393324 way "Institute for Astronomy, 2680, Woodlawn Drive, Manoa, Honolulu, Honolulu County, Hawaii, 96813, United States" amenity university 0.691312669988132 United States FALSE
+institute for systems biology us Americas Northern America FALSE 3 2021-02-03 73935850 node "Institute for Systems Biology, 401, Terry Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109-5210, United States" office association 0.401 United States FALSE
+institute of international education us Americas Northern America FALSE 3 2021-02-03 2555719 node "Institute of International Education, 809, 1st Avenue, Tudor City, Manhattan Community Board 6, Manhattan, New York County, New York, 10017, United States" place house 0.401 United States FALSE
+international development research centre us Americas Northern America FALSE 3 2021-02-03 8421794 node "Office Of International Research & Development, 840, University City Boulevard, Longview Estates, McBryde Village, Blacksburg, Montgomery County, Virginia, 24060, United States" place house 0.301 United States FALSE
+las cumbres observatory us Americas Northern America FALSE 3 2021-02-03 81379623 node "Las Cumbres Observatory, Skyline Trail, Maui County, Hawaii, United States" man_made observatory 0.50962395537125 United States FALSE
+lick observatory us Americas Northern America FALSE 3 2021-02-03 251428619 way "Lick Observatory, Mount Hamilton Road, Santa Clara County, California, 95140, United States" leisure nature_reserve 0.201 United States FALSE
+lloyd us Americas Northern America FALSE 3 2021-02-03 506446 node "Lloyd, Town of Lloyd, Ulster County, New York, 12528, United States" place town 0.4 United States FALSE
+mauna kea us Americas Northern America FALSE 3 2021-02-03 21157190 node "Mauna Kea, Hawaiʻi County, Hawaii, United States" natural volcano 0.69306006360707 United States FALSE
+mcdonald us Americas Northern America FALSE 3 2021-02-03 258498766 relation "McDonald County, Missouri, United States" boundary administrative 0.61392452822884 United States FALSE
+medical university of south carolina us Americas Northern America FALSE 3 2021-02-03 258977557 relation "The Medical University of South Carolina, 171, Gadsden Green Homes, Charleston, Charleston County, South Carolina, 29425, United States" leisure park 0.862086077089553 United States FALSE
+medline us Americas Northern America FALSE 3 2021-02-03 207638209 way "Medline, 1900, Meadowville Technology Parkway, Meadowville, Chesterfield County, Virginia, 23836, United States" building yes 0.101 United States FALSE
+multidisciplinary association for psychedelic studies us Americas Northern America FALSE 3 2021-02-03 45297575 node "Multidisciplinary Association for Psychedelic Studies (MAPS), Mission Street, Mission Street Commercial Corridor, Westside, Santa Cruz, Santa Cruz County, California, 95060, United States" office financial 0.501 United States FALSE
+national audubon society us Americas Northern America FALSE 3 2021-02-03 227896739 way "Audubon Society, Sky Londa, San Mateo County, California, United States" boundary protected_area 0.325 United States FALSE
+national ignition facility us Americas Northern America FALSE 3 2021-02-03 145115666 way "National Ignition Facility, Greenville Road, Livermore, Alameda County, California, United States" building yes 0.71403442187005 United States FALSE
+navy us Americas Northern America FALSE 3 2021-02-03 471848 node "Navy, Fairfax County, Virginia, 22033, United States" place hamlet 0.35 United States FALSE
+northern arizona university us Americas Northern America FALSE 3 2021-02-03 138822770 way "Northern Arizona University, South Beaver Street, Flagstaff Normal Addition, Flagstaff, Coconino County, Arizona, 86001, United States" amenity university 0.751100009026849 United States FALSE
+northrop us Americas Northern America FALSE 3 2021-02-03 258364217 relation "Northrop, Martin County, Minnesota, 56075, United States" boundary administrative 0.527022409876486 United States FALSE
+novartis institutes for biomedical research us Americas Northern America FALSE 3 2021-02-03 133694482 way "Novartis Institutes for Biomedical Research, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" landuse commercial 0.7 United States FALSE
+office of management and budget us Americas Northern America FALSE 3 2021-02-03 152300809 way "Office of Management and Budget, 254, Calle Cruz, La Perla, San Juan Antiguo, San Juan, Puerto Rico, 00901, United States" office government 0.501 United States FALSE
+ogle us Americas Northern America FALSE 3 2021-02-03 258064016 relation "Ogle County, Illinois, United States" boundary administrative 0.619540947885713 United States FALSE
+oklahoma medical research foundation us Americas Northern America FALSE 3 2021-02-03 133234335 way "Oklahoma Medical Research Foundation, Northeast 15th Street, Howes Capitol, Oklahoma City, Oklahoma County, Oklahoma, 73104, United States" amenity social_facility 0.401 United States FALSE
+orbital atk us Americas Northern America FALSE 3 2021-02-03 121003549 way "Orbital ATK - Allegany Ballistics Laboratory, Bier, Allegany County, Maryland, United States" landuse area 0.405371759161912 United States FALSE
+palomar observatory us Americas Northern America FALSE 3 2021-02-03 61117750 node "Palomar Observatory, Canfield Road, San Diego County, California, 92060, United States" tourism attraction 0.816929691572276 United States FALSE
+pennsylvania state university in state college us Americas Northern America FALSE 3 2021-02-03 147721263 way "Air Quality Learning and Demonstration Center, Air Quality Lane, Ferguson Township, Centre County, Pennsylvania, 16803, United States" tourism attraction 0.401 United States FALSE
+people for the ethical treatment of animals us Americas Northern America FALSE 3 2021-02-03 251457165 way "People for the Ethical Treatment of Animals, Front Street, Norfolk, Virginia, 23510, United States" amenity social_facility 0.701 United States FALSE
+rsc us Americas Northern America FALSE 3 2021-02-03 122940481 way "RSC, Chambers Avenue, Eagle, Eagle County, Colorado, 81631, United States" building yes 0.101 United States FALSE
+san council us Americas Northern America FALSE 3 2021-02-03 93735273 way "The South Council, Plantation Heights, York County, Virginia, 23185, United States" highway residential 0.2 United States FALSE
+san diego zoo us Americas Northern America FALSE 3 2021-02-03 98616149 way "San Diego Zoo, 2920, Zoo Drive, Hillcrest, San Diego, San Diego County, California, 92103-3607, United States" tourism zoo 0.736514462001523 United States FALSE
+sanford burnham prebys medical discovery institute us Americas Northern America FALSE 3 2021-02-03 2879170 node "Sanford Burnham Prebys Medical Discovery Institute, N Coast Highway, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States" office research 0.601 United States FALSE
+scientific research us Americas Northern America FALSE 3 2021-02-03 220155051 way "Thermo Fisher Scientific, 5781, Van Allen Way, Carlsbad Research Center, Carlsbad, San Diego County, California, 92011, United States" building industrial 0.201 United States FALSE
+smithsonian environmental research center us Americas Northern America FALSE 3 2021-02-03 258721015 relation "Smithsonian Environmental Research Center, Anne Arundel County, Maryland, United States" boundary protected_area 0.702323854176492 United States FALSE
+southern company us Americas Northern America FALSE 3 2021-02-03 156893714 way "Southern Company, 30, Ivan Allen Jr Boulevard, Atlanta, Fulton County, Georgia, 30313, United States" building commercial 0.201 United States FALSE
+spirit us Americas Northern America FALSE 3 2021-02-03 373450 node "Spirit, Town of Spirit, Price County, Wisconsin, United States" place village 0.36851441835616 United States FALSE
+sta us Americas Northern America FALSE 3 2021-02-03 257939822 relation "Stark County, Ohio, United States" boundary administrative 0.622815857577427 United States FALSE
+state department us Americas Northern America FALSE 3 2021-02-03 69248957 node "C Street & 20th Street Northwest (State Department), C Street Northwest, Washington, District of Columbia, 20037, United States" highway bus_stop 0.201 United States FALSE
+tcm us Americas Northern America FALSE 3 2021-02-03 231854259 way "McChord Field, E Street, Oakswest Apartments, Pierce County, Washington, 98438, United States" aeroway aerodrome 0.001 United States FALSE
+texas a&m university us Americas Northern America FALSE 3 2021-02-03 259129741 relation "Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States" amenity university 1.05527727305854 United States FALSE
+texas state university us Americas Northern America FALSE 3 2021-02-03 297522715 relation "Texas State University, 601, University Drive, San Marcos, Texas, 78666, United States" amenity university 0.731950990386221 United States FALSE
+united states geological survey us Americas Northern America FALSE 3 2021-02-03 83553443 node "United States Geological Survey, 1849, C Street Northwest, Washington, District of Columbia, 20240, United States" office government 1.13534289613778 United States FALSE
+university of california at davis us Americas Northern America FALSE 3 2021-02-03 258689332 relation "University of California, Davis, Russell Boulevard, Davis, Yolo County, California, 95616, United States" amenity university 0.501 United States FALSE
+university of california in berkeley us Americas Northern America FALSE 3 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.0481943782617 United States FALSE
+university of california in davis us Americas Northern America FALSE 3 2021-02-03 258689332 relation "University of California, Davis, Russell Boulevard, Davis, Yolo County, California, 95616, United States" amenity university 0.401 United States FALSE
+university of california in santa barbara us Americas Northern America FALSE 3 2021-02-03 205319990 way "University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States" place locality 0.625 United States FALSE
+university of florence us Americas Northern America FALSE 3 2021-02-03 258686921 relation "Creighton University, North 19th Street, Omaha, Douglas County, Nebraska, 68110, United States" amenity university 0.558770852912237 United States FALSE
+university of idaho us Americas Northern America FALSE 3 2021-02-03 151457830 way "University of Idaho, South Main Street, Moscow, Latah County, Idaho, 83843, United States" amenity university 0.773119489546607 United States FALSE
+university of louisville us Americas Northern America FALSE 3 2021-02-03 259182645 relation "University of Louisville, East Brandeis Avenue, Louisville, Jefferson County, Kentucky, 40217, United States" amenity university 0.820740059627089 United States FALSE
+university of massachusetts lowell us Americas Northern America FALSE 3 2021-02-03 259071002 relation "University of Massachusetts Lowell, Central Street, The Acre, Lowell, Middlesex County, Massachusetts, 01852-9998, United States" amenity university 0.812219348874805 United States FALSE
+university of nebraska us Americas Northern America FALSE 3 2021-02-03 150693073 way "University of Nebraska, Lincoln - Practice Field, Avery Avenue, North Bottoms, Haymarket, Lincoln, Lancaster County, Nebraska, 68588, United States" leisure pitch 0.301 United States FALSE
+university of southern mississippi us Americas Northern America FALSE 3 2021-02-03 258509104 relation "University of Southern Mississippi, 118, College Drive, Hattiesburg, Forrest County, Mississippi, 39406, United States" amenity university 0.839494404593605 United States FALSE
+university of valencia us Americas Northern America FALSE 3 2021-02-03 2809389 node "Loyola University, Valencia Street, Westlake South, Westlake, Los Angeles, Los Angeles County, California, 90057-4101, United States" amenity school 0.565618504568294 United States FALSE
+us drug enforcement administration us Americas Northern America FALSE 3 2021-02-03 56632848 node "US Drug Enforcement Administration, 212, East Washington Avenue, James Madison Park, Madison, Dane County, Wisconsin, 53703, United States" office government 0.910733717290293 United States FALSE
+us national bureau of economic research us Americas Northern America FALSE 3 2021-02-03 97970473 way "National Bureau of Economic Research, 1050, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02138, United States" building yes 1.03403299384431 United States FALSE
+us national center for atmospheric research us Americas Northern America FALSE 3 2021-02-03 47686315 node "NCAR Exhibits, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" tourism museum 0.501 United States FALSE
+us national library of medicine us Americas Northern America FALSE 3 2021-02-03 100564321 way "NLM, 8600, Rockville Pike, Glenbrook, East Bethesda, Bethesda, Montgomery County, Maryland, 20894, United States" amenity library 0.574397490815619 United States FALSE
+us national weather service us Americas Northern America FALSE 3 2021-02-03 226762473 way "National Weather Service, Valley, Douglas County, Nebraska, United States" landuse commercial 0.5 United States FALSE
+utah state university us Americas Northern America FALSE 3 2021-02-03 258918205 relation "Utah State University, Bullen Hall, Logan, Cache County, Utah, 84341, United States" amenity university 0.779183015674592 United States FALSE
+vandenberg air force base us Americas Northern America FALSE 3 2021-02-03 121001923 way "Vandenberg Air Force Base, 13th Street, Vandenberg AFB, Santa Barbara County, California, 93437, United States" aeroway aerodrome 0.885549616017841 United States FALSE
+virginia commonwealth university us Americas Northern America FALSE 3 2021-02-03 151896182 way "Virginia Commonwealth University, South Harrison Street, Oregon Hill, Richmond, Virginia, 23220, United States" amenity university 0.782362468990463 United States FALSE
+wall street journal us Americas Northern America FALSE 3 2021-02-03 147759956 way "Wall Street Journal, 1701, Page Mill Road, Palo Alto, Santa Clara County, California, 94304, United States" building yes 0.301 United States FALSE
+whitehead institute us Americas Northern America FALSE 3 2021-02-03 300475537 way "Whitehead Institute, 455, Main Street, East Cambridge, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02142, United States" building office 0.533532730730458 United States FALSE
+wistar institute us Americas Northern America FALSE 3 2021-02-03 99114832 way "Wistar Institute, 3601, Spruce Street, University City, Philadelphia, Philadelphia County, Pennsylvania, 19104, United States" building university 0.485649467985799 United States FALSE
+working group us Americas Northern America FALSE 3 2021-02-03 52307556 node "Fresenius Kidney Care Working Group, 200, West Pleasant Street, Schlitz Park, Milwaukee, Milwaukee County, Wisconsin, 53212-3942, United States" amenity clinic 0.201 United States FALSE
+xprize foundation us Americas Northern America FALSE 3 2021-02-03 42269322 node "Xprize Foundation, 900, West Slauson Avenue, Fox Hills, Culver City, Los Angeles County, California, 90230-6482, United States" office company 0.201 United States FALSE
+foundation for innovative new diagnostics ug Africa Eastern Africa FALSE 3 2021-02-03 14070822 node "Foundation for Innovative New Diagnostics, Lumumba Avenue, Bat Valley, Wandegeya, Kampala Capital City, Kampala, Central Region, 21706, Uganda" office ngo 0.501 Uganda FALSE
+iavi ug Africa Eastern Africa FALSE 3 2021-02-03 200242272 way "MRC IAVI, Somero Road, Masaka, Central Region, 235, Uganda" building yes 0.101 Uganda FALSE
+malaria consortium ug Africa Eastern Africa FALSE 3 2021-02-03 5536278 node "Malaria Consortium, 25, Upper Naguru East Road, Kabira, Naguru, Kampala Capital City, Kampala, Central Region, 3021, Uganda" office company 0.201 Uganda FALSE
+uganda national council for science and technology ug Africa Eastern Africa FALSE 3 2021-02-03 44520158 node "Uganda National Council for Science and Technology, Plot 6, Kimera Road, Ministers Village, Ntinda, Kampala Capital City, Kampala, Central Region, 6884 KAMPALA, Uganda" office government 0.701 Uganda FALSE
+unaids ug Africa Eastern Africa FALSE 3 2021-02-03 44866079 node "UNAIDS, 60, Prince Charles Drive, Kisementi, Kololo, Kampala Capital City, Kampala, Central Region, 8352, Uganda" office quango 0.101 Uganda FALSE
+uber ua Europe Eastern Europe FALSE 3 2021-02-03 63503463 node "Uber, 3а, ОÑ<81>кара Кольберга вулицÑ<8f>, Цитадель, Галицький район, Львів, ЛьвівÑ<81>ька міÑ<81>ька громада, ЛьвівÑ<81>ький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 79013, Україна" office yes 0.101 Україна FALSE
+national taiwan university tw Asia Eastern Asia FALSE 3 2021-02-03 258571682 relation "國立臺ç<81>£å¤§å¸, 1, ç¾…æ–¯ç¦<8f>路四段, 文盛里, ä¸æ£å<8d>€, 公館, 臺北市, 10617, 臺ç<81>£" amenity university 0.525266971884114 臺ç<81>£ FALSE
+boğaziçi university tr Asia Western Asia FALSE 3 2021-02-03 101946622 way "BoÄŸaziçi Ãœniversitesi Güney YerleÅŸkesi, Amiral Fahri Ergin Sokağı, Rumeli Hisarı Mahallesi, Sarıyer, Ä°stanbul, Marmara Bölgesi, 34470, Türkiye" amenity university 0.5610714966844 Türkiye FALSE
+istanbul university tr Asia Western Asia FALSE 3 2021-02-03 747123 node "İstanbul Üniversitesi, Besim Ömerpaşa Caddesi, Süleymaniye Mahallesi, İstanbul, Fatih, İstanbul, Marmara Bölgesi, 34116, Türkiye" amenity university 0.521226339743682 Türkiye FALSE
+tübitak tr Asia Western Asia FALSE 3 2021-02-03 139775964 way "TÃœBÄ°TAK, 221, Atatürk Bulvarı, Remzi OÄŸuz Arık Mahallesi, Ankara, Çankaya, Ankara, İç Anadolu Bölgesi, 06100, Türkiye" office government 0.001 Türkiye FALSE
+tonga to Oceania Polynesia FALSE 3 2021-02-03 258595415 relation Tonga boundary administrative 0.73797603969758 Tonga FALSE
+thc th Asia South-Eastern Asia FALSE 3 2021-02-03 654670 node "ลพบุรี, ถนน วัดพระธาตุ, ลพบุรี, จังหวัดลพบุรี, 15000, ประเทศไทย" railway station 0.275244632729739 ประเทศไทย FALSE
+food and agriculture organization tg Africa Western Africa FALSE 3 2021-02-03 26752512 node "Food and Agriculture Organization, Avenue de Duisburg, Quartier Administratif, 1er Arrondissement, Lomé, BP: 353, Togo" office ngo 0.401 Togo FALSE
+state forestry administration so Africa Eastern Africa FALSE 3 2021-02-03 14692688 node "Forestry, Burco برعو, توجدير Togdheer, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال" place village 0.375 Soomaaliya الصومال FALSE
+university of bari so Africa Eastern Africa FALSE 3 2021-02-03 245042079 way "East African University, Ugaas Yaasiin Street, Boosaaso بوصاصو, Bossaso بوصاصو, Bariباري, Soomaaliya الصومال" amenity university 0.452344279227432 Soomaaliya الصومال FALSE
+karolinska sk Europe Eastern Europe FALSE 3 2021-02-03 42136560 node "KarolÃnska, KarolÃna, Želiezovce, okres Levice, Nitriansky kraj, Západné Slovensko, Slovensko" place locality 0.125 Slovensko FALSE
+ndp sk Europe Eastern Europe FALSE 3 2021-02-03 176840469 way "NDP, Liptovská Štiavnica, okres Ružomberok, Žilinský kraj, Stredné Slovensko, Slovensko" landuse meadow 0.3 Slovensko FALSE
+nanyang technological university sg Asia South-Eastern Asia FALSE 3 2021-02-03 115958975 way "Nanyang Technological University, Nanyang Green, Western Water Catchment, Southwest, 639667, Singapore" amenity university 0.765073041127411 Singapore FALSE
+european centre for disease prevention and control se Europe Northern Europe FALSE 3 2021-02-03 95487742 way "Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige" office government 0.550936419284163 Sverige FALSE
+royal institute of technology se Europe Northern Europe FALSE 3 2021-02-03 164817375 way "Kungliga Tekniska högskolan, Norrtullstunneln, Ruddammen, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 86, Sverige" amenity university 0.499138790121692 Sverige FALSE
+solomon islands sb Oceania Melanesia FALSE 3 2021-02-03 258291922 relation Solomon Islands boundary administrative 0.848279405728165 Solomon Islands FALSE
+coast guard sa Asia Western Asia FALSE 3 2021-02-03 177944934 way "Coast Guard, السعودية" place islet 0.45 السعودية FALSE
+king abdullah university of science and technology sa Asia Western Asia FALSE 3 2021-02-03 259476065 relation "جامعة الملك عبد الله للعلوم و التقنية, King Abdullah Boulevard, منطقة مكة المكرمة, 23955, السعودية" amenity university 0.57358213360648 السعودية FALSE
+kagra ru Europe Eastern Europe FALSE 3 2021-02-03 300995494 way "Кагра, УдомельÑ<81>кий городÑ<81>кой округ, ТверÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 171870, РоÑ<81>Ñ<81>иÑ<8f>" waterway river 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+moscow state university ru Europe Eastern Europe FALSE 3 2021-02-03 155606811 way "1, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f>" place neighbourhood 0.589514102962792 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+national geographic ru Europe Eastern Europe FALSE 3 2021-02-03 297123845 node "National Geographic, 1 Ñ<81>1, Ð<9d>оводмитровÑ<81>каÑ<8f> улица, БутырÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 127015, РоÑ<81>Ñ<81>иÑ<8f>" shop clothes 0.201 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+frb pt Europe Southern Europe FALSE 3 2021-02-03 20744600 node "Francos Bombeiros, Rua Engenheiro Ferreira Dias, Zona Industrial do Porto, Ramalde, Porto, Ã<81>rea Metropolitana do Porto, Norte, 4250-094, Portugal" highway bus_stop 0.001 Portugal FALSE
+institute of space sciences pt Europe Southern Europe FALSE 3 2021-02-03 76017683 node "Institute of Astrophysics and Space Sciences, Rua das Estrelas, Arrábida, Lordelo do Ouro, Lordelo do Ouro e Massarelos, Porto, Ã<81>rea Metropolitana do Porto, Norte, 4150-762, Portugal" office research 0.401 Portugal FALSE
+university of lisbon pt Europe Southern Europe FALSE 3 2021-02-03 194436086 way "Universidade de Lisboa - Cidade Universitária, Avenida das Forças Armadas, Sete Rios, Avenidas Novas, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1600-121, Portugal" amenity university 0.503005124858326 Portugal FALSE
+cultural organization ps Asia Western Asia FALSE 3 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 0.908162869304848 Palestinian Territory FALSE
+kpmg pl Europe Eastern Europe FALSE 3 2021-02-03 67019231 node "KPMG, 4A, Inflancka, Osiedle Prezydenckie, Muranów, Śródmieście, Warszawa, województwo mazowieckie, 00-189, Polska" place house 0.101 Polska FALSE
+national museum pl Europe Eastern Europe FALSE 3 2021-02-03 258352211 relation "Muzeum Narodowe, 3, Aleje Jerozolimskie, Śródmieście Południowe, Śródmieście, Warszawa, województwo mazowieckie, 00-495, Polska" tourism museum 0.490290314647502 Polska FALSE
+the lancet pl Europe Eastern Europe FALSE 3 2021-02-03 45795901 node "Lancet, 1a, KoÅ›cielna, BaÅ‚uty-DoÅ‚y, Å<81>ódź-BaÅ‚uty, Å<81>ódź, województwo łódzkie, 91-444, Polska" amenity veterinary 0.101 Polska FALSE
+vib pl Europe Eastern Europe FALSE 3 2021-02-03 255571885 way "VIB, BaÅ‚uty-DoÅ‚y, Å<81>ódź-BaÅ‚uty, Å<81>ódź, województwo łódzkie, Polska" landuse cemetery 0.3 Polska FALSE
+cabinet ph Asia South-Eastern Asia FALSE 3 2021-02-03 76081873 node "Cabinet, Agusan del Norte, Caraga, 6805, Luzon" place village 0.375 Luzon FALSE
+department of education ph Asia South-Eastern Asia FALSE 3 2021-02-03 97691861 way "Department of Education, Meralco Avenue, Oranbo, Pasig, Metro Manila, 1604, Luzon" office government 0.708010995739962 Luzon FALSE
+fcc ph Asia South-Eastern Asia FALSE 3 2021-02-03 99524539 way "First Cityland Condo, Rada, Legazpi, San Lorenzo, Makati 1st District, Makati, Fourth District, Metro Manila, 1200, Luzon" building yes 0.001 Luzon FALSE
+ims health ph Asia South-Eastern Asia FALSE 3 2021-02-03 71334061 node "IMS Health Care, Inc., National Road, Diaz Compound, Putatan, Muntinlupa, Fourth District, Metro Manila, 1770, Luzon" amenity clinic 0.201 Luzon FALSE
+international rice research institute ph Asia South-Eastern Asia FALSE 3 2021-02-03 258457516 relation "International Rice Research Institute, Sampaguita, Masaya, Los Baños, Bay, Laguna, Calabarzon, 4031, Luzon" amenity research_institute 0.775700293936422 Luzon FALSE
+southwest fisheries science center ph Asia South-Eastern Asia FALSE 3 2021-02-03 246594258 way "National Freshwater Fisheries Technology Center, Magtanggol Road, Roseville Heights Subdivision, Muñoz, Nueva Ecija, Central Luzon, 3121, Luzon" amenity research_institute 0.201 Luzon FALSE
+university of the andes pe Americas South America FALSE 3 2021-02-03 51366096 node "Universidad Peruana Los Andes - Sede Lima, 579, Avenida Cuba, Jesús MarÃa, Lima, 011, Perú" amenity school 0.101 Perú FALSE
+smithsonian tropical research institute pa Americas Central America FALSE 3 2021-02-03 176657993 way "Smithsonian Tropical Research Institute, Calle Portobelo, Ancón, Distrito Panamá, Panamá, 080807, Panamá" leisure nature_reserve 0.401 Panamá FALSE
+court of appeal nz Oceania Australia and New Zealand FALSE 3 2021-02-03 154422323 way "Court of Appeal, Aitken Street, Thorndon, Wellington, Wellington City, Wellington, 6140, New Zealand / Aotearoa" amenity courthouse 0.677073009909361 New Zealand / Aotearoa FALSE
+victoria university of wellington nz Oceania Australia and New Zealand FALSE 3 2021-02-03 176763739 way "Victoria University of Wellington, Kitchener Street, Britomart, Auckland Central, Auckland, WaitematÄ<81>, Auckland, 1010, New Zealand / Aotearoa" amenity university 0.401 New Zealand / Aotearoa FALSE
+washington university school of medicine nz Oceania Australia and New Zealand FALSE 3 2021-02-03 96976049 way "School of Medicine, Riccarton Avenue, Central City, Christchurch, Linwood-Central-Heathcote Community, Christchurch City, Canterbury, 84440, New Zealand / Aotearoa" amenity university 0.301 New Zealand / Aotearoa FALSE
+advanced cell technology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency for healthcare research and quality NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+alan turing institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred wegener institute of polar and marine research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazon environmental research institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazon institute of people NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association of university professors NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+american enterprise institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of hematology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal welfare institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+antarctic marine living resources NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+arc centre of excellence for coral reef studies NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+arrowhead pharmaceuticals NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+asapbio NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of european research libraries NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of public and land-grant universities NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+bdnf NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomolecular archaeology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology innovation organization NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg philanthropies NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston university school of public health NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+broad institute of harvard NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada foundation for innovation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+carbon engineering NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for genetics and society in berkeley NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international climate and environmental research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for severe weather research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for veterinary medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for science and technology studies NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+cfda NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+chan zuckerberg biohub NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+china academy of chinese medical sciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+china earthquake administration NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences institute of zoology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of social sciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate analytics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's lamont–doherty earth observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+congolese ministry of health NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortium of social science associations NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+convention on international trade in endangered species NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+darling basin authority NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+dendreon NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe office of science NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe's office of science NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+dynasty foundation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecological society of america conference NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+economic and social research council NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+eeoc NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+embo journal NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and enterprise initiative NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+entomological society of america NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental research letters NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's european space research and technology centre NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+faseb NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal register NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+fermi gamma-ray space telescope NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+five star movement NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for applied molecular evolution NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for food and agriculture research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+fraunhofer society NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+french agricultural research centre for international development NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national trade union of scientific researchers NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+gbsi NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic engineering approval committee NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetics society of america NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+geophysical fluid dynamics laboratory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+george church of harvard medical school NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+german research centre for geosciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ginkgo bioworks NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+gladstone institute of cardiovascular disease NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+gsi helmholtz centre for heavy ion research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+herschel space observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+hfcs NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on science NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of commons science and technology committee NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+igib NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+innovative genomics institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of evolutionary biology in barcelona NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+intellia therapeutics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+"international association of scientific, technical and medical publishers" NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cellular medicine society NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on stratigraphy NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international committee for weights and measures NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international committee on taxonomy of viruses NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international conference on high energy physics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union of pure NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+isscr NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+iupac NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+james martin center for nonproliferation studies NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+jiangmen underground neutrino observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint dark energy mission NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint institute for nuclear research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of geophysical research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of the american medical association NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaiser family foundation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli institute for systems neuroscience NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+kitt peak national observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute of marine sciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ligo scientific collaboration NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mario negri institute for pharmacological research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for biology of ageing NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for terrestrial microbiology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcti NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical hypotheses NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council laboratory of molecular biology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mercator research institute on global commons NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+metropolitan autonomous university NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mhra NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+michoacan university of saint nicholas of hidalgo NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mount sinai school of medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc centre for regenerative medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national collaborative research infrastructure strategy NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national development and reform commission NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for agricultural research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for astrophysics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for research on safety and quality NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of environmental health sciences in research triangle park NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of geophysics and volcanology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of neurological disorders NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national natural science foundation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+national sea grant college program NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural history museum of denmark NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature chemical biology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature nanotechnology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+navigenics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+neural information processing systems NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+new hope fertility center NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+newlink genetics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nhgri NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsabb NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nserc NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuffield council on bioethics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of polar programs NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+organisation for the prohibition of chemical weapons NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ottawa hospital research institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+peruvian amazon NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+peter doherty institute for infection and immunity NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew environment group NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+physical review letters NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+physicians for human rights NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+pierre louis institute of epidemiology and public health NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+precision physics research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+presidential commission for the study of bioethical issues NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+recombinetics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+research excellence framework NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+restriction of chemicals NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+santa cruz biotechnology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+sarepta therapeutics NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+schmidt ocean institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+science advisory board NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+science mission directorate NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+science translational medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+scripps translational science institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+secure world foundation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+sequenom NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai institutes for biological sciences NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+simons observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+ska organization NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+social sciences and humanities research council NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for conservation biology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of environmental toxicology and chemistry NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of vertebrate paleontology NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+south african radio astronomy observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanley center for psychiatric research NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+stfc NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+structural genomics consortium NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+sudbury neutrino observatory NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+supreme council of antiquities NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology strategy board NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+toyama chemical NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+treatment action group NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk atomic energy authority NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+united kingdom research and innovation NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+"united nations educational, scientific and cultural organization" NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations general assembly NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pittsburgh school of medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of regensburg NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us energy information administration NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us equal employment opportunity commission NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national human genome research institute NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanographic and atmospheric administration NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us nuclear regulatory commission NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+us office of research integrity NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house national security council NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+xishuangbanna tropical botanical garden NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale school of medicine NONE NA NA FALSE 3 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg no Europe Northern Europe FALSE 3 2021-02-03 57874557 node "Bloomberg, Stranda, Møre og Romsdal, Norge" waterway waterfall 0.35 Norge FALSE
+norwegian institute of public health no Europe Northern Europe FALSE 3 2021-02-03 52153314 node "Folkehelseinstituttet, Lovisenberggata, Lovisenberg, St. Hanshaugen, Oslo, 0456, Norge" office government 0.001 Norge FALSE
+opcw nl Europe Western Europe FALSE 3 2021-02-03 82494868 node "OPCW, 32, Johan de Wittlaan, Zorgvliet, Den Haag, Zuid-Holland, Nederland, 2517JR, Nederland" place house 0.536046957362672 Nederland FALSE
+sab nl Europe Western Europe FALSE 3 2021-02-03 121229693 way "Juancho E. Yrausquin Airport, The Road, Zions Hill, Saba, Nederland" aeroway aerodrome 0.44859234613195 Nederland FALSE
+imo ng Africa Western Africa FALSE 3 2021-02-03 258539785 relation "Imo, Nigeria" boundary administrative 0.578975498982342 Nigeria FALSE
+ncdc ng Africa Western Africa FALSE 3 2021-02-03 54956799 node "NCDC, Solomon Lar Way, Jabi, Abuja, Municipal Area Council, Federal Capital Territory, 900108, Nigeria" office government 0.101 Nigeria FALSE
+mariana trench NA Africa Southern Africa FALSE 3 2021-02-03 259298637 relation Mariana Trench National Wildlife Refuge boundary protected_area 0.325 NA FALSE
+norwegian polar institute NA Africa Southern Africa FALSE 3 2021-02-03 109644344 way "Troll workshop, Flyplassveien, Troll" shop car_repair 0.001 NA FALSE
+us antarctic program NA Africa Southern Africa FALSE 3 2021-02-03 17620139 node "Concordia Station, Route 66, Camp d'été, Concordia Station" tourism attraction 0.347285603202449 NA FALSE
+apl mz Africa Eastern Africa FALSE 3 2021-02-03 154933581 way "Aeroporto Internacional de Nampula, N1, Cidade de Nampula, Meconta, Nampula, Moçambique" aeroway aerodrome 0.302778707896871 Moçambique FALSE
+nerc my Asia South-Eastern Asia FALSE 3 2021-02-03 70807306 node "NERC, Mersing, Johor, Malaysia" leisure park 0.25 Malaysia FALSE
+agricultural research for development mw Africa Eastern Africa FALSE 3 2021-02-03 162111456 way "Centre for Agricultural Research and Development, S125, Mitundu, Lilongwe, Central Region, Malawi" building yes 0.401 Malawi FALSE
+malta mt Europe Southern Europe FALSE 3 2021-02-03 258431458 relation Malta boundary administrative 0.812750360639362 Malta FALSE
+gwa mm Asia South-Eastern Asia FALSE 3 2021-02-03 259030031 relation "ဂွမြá€á€¯á€·á€”ယ်, သံá€<90>ွဲá€<81>ရá€á€¯á€„, ရá€<81>á€á€¯á€„်ပြည်နယ် (Rakhine), 07182, မြန်မာ" boundary administrative 0.283208261767925 မြန်မာ FALSE
+gao ml Africa Western Africa FALSE 3 2021-02-03 297990 node "Gao, Cercle de Gao, Gao, Mali" place city 0.585315627887998 Mali FALSE
+constitutional court md Europe Eastern Europe FALSE 3 2021-02-03 216698368 way "Curtea Constituțională, 28, Strada Alexandru Lăpușneanu, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2004, Moldova" office government 0.370639694209592 Moldova FALSE
+monaco mc Europe Western Europe FALSE 3 2021-02-03 257226999 relation Monaco boundary land_area 0.789644598497058 Monaco FALSE
+latvia lv Europe Northern Europe FALSE 3 2021-02-03 257910781 relation Latvija boundary administrative 0.744567200497597 Latvija FALSE
+nida lt Europe Northern Europe FALSE 3 2021-02-03 190180 node "Nida, Neringa, Neringos savivaldybÄ—, KlaipÄ—dos apskritis, 93121, Lietuva" place suburb 0.49975765213835 Lietuva FALSE
+partners in health lr Africa Western Africa FALSE 3 2021-02-03 73765026 node "Partners in Health, Tubman Boulevard, Peace Island (Congo Town), Congo Town, Monrovia, Greater Monrovia, Montserrado County, 00231, Liberia" office ngo 0.301 Liberia FALSE
+international water management institute lk Asia Southern Asia FALSE 3 2021-02-03 204762144 way "International Water Management Institute, Sunil Mawatha, Palam Thuna Junction, Pelawatte, බස්නà·<8f>හිර පළà·<8f>à¶, 10120, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office ngo 0.401 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+un environment programme lc Americas Caribbean FALSE 3 2021-02-03 48669497 node "Global Environment Facility Small Grants Programmme United nations Development Programme (GEF SGP UNDP), Desir Avenue, L'anse Road, Sans Souci, Castries, 1487, Saint Lucia" office yes 0.301 Saint Lucia FALSE
+international vaccine institute kr Asia Eastern Asia FALSE 3 2021-02-03 190407343 way "êµì œë°±ì‹ 연구소, 1, 관악로, ê±´ì˜<81>아파트, ì²ë£¡ë<8f>™, 관악구, 서울, 08826, 대한민êµ" office research 0.001 ëŒ€í•œë¯¼êµ FALSE
+korea university kr Asia Eastern Asia FALSE 3 2021-02-03 66060178 node "ê³ ë ¤ëŒ€, 안암로, 종암ë<8f>™, 성ë¶<81>구, 서울, 02800, 대한민êµ" railway station 0.001 ëŒ€í•œë¯¼êµ FALSE
+national institute of ecology kr Asia Eastern Asia FALSE 3 2021-02-03 248455668 way "êµë¦½ìƒ<9d>태ì›<90>, 금강로, 송내리, 서천군, 33657, 대한민êµ" leisure garden 0.001 ëŒ€í•œë¯¼êµ FALSE
+pohang university of science and technology kr Asia Eastern Asia FALSE 3 2021-02-03 259443543 relation "í<8f>¬í•ê³µê³¼ëŒ€í•™êµ<90>, 77, ì²ì•”ë¡œ, 효곡ë<8f>™, 남구, í<8f>¬í•ì‹œ, ê²½ìƒ<81>ë¶<81>ë<8f>„, 37673, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+sungkyunkwan university kr Asia Eastern Asia FALSE 3 2021-02-03 66580260 node "ì„±ê· ê´€ëŒ€, 화산로, 장안구, 수ì›<90>ì‹œ, 16360, 대한민êµ" railway stop 0.001 ëŒ€í•œë¯¼êµ FALSE
+ki ki Oceania Micronesia FALSE 3 2021-02-03 258555103 relation Kiribati boundary administrative 0.718215660119049 Kiribati FALSE
+kyrgyzstan kg Asia Central Asia FALSE 3 2021-02-03 257857355 relation КыргызÑ<81>тан boundary administrative 0.699471525334594 КыргызÑ<81>тан FALSE
+kenya medical research institute ke Africa Eastern Africa FALSE 3 2021-02-03 202184361 way "Kenya Medical Research Institute, Kisumu-Busia Road, Kisumu, Nyanza, 40100, Kenya" office research 0.401 Kenya FALSE
+democratic party of japan jp Asia Eastern Asia FALSE 3 2021-02-03 122578456 way "自由民主会館, 23, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8910, 日本" office political_party 0.001 日本 FALSE
+hiroshima university jp Asia Eastern Asia FALSE 3 2021-02-03 6038414 node "Hiroshima Universityã€€åºƒå³¶å¤§å¦ æ<9d>±åºƒå³¶ã‚ャンパス, 出会ã<81>„ã<81>®é<81>“, 西æ<9d>¡ä¸‹è¦‹, æ<9d>±åºƒå³¶å¸‚, 広島県, 739-0047, 日本" amenity university 0.702899469290669 日本 FALSE
+japan atomic energy agency jp Asia Eastern Asia FALSE 3 2021-02-03 220860551 way "Japan Atomic Energy Agency, 765-1, ã<81>¯ã<81>ªã<81>¿ã<81>šã<81><8d>通り, æ<9d>±æµ·æ<9d>‘, é‚£ç<8f>‚郡, 茨城県, 319-1184, 日本" building yes 0.401 日本 FALSE
+japan meteorological agency jp Asia Eastern Asia FALSE 3 2021-02-03 258888416 relation "気象åº<81>, å†…å €é€šã‚Š, 大手町1, 大手町, 神田, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0004, 日本" building public 0.528920419784088 日本 FALSE
+ministry of justice jp Asia Eastern Asia FALSE 3 2021-02-03 60332920 node "法務çœ<81>, 桜田通り, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" office government 0.492769930727232 日本 FALSE
+nagasaki university jp Asia Eastern Asia FALSE 3 2021-02-03 110381378 way "長崎大å¦, 県é<81>“113å<8f>·ç·š, 長崎市, 長崎県, 850-8685, 日本" amenity university 0.466329902238883 日本 FALSE
+ngo jp Asia Eastern Asia FALSE 3 2021-02-03 104188006 way "ä¸éƒ¨å›½éš›ç©ºæ¸¯ã‚»ãƒ³ãƒˆãƒ¬ã‚¢, セントレアライン;ä¸éƒ¨å›½éš›ç©ºæ¸¯é€£çµ¡é<81>“è·¯, 常滑市, 愛知県, 479-0881, 日本" aeroway aerodrome 0.490333550285453 日本 FALSE
+riken brain science institute jp Asia Eastern Asia FALSE 3 2021-02-03 151778643 way "脳科å¦ç·<8f>å<90>ˆç ”究センター æ<9d>±æ£Ÿ, 新座ãƒ<90>イパス, 和光市, 埼玉県, 351-0106, 日本" building yes 0.001 日本 FALSE
+the times jp Asia Eastern Asia FALSE 3 2021-02-03 135747411 way "タイムズ, 御æˆ<90>町, å°<8f>町1, 鎌倉市, 神奈å·<9d>県, 日本" landuse construction 0.343190432299382 日本 FALSE
+tohoku jp Asia Eastern Asia FALSE 3 2021-02-03 258878374 relation "æ<9d>±åŒ—町, 上北郡, é<9d>’森県, 日本" boundary administrative 0.402513658204824 日本 FALSE
+toyota jp Asia Eastern Asia FALSE 3 2021-02-03 258878294 relation "豊田市, 愛知県, 日本" boundary administrative 0.4 日本 FALSE
+university of tsukuba jp Asia Eastern Asia FALSE 3 2021-02-03 134217312 way "ç‘波大å¦, ã<81>™ã<81>šã<81>‹ã<81>‘通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 303-0006, 日本" amenity university 0.540351531466865 日本 FALSE
+npg jm Americas Caribbean FALSE 3 2021-02-03 177301691 way "NPG, Tobago Avenue, New Kingston, Saint Andrew, Surrey County, KINGSTON 5, Jamaica" building commercial 0.101 Jamaica FALSE
+vanity fair jm Americas Caribbean FALSE 3 2021-02-03 76246848 node "Vanity Fair, Saint Mary, Middlesex County, Jamaica" place hamlet 0.45 Jamaica FALSE
+chamber of deputies it Europe Southern Europe FALSE 3 2021-02-03 61264691 node "Camera dei deputati, Piazza del Parlamento, Rione III Colonna, Municipio Roma I, Roma, Roma Capitale, Lazio, 00186, Italia" office government 0.553523844412523 Italia FALSE
+cia it Europe Southern Europe FALSE 3 2021-02-03 94840491 way "Aeroporto di Roma-Ciampino, Via Palmiro Togliatti, Ciampino, Roma Capitale, Lazio, 00043, Italia" aeroway aerodrome 0.548980991840454 Italia FALSE
+crisanti it Europe Southern Europe FALSE 3 2021-02-03 37862607 node "Casa Crisanti, Scillato, Palermo, Sicilia, 90020, Italia" place isolated_dwelling 0.3 Italia FALSE
+ferrari it Europe Southern Europe FALSE 3 2021-02-03 107882148 way "Museo Galleria Ferrari, 43, Viale Alfredo Dino Ferrari, Bell'Italia, Maranello, Unione dei comuni del Distretto Ceramico, Modena, Emilia-Romagna, 41053, Italia" tourism museum 0.427161274702289 Italia FALSE
+icr it Europe Southern Europe FALSE 3 2021-02-03 257993141 way "ICR, Casa Malaspina, Lodi, Lombardia, Italia" landuse industrial 0.3 Italia FALSE
+joint research centre it Europe Southern Europe FALSE 3 2021-02-03 233423450 way "Joint Research Centre, Barza, Ispra, Varese, Lombardia, Italia" landuse industrial 0.663793454953531 Italia FALSE
+university of bologna it Europe Southern Europe FALSE 3 2021-02-03 45355087 node "Johns Hopkins University, 11, Via Belmeloro, Irnerio, Santo Stefano, Bologna, Emilia-Romagna, 40126, Italia" amenity university 0.201 Italia FALSE
+university of pavia it Europe Southern Europe FALSE 3 2021-02-03 4601061 node "Università di Pavia, Largo Giorgio La Pira, Borgo Ticino, Pavia, Lombardia, 27100, Italia" amenity university 0.602616832398112 Italia FALSE
+university of trento it Europe Southern Europe FALSE 3 2021-02-03 102238581 way "ex Biblioteca universitaria centrale, Via Giuseppe Verdi, Laboratorio Sociale Officina Piedicastello, Piedicastello, Trento, Territorio Val d'Adige, Provincia di Trento, Trentino-Alto Adige/Südtirol, 38122, Italia" building university 0.201 Italia FALSE
+decode genetics is Europe Northern Europe FALSE 3 2021-02-03 81109668 node "Ã<8d>slensk erfðagreining, 8, Sturlugata, Háskóli, Miðborg, ReykjavÃkurborg, Höfuðborgarsvæðið, 102, Ã<8d>sland" office company 0.001 Ã<8d>sland FALSE
+university of iceland is Europe Northern Europe FALSE 3 2021-02-03 259157894 relation "Háskóli Ã<8d>slands, Ingunnargata, Háskóli, Miðborg, ReykjavÃkurborg, Höfuðborgarsvæðið, 102, Ã<8d>sland" amenity university 0.460302392667561 Ã<8d>sland FALSE
+institute for research in fundamental sciences ir Asia Southern Asia FALSE 3 2021-02-03 133035312 way "پژوهشگاه دانش‌های بنیادی, دکتر باهنر, Øصار بوعلی, نیاوران, منطقه Û± شهر تهران, شهر تهران, بخش رودبار قصران, شهرستان شمیرانات, استان تهران, ١٩٧٨٧٣٧٤٨٣, ایران" amenity university 0.31689306175332 ایران FALSE
+ministry of science ir Asia Southern Asia FALSE 3 2021-02-03 216486765 way "وزارت علوم، تØقیقات Ùˆ Ù<81>ناوری, پیروزان جنوبی, شهرک غرب, منطقه Û² شهر تهران, شهرداری تهران منطقه شش ساختمان انبار مرکزی, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1466913734, ایران" office government 0.4318394385017 ایران FALSE
+sony ir Asia Southern Asia FALSE 3 2021-02-03 83913921 node "sony xperia نمایندگی سونی, 1, خیابان بهشت, بهشت, ناØیه۲ منطقه Û±, منطقه Û±, شهر مشهد, بخش مرکزی شهرستان مشهد, شهرستان مشهد, استان خراسان رضوی, 9183717469, ایران" shop mobile_phone 0.594712396341918 ایران FALSE
+university of tehran ir Asia Southern Asia FALSE 3 2021-02-03 180641108 way "پردیس مرکزی دانشگاه‌ تهران, Û±Û¶ آذر, دانشگاه تهران, منطقه Û¶ شهر تهران, شهرداری تهران منطقه شش ناØیه سه, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1418893844, ایران" amenity university 0.317252435362624 ایران FALSE
+blood institute in Asia Southern Asia FALSE 3 2021-02-03 73364002 node "Cumbala Hill Hospital And Heart Institute Blood Bank, NS Patkar Marg, Grant Road, D Ward, Zone 1, Mumbai, Mumbai City, Maharashtra, 400036, India" amenity blood_bank 0.201 India FALSE
+christian medical college in Asia Southern Asia FALSE 3 2021-02-03 55073123 node "Christian Medical College, NH38, Vellore, Vellore District, Tamil Nadu, 632002, India" highway bus_stop 0.301 India FALSE
+department of atomic energy in Asia Southern Asia FALSE 3 2021-02-03 250761108 way "Department Of Atomic Energy, Poojappura Main Road, Thirumala, Poojappura, 38 MSP Nagar, Thiruvananthapuram, Kerala, 695012, India" office government 0.401 India FALSE
+giant metrewave radio telescope in Asia Southern Asia FALSE 3 2021-02-03 259119626 relation "Giant Metrewave Radio Telescope, SH53, Ambegaon, Pune District, Maharashtra, India" amenity research_institute 0.401 India FALSE
+indian council of medical research in Asia Southern Asia FALSE 3 2021-02-03 176721424 way "Indian Council of Medical Research, Sadahalli, Devanahalli taluk, Bangalore Rural, Karnataka, India" landuse commercial 0.7 India FALSE
+indian national science academy in Asia Southern Asia FALSE 3 2021-02-03 65559222 node "à¤à¤¾à¤°à¤¤à¥€à¤¯ राषà¥<8d>टà¥<8d>रीय विजà¥<8d>ञान अकादमी, 2, Bahadur Shah Zafar Marg, Delhi, Kotwali Tehsil, Central Delhi, Delhi, 110002, India" tourism attraction 0.001 India FALSE
+institute of space in Asia Southern Asia FALSE 3 2021-02-03 176056727 way "Indian Institute of Space Science and Technology, Trivandrum, Manoorkonam-panacode, Maannoorkkonam, Nedumangad, Thiruvananthapuram, Kerala, 695547, India" amenity university 0.676937105996802 India FALSE
+jama in Asia Southern Asia FALSE 3 2021-02-03 259341928 relation "Jama, Dumka, Jharkhand, 814110, India" boundary administrative 0.55 India FALSE
+university of delhi in Asia Southern Asia FALSE 3 2021-02-03 156201546 way "University of Delhi South Campus, Benito Juarez Marg, Delhi Cantonment, New Delhi, Delhi, 110021, India" amenity university 0.301 India FALSE
+iom im Europe Northern Europe FALSE 3 2021-02-03 105663494 way "Isle of Man Airport, Balthane Road, Malew, Rushen, IM9 2AH, Isle of Man" aeroway aerodrome 0.447526724801917 Isle of Man FALSE
+allergan ie Europe Northern Europe FALSE 3 2021-02-03 296678202 way "Allergan, Westport northern bypass, Westport Harbour, Westport Rural ED, Westport-Belmullet Municipal District, County Mayo, Connacht, F28 KX88, Éire / Ireland" building industrial 0.101 Éire / Ireland FALSE
+iarc ie Europe Northern Europe FALSE 3 2021-02-03 70264067 node "Irish Ancestry Research Centre, O'Connell Street, Shannon B, The Metropolitan District of Limerick City, County Limerick, Munster, V94 951K, Éire / Ireland" office association 0.001 Éire / Ireland FALSE
+republic of ireland ie Europe Northern Europe FALSE 3 2021-02-03 258361977 relation Éire / Ireland boundary administrative 0.873845787392843 Éire / Ireland FALSE
+us department of defense ie Europe Northern Europe FALSE 3 2021-02-03 258792189 relation "Department of Defense, Station Road, Morristownbiller ED, The Municipal District of Kildare — Newbridge, County Kildare, Leinster, W12 AD93, Éire / Ireland" office government 0.622075306013723 Éire / Ireland FALSE
+nasem id Asia South-Eastern Asia FALSE 3 2021-02-03 13768087 node "Nasem, Merauke, Papua, Indonesia" place locality 0.225 Indonesia FALSE
+ceu hu Europe Eastern Europe FALSE 3 2021-02-03 165252734 way "Central European University, Október 6. utca, Lipótváros, V. kerület, Budapest, Közép-Magyarország, 1051, Magyarország" amenity university 0.449444237200763 Magyarország FALSE
+cnsa ht Americas Caribbean FALSE 3 2021-02-03 172983686 way "Coordination Nationale de la Sécurité Alimentaire, 93, Impasse Pétion, Coeur de Palmier, 7e Bellevue Chardonnières, Petyonvil, Arrondissement de Port-au-Prince, Département de l'Ouest, HT6141, Ayiti" building public 0.001 Ayiti FALSE
+eso hr Europe Southern Europe FALSE 3 2021-02-03 259184791 relation "Iž, Grad Zadar, Zadarska županija, 23284, Hrvatska" place island 0.409231479174104 Hrvatska FALSE
+mesopotamia gr Europe Southern Europe FALSE 3 2021-02-03 980059 node "Μεσοποταμία, Δήμος ΚαστοÏ<81>ιάς, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚαστοÏ<81>ιάς, ΠεÏ<81>ιφÎÏ<81>εια Δυτικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΗπείÏ<81>ου - Δυτικής Μακεδονίας, 52050, Ελλάδα" place town 0.449569974883352 Ελλάδα FALSE
+gambia gm Africa Western Africa FALSE 3 2021-02-03 258194808 relation Gambia boundary administrative 0.752242698231784 Gambia FALSE
+thule gl Americas Northern America FALSE 3 2021-02-03 1195220 node "Qaanaaq, Avannaata, 3971, Kalaallit Nunaat" place town 0.454011689337226 Kalaallit Nunaat FALSE
+ifdc gh Africa Western Africa FALSE 3 2021-02-03 19062776 node "IFDC, Abafun Crescent, Labone, La, Accra Metropolitan, Greater Accra Region, 10408, Ghana" office foundation 0.101 Ghana FALSE
+astronomical society gb Europe Northern Europe FALSE 3 2021-02-03 2216386 node "Royal Astronomical Society, Burlington Arcade, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1J 0ET, United Kingdom" office association 0.694024211333493 United Kingdom FALSE
+bedford gb Europe Northern Europe FALSE 3 2021-02-03 108624 node "Bedford, East of England, England, MK40 1SU, United Kingdom" place town 0.611289942268227 United Kingdom FALSE
+biobank gb Europe Northern Europe FALSE 3 2021-02-03 77681818 node "Biobank, Pincents Kiln Industrial Park, Tilehurst, Theale, West Berkshire, South East, England, RG31 7SD, United Kingdom" office company 0.101 United Kingdom FALSE
+cabinet office gb Europe Northern Europe FALSE 3 2021-02-03 100375252 way "Cabinet Office, 70, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2AS, United Kingdom" office government 0.648641885623921 United Kingdom FALSE
+central institute of mental health gb Europe Northern Europe FALSE 3 2021-02-03 140482817 way "Institute of Mental Health, Triumph Road, Wollaton Park, City of Nottingham, East Midlands, England, NG8 1FD, United Kingdom" building yes 0.401 United Kingdom FALSE
+centre for ecology and hydrology gb Europe Northern Europe FALSE 3 2021-02-03 101917409 way "Centre for Ecology and Hydrology, Benson Lane, Preston Crowmarsh, Benson, Crowmarsh Gifford, South Oxfordshire, Oxfordshire, South East, England, OX10 8BB, United Kingdom" amenity research_institute 0.754365194683011 United Kingdom FALSE
+charity cancer research uk gb Europe Northern Europe FALSE 3 2021-02-03 72590969 node "Cancer Research UK (charity shop), East Street, Shoreham-by-Sea, Adur, West Sussex, South East, England, BN43 5ZE, United Kingdom" shop clothes 0.401 United Kingdom FALSE
+climate institute gb Europe Northern Europe FALSE 3 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.472343749103071 United Kingdom FALSE
+coalition s gb Europe Northern Europe FALSE 3 2021-02-03 15861155 node "Coalition, King's Road, Queen's Park, Brighton, Brighton and Hove, South East, England, BN1 1NB, United Kingdom" amenity nightclub 0.201 United Kingdom FALSE
+crick institute gb Europe Northern Europe FALSE 3 2021-02-03 121182065 way "The Francis Crick Institute, 1, Midland Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 1AT, United Kingdom" amenity research_institute 0.584723197268746 United Kingdom FALSE
+defra gb Europe Northern Europe FALSE 3 2021-02-03 120106481 way "National Agri-Food Innovation Campus York, Sand Hutton, Ryedale, North Yorkshire, Yorkshire and the Humber, England, YO41 1LZ, United Kingdom" landuse commercial 0.2 United Kingdom FALSE
+department for transport gb Europe Northern Europe FALSE 3 2021-02-03 96766515 way "Department for Transport, 33, Horseferry Road, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 4DR, United Kingdom" office government 0.768431032071491 United Kingdom FALSE
+dod gb Europe Northern Europe FALSE 3 2021-02-03 45654910 node "The Dod, Dumfries and Galloway, Scotland, DG4 6EZ, United Kingdom" natural peak 0.4 United Kingdom FALSE
+home office gb Europe Northern Europe FALSE 3 2021-02-03 117457078 way "Home Office, 2, Marsham Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 4DF, United Kingdom" office government 0.201 United Kingdom FALSE
+honeywell gb Europe Northern Europe FALSE 3 2021-02-03 42965726 node "Honeywell, Barnsley, Yorkshire and the Humber, England, S71 1LR, United Kingdom" place neighbourhood 0.35 United Kingdom FALSE
+human tissue authority gb Europe Northern Europe FALSE 3 2021-02-03 17570009 node "Human Tissue Authority, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.301 United Kingdom FALSE
+iwc gb Europe Northern Europe FALSE 3 2021-02-03 64405196 node "IWC, 138, New Bond Street, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1S 2SE, United Kingdom" shop watches 0.101 United Kingdom FALSE
+loughborough university gb Europe Northern Europe FALSE 3 2021-02-03 87123611 way "Loughborough University, Epinal Way, Loughborough, Charnwood, Leicestershire, East Midlands, England, LE11 3QN, United Kingdom" amenity university 0.685315627887998 United Kingdom FALSE
+national institute of mental health gb Europe Northern Europe FALSE 3 2021-02-03 140482817 way "Institute of Mental Health, Triumph Road, Wollaton Park, City of Nottingham, East Midlands, England, NG8 1FD, United Kingdom" building yes 0.401 United Kingdom FALSE
+national science and technology council gb Europe Northern Europe FALSE 3 2021-02-03 183761570 way "Dartford Science & Technology College, Dartford Technology College, Dartford, Kent, South East, England, DA1 2LY, United Kingdom" amenity school 0.613179143195807 United Kingdom FALSE
+oxford martin school gb Europe Northern Europe FALSE 3 2021-02-03 108491139 way "Oxford Martin School, 34, Broad Street, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 3BD, United Kingdom" building university 0.646843791996006 United Kingdom FALSE
+oxfordshire gb Europe Northern Europe FALSE 3 2021-02-03 258306804 relation "Oxfordshire, South East, England, United Kingdom" boundary administrative 0.703092947092873 United Kingdom FALSE
+panasonic avionics corporation gb Europe Northern Europe FALSE 3 2021-02-03 134628820 way "Panasonic Avionics Corporation, Heron Drive, Heathrow West Business Park, Langley, Slough, South East, England, SL3 8XP, United Kingdom" building commercial 0.301 United Kingdom FALSE
+royal academy of engineering gb Europe Northern Europe FALSE 3 2021-02-03 42032172 node "Royal Academy of Engineering, 3, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5DG, United Kingdom" building yes 0.401 United Kingdom FALSE
+royal veterinary college gb Europe Northern Europe FALSE 3 2021-02-03 107180102 way "Royal Veterinary College, Camden Campus, Royal College Street, Somers Town, London Borough of Camden, London, Greater London, England, NW1 0TH, United Kingdom" amenity university 0.707433058758147 United Kingdom FALSE
+taylor & francis gb Europe Northern Europe FALSE 3 2021-02-03 120087526 way "Taylor and Francis, 4, Park Square, Milton Park, Milton, Vale of White Horse, Oxfordshire, South East, England, OX14 4RN, United Kingdom" office company 0.201 United Kingdom FALSE
+uk science and technology facilities council gb Europe Northern Europe FALSE 3 2021-02-03 103985987 way "Royal Observatory, Edinburgh, Observatory Road, Blackford Hill, Blackford, City of Edinburgh, Scotland, EH9 3HJ, United Kingdom" tourism attraction 0.460151663261328 United Kingdom FALSE
+university of lincoln gb Europe Northern Europe FALSE 3 2021-02-03 4219519 node "University of Lincoln, Brayford Way, New Boultham, Lincoln, Lincolnshire, East Midlands, England, LN1 1RD, United Kingdom" highway bus_stop 0.301 United Kingdom FALSE
+usra gb Europe Northern Europe FALSE 3 2021-02-03 69244558 node "USRA, 19, Darin Court, Crownhill, Shenley Church End, Milton Keynes, South East, England, MK8 0AD, United Kingdom" amenity fast_food 0.101 United Kingdom FALSE
+world conservation monitoring centre gb Europe Northern Europe FALSE 3 2021-02-03 125654147 way "World Conservation Monitoring Centre, 219c, Huntingdon Road, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0DL, United Kingdom" building yes 0.401 United Kingdom FALSE
+bia fr Europe Western Europe FALSE 3 2021-02-03 101203382 way "Aéroport international de Bastia-Poretta, Route de l'Aéroport, Poretta, Lucciana, Bastia, Haute-Corse, Corse, France métropolitaine, 20290, France" aeroway aerodrome 0.427383538249758 France FALSE
+bipm fr Europe Western Europe FALSE 3 2021-02-03 131402735 way "Bureau International des Poids et Mesures, Allée du Mail, Saint-Cloud, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92210, France" amenity public_building 0.358338814941197 France FALSE
+bmj fr Europe Western Europe FALSE 3 2021-02-03 78287453 node "BMJ, Avenue Robert Schuman, Croix-Rouge, Reims, Marne, Grand Est, France métropolitaine, 51100, France" office company 0.101 France FALSE
+chiron fr Europe Western Europe FALSE 3 2021-02-03 72434563 node "Chiron, Jalognes, Bourges, Cher, Centre-Val de Loire, France métropolitaine, 18300, France" place hamlet 0.35 France FALSE
+cirm fr Europe Western Europe FALSE 3 2021-02-03 211615805 way "CIRM, Le Redon, 9e Arrondissement, Marseille, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13009, France" leisure park 0.25 France FALSE
+cnr fr Europe Western Europe FALSE 3 2021-02-03 108877742 way "Barrage de Génissiat, Route du Barrage, Chez Mazza, Franclens, Saint-Julien-en-Genevois, Haute-Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 74910, France" tourism attraction 0.348376470606964 France FALSE
+dea fr Europe Western Europe FALSE 3 2021-02-03 257783355 relation "Die, Drôme, Auvergne-Rhône-Alpes, France métropolitaine, 26150, France" boundary administrative 0.519081808694247 France FALSE
+edf fr Europe Western Europe FALSE 3 2021-02-03 107960916 way "Barrage de Bort, D 683, Granges, Lanobre, Mauriac, Cantal, Auvergne-Rhône-Alpes, France métropolitaine, 15270, France" tourism attraction 0.323710213530857 France FALSE
+esf fr Europe Western Europe FALSE 3 2021-02-03 64479978 node "ESF, D 615, Chastreix-Sancy, Chastreix, Issoire, Puy-de-Dôme, Auvergne-Rhône-Alpes, France métropolitaine, 63680, France" amenity ski_school 0.101 France FALSE
+eurasia fr Europe Western Europe FALSE 3 2021-02-03 54313918 node "Eurasia, Place Jean-Pierre Pincemin, Plaine de Champbertrand, Sens, Yonne, Bourgogne-Franche-Comté, France métropolitaine, 89100, France" amenity restaurant 0.101 France FALSE
+geac fr Europe Western Europe FALSE 3 2021-02-03 48072741 node "Géac, Marennes, Marennes-Hiers-Brouage, Rochefort, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17320, France" place neighbourhood 0.25 France FALSE
+geron fr Europe Western Europe FALSE 3 2021-02-03 11058034 node "Geron, Le Tréhou, Brest, Finistère, Bretagne, France métropolitaine, 29450, France" place hamlet 0.35 France FALSE
+infn fr Europe Western Europe FALSE 3 2021-02-03 145095025 way "Institut national des formations notariales site de Nantes, Rue Gaston Turpin, Coulmiers, Saint-Donatien, Malakoff - Saint-Donatien, Nantes, Loire-Atlantique, Pays de la Loire, France métropolitaine, 44000, France" amenity college 0.001 France FALSE
+inra fr Europe Western Europe FALSE 3 2021-02-03 107855804 way "Institut National de la Recherche Agronomique, Rue Malar, Quartier du Gros-Caillou, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75007, France" office government 0.44821536212669 France FALSE
+insead fr Europe Western Europe FALSE 3 2021-02-03 144761314 way "Institut Européen d'Administration des Affaires, Route de l'Ermitage, Faisanderie, Fontainebleau, Seine-et-Marne, Île-de-France, France métropolitaine, 77300, France" amenity university 0.45279198506882 France FALSE
+lmu fr Europe Western Europe FALSE 3 2021-02-03 258528246 relation "Lemuy, Dole, Jura, Bourgogne-Franche-Comté, France métropolitaine, 39110, France" boundary administrative 0.531077603671255 France FALSE
+nazis fr Europe Western Europe FALSE 3 2021-02-03 298629865 way "Ruisseau des Nazis, Le Trillol, Rouffiac-des-Corbières, Narbonne, Aude, Occitanie, France métropolitaine, 11350, France" waterway stream 0.3 France FALSE
+ori fr Europe Western Europe FALSE 3 2021-02-03 258365623 relation "Auray, Lorient, Morbihan, Bretagne, France métropolitaine, 56400, France" boundary administrative 0.616662915473728 France FALSE
+pla fr Europe Western Europe FALSE 3 2021-02-03 258567039 relation "Le Pla, Foix, Ariège, Occitanie, France métropolitaine, 09460, France" boundary administrative 0.613138446783058 France FALSE
+sorbonne university fr Europe Western Europe FALSE 3 2021-02-03 258943206 relation "Sorbonne Université - Faculté des Sciences et Ingénierie, Rue Jussieu, Quartier Saint-Victor, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France" amenity university 0.450501936383412 France FALSE
+sun fr Europe Western Europe FALSE 3 2021-02-03 257932113 relation "Île-de-Sein, Quimper, Finistère, Bretagne, France métropolitaine, 29990, France" place island 0.460372709160497 France FALSE
+tsca fr Europe Western Europe FALSE 3 2021-02-03 79543194 node "TSCA, Grande Rue Nazareth, Capitole, Toulouse Centre, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31000, France" amenity driving_school 0.101 France FALSE
+university of bordeaux fr Europe Western Europe FALSE 3 2021-02-03 20434734 node "Broca 2, Rue Paul Broca, Victoire, Bordeaux Sud, Bordeaux, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33000, France" amenity university 0.101 France FALSE
+university of paris-saclay fr Europe Western Europe FALSE 3 2021-02-03 259420663 relation "Université Paris-Saclay à Palaiseau, 10;2, Boulevard Thomas Gobert, Rocher de Lozère, Les Taupiniaux, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91120, France" amenity university 0.201 France FALSE
+hanken school of economics fi Europe Northern Europe FALSE 3 2021-02-03 119630076 way "Svenska Handelshögskolan, Runeberginkatu, Etu-Töölö, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00100, Suomi / Finland" amenity university 0.389895770819526 Suomi / Finland FALSE
+beis es Europe Southern Europe FALSE 3 2021-02-03 46711873 node "Beis, Cis, Oza-Cesuras, Betanzos, A Coruña, Galicia, 15388, España" place hamlet 0.35 España FALSE
+cea es Europe Southern Europe FALSE 3 2021-02-03 257723188 relation "Cea, León, Castilla y León, España" boundary administrative 0.577556182714715 España FALSE
+iac es Europe Southern Europe FALSE 3 2021-02-03 136488779 way "Instituto de Astrofisica de Canarias, TF-180, Curva de Gracia, Gracia, La Cuesta, San Cristóbal de La Laguna, Santa Cruz de Tenerife, Canarias, 38207, España" amenity university 0.283827688081076 España FALSE
+napster es Europe Southern Europe FALSE 3 2021-02-03 54168575 node "Napster, Plaza de la Libertad, La Charca, Allende, Miranda de Ebro, Burgos, Castilla y León, 09200, España" amenity cafe 0.101 España FALSE
+pmi es Europe Southern Europe FALSE 3 2021-02-03 259549987 relation "Aeroport de Palma - Son Sant Joan, Camà de Can Pastilla, Can Pastilla, Palma, Illes Balears, 07610, España" aeroway aerodrome 0.487548679886816 España FALSE
+ucar es Europe Southern Europe FALSE 3 2021-02-03 258478044 relation "Ucar, Navarra - Nafarroa, 31154, España" boundary administrative 0.606410528784134 España FALSE
+university of zaragoza es Europe Southern Europe FALSE 3 2021-02-03 65211540 node "The University of Beer, 8, Calle Arzobispo Apaolaza, Romareda, Universidad, Zaragoza, Aragón, 50005, España" amenity cafe 0.301 España FALSE
+niels bohr institute dk Europe Northern Europe FALSE 3 2021-02-03 143629556 way "University of Copenhagen, Niels Bohr Institute, Blegdamsvej, Østerbro, København, Københavns Kommune, Region Hovedstaden, 1357, Danmark" office educational_institution 0.707266933591874 Danmark FALSE
+ernst de Europe Western Europe FALSE 3 2021-02-03 258503577 relation "Ernst, Cochem, Landkreis Cochem-Zell, Rheinland-Pfalz, Deutschland" boundary administrative 0.402323854176492 Deutschland FALSE
+european central bank de Europe Western Europe FALSE 3 2021-02-03 44670175 node "Europäische Zentralbank, 20, Sonnemannstraße, Ostend, Bornheim/Ostend, Frankfurt am Main, Hessen, 60314, Deutschland" office government 0.667340246660332 Deutschland FALSE
+german research foundation de Europe Western Europe FALSE 3 2021-02-03 58931236 node "Deutsche Stiftung Friedensforschung, 3-5, Am Ledenhof, Altstadt, Innenstadt, Osnabrück, Niedersachsen, 49074, Deutschland" office foundation 0.230361546636441 Deutschland FALSE
+leibniz institute for zoo and wildlife research de Europe Western Europe FALSE 3 2021-02-03 169300978 way "Leibniz-Institut für Zoo- und Wildtierforschung (IZW), Alfred-Kowalke-Straße, Reihenhäuser Kalinka, Friedrichsfelde, Lichtenberg, Berlin, 10315, Deutschland" office research 0.401 Deutschland FALSE
+max planck institute for developmental biology de Europe Western Europe FALSE 3 2021-02-03 103844203 way "Max-Planck-Institut für Entwicklungsbiologie, 5, Max-Planck-Ring, Max-Planck-Institut, Schönblick / Winkelwiese, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland" building yes 0.201 Deutschland FALSE
+max planck institute for extraterrestrial physics de Europe Western Europe FALSE 3 2021-02-03 14838537 node "Max-Planck-Institut für extraterrestrische Physik, 1, Gießenbachstraße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" office research 0.668804350670811 Deutschland FALSE
+max planck institute of biochemistry de Europe Western Europe FALSE 3 2021-02-03 22667364 node "Max-Planck-Institut für Biochemie, 18, Am Klopferspitz, Martinsried, Planegg, Landkreis München, Bayern, 82152, Deutschland" amenity university 0.565781769297865 Deutschland FALSE
+proxima centauri de Europe Western Europe FALSE 3 2021-02-03 58951540 node "Proxima Centauri, Milchweg, Haingebiet, Inselstadt, Bamberg, Bayern, 96049, Deutschland" tourism information 0.201 Deutschland FALSE
+university of stuttgart de Europe Western Europe FALSE 3 2021-02-03 123666613 way "Universität Hohenheim, Mühlweg, Hohenheim, Plieningen, Stuttgart, Aichtal, Baden-Württemberg, 70599, Deutschland" amenity university 0.54210101824834 Deutschland FALSE
+charles university cz Europe Eastern Europe FALSE 3 2021-02-03 11772836 node "Farmaceutická fakulta UK, Akademika Heyrovského, U Orlice, Hradec Králové, okres Hradec Králové, Královéhradecký kraj, Severovýchod, 50012, Česko" amenity university 0.001 Česko FALSE
+vertex cz Europe Eastern Europe FALSE 3 2021-02-03 99141481 way "Vertex, NedoÅ¡Ãn, LitomyÅ¡l, okres Svitavy, Pardubický kraj, Severovýchod, ÄŒesko" landuse industrial 0.3 ÄŒesko FALSE
+university of havana cu Americas Caribbean FALSE 3 2021-02-03 135439351 way "Universidad de las Ciencias Informáticas (UCI), Km. 2 ½, Autopista Novia del MediodÃa, La Lisa, La Habana, La Lisa, Cuba" amenity university 0.260958143076972 Cuba FALSE
+yugoslavia cu Americas Caribbean FALSE 3 2021-02-03 297426759 way "Yugoslavia, Reynold GarcÃa (Pastorita), Peñas Altas, Ciudad de Matanzas, Matanzas, Cuba" natural beach 0.3 Cuba FALSE
+university of antioquia co Americas South America FALSE 3 2021-02-03 129472917 way "Universidad Católica del Norte, Calle 34, Alto de la Mina, Vereda Las Cruces, Santa Rosa de Osos, Norte, Antioquia, Región Andina, Colombia" amenity university 0.101 Colombia FALSE
+communist party of china cn Asia Eastern Asia FALSE 3 2021-02-03 204074725 way "ä¸å…±æ±•å¤´å¸‚委员会, 8å<8f>·, 海滨路, 海安街é<81>“, 金平区, 汕头市, 广东çœ<81>, 515031, ä¸å›½" office political_party 0.001 ä¸å›½ FALSE
+dalian university of technology cn Asia Eastern Asia FALSE 3 2021-02-03 190857010 way "大连ç<90>†å·¥å¤§å¦, 2å<8f>·, 红凌路, 甘井å<90>区, 凌水街é<81>“, 甘井å<90>区, 大连市, è¾½å®<81>çœ<81>, 116024, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+duke kunshan university cn Asia Eastern Asia FALSE 3 2021-02-03 181887054 way "Duke Kunshan University, æ<9d>œå…‹å¤§é<81>“, 玉山镇, 昆山市, è‹<8f>州市, ä¸å›½" amenity university 0.703405604298285 ä¸å›½ FALSE
+henan cn Asia Eastern Asia FALSE 3 2021-02-03 258289127 relation "æ²³å<8d>—çœ<81>, ä¸å›½" boundary administrative 0.699353793876879 ä¸å›½ FALSE
+imperial college cn Asia Eastern Asia FALSE 3 2021-02-03 98640872 way "国å<90>监, 五é<81>“è<90>¥èƒ¡å<90>Œ, 东城区, 北京市, 100010, ä¸å›½" tourism attraction 0.375002297808295 ä¸å›½ FALSE
+inner mongolia cn Asia Eastern Asia FALSE 3 2021-02-03 257842595 relation "内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½" boundary administrative 0.65384947808461 ä¸å›½ FALSE
+jiangsu cn Asia Eastern Asia FALSE 3 2021-02-03 296043922 relation "江è‹<8f>çœ<81>, ä¸å›½" boundary administrative 0.67413115257446 ä¸å›½ FALSE
+jilin university cn Asia Eastern Asia FALSE 3 2021-02-03 160258991 way "å<90>‰æž—大å¦ï¼ˆæœ<9d>é˜³æ ¡åŒºï¼‰, 西民主大街 West Minzhu St, 清和街é<81>“, æœ<9d>阳区, 长春市, å<90>‰æž—çœ<81>, 130000, ä¸å›½" amenity university 0.446917790002857 ä¸å›½ FALSE
+lanzhou university cn Asia Eastern Asia FALSE 3 2021-02-03 71262039 node "兰州大å¦, 天水ä¸è·¯, 团结新æ<9d>‘è¡—é<81>“, 兰州市, 城关区, 兰州市, 甘肃çœ<81>, 730001, ä¸å›½" railway station 0.042720323856182 ä¸å›½ FALSE
+liaoning cn Asia Eastern Asia FALSE 3 2021-02-03 257963869 relation "è¾½å®<81>çœ<81>, ä¸å›½" boundary administrative 0.655891404596791 ä¸å›½ FALSE
+nanjing university cn Asia Eastern Asia FALSE 3 2021-02-03 110545344 way "å<8d>—京大å¦, å<8d>«å··, 鼓楼区, 玄æ¦åŒº, å<8d>—京市, 210093, ä¸å›½" amenity university 0.498289975489913 ä¸å›½ FALSE
+research institute cn Asia Eastern Asia FALSE 3 2021-02-03 235380215 way "research institute, Foot Path, é›<81>塔区 (Yanta), 西安市, 陕西çœ<81>, 710048, ä¸å›½" office research 0.201 ä¸å›½ FALSE
+shaanxi cn Asia Eastern Asia FALSE 3 2021-02-03 258564458 relation "陕西çœ<81>, ä¸å›½" boundary administrative 0.672615420866457 ä¸å›½ FALSE
+shandong cn Asia Eastern Asia FALSE 3 2021-02-03 257941393 relation "山东çœ<81>, ä¸å›½" boundary administrative 0.718289642729985 ä¸å›½ FALSE
+shanxi cn Asia Eastern Asia FALSE 3 2021-02-03 258080027 relation "山西çœ<81>, ä¸å›½" boundary administrative 0.673000372829377 ä¸å›½ FALSE
+sinopharm cn Asia Eastern Asia FALSE 3 2021-02-03 300321655 node "Sinopharm, é¾™å<8d>Žä¸œè·¯, 五里桥街é<81>“, 上海市, 黄浦区, 1072, ä¸å›½" office yes 0.101 ä¸å›½ FALSE
+wenchang satellite launch center cn Asia Eastern Asia FALSE 3 2021-02-03 166967645 way "文昌å<8d>«æ˜Ÿå<8f>‘射场, S206, 东郊镇, 文昌市, æµ·å<8d>—çœ<81>, ä¸å›½" aeroway spaceport 0.428336328616045 ä¸å›½ FALSE
+xiamen university cn Asia Eastern Asia FALSE 3 2021-02-03 126438748 way "厦门大å¦, 422, æ€<9d>明å<8d>—è·¯, 厦港街é<81>“, æ€<9d>明区, 厦门市, æ€<9d>明区, 厦门市, ç¦<8f>建çœ<81>, 361005, ä¸å›½" amenity university 0.451951803030286 ä¸å›½ FALSE
+zhejiang cn Asia Eastern Asia FALSE 3 2021-02-03 258327108 relation "浙江çœ<81>, ä¸å›½" boundary administrative 0.684734858394146 ä¸å›½ FALSE
+international institute of tropical agriculture cm Africa Middle Africa FALSE 3 2021-02-03 259457036 relation "Institut International d'Agriculture Tropicale, Rue 6.501, Nkolbisson, Yaoundé VII, Communauté urbaine de Yaoundé, Mfoundi, Centre, PB. 185 YAOUNDÉ, Cameroun" amenity college 0.301 Cameroun FALSE
+cerro armazones cl Americas South America FALSE 3 2021-02-03 6398940 node "Cerro Armazones, Antofagasta, Provincia de Antofagasta, Región de Antofagasta, Chile" natural peak 0.489701883147039 Chile FALSE
+incyte ch Europe Western Europe FALSE 3 2021-02-03 258303830 relation "Incyte, Morges, District de Morges, Vaud, 1110, Schweiz/Suisse/Svizzera/Svizra" landuse industrial 0.3 Schweiz/Suisse/Svizzera/Svizra FALSE
+paul scherrer institute ch Europe Western Europe FALSE 3 2021-02-03 300115214 way "Paul Scherrer Institut, 111, Forschungsstrasse, Würenlingen, Bezirk Baden, Aargau, 5232, Schweiz/Suisse/Svizzera/Svizra" amenity research_institute 0.567865768074584 Schweiz/Suisse/Svizzera/Svizra FALSE
+swiss national science foundation ch Europe Western Europe FALSE 3 2021-02-03 23413803 node "Schweizerischer Nationalfonds (SNF), Wildhainweg, Stadtbach, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra" office government 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of lausanne ch Europe Western Europe FALSE 3 2021-02-03 95776304 way "Université de Lausanne, A1a, Quartier Chamberonne, Chavannes-près-Renens, District de l'Ouest lausannois, Vaud, 1022, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.616266928066907 Schweiz/Suisse/Svizzera/Svizra FALSE
+world health organisation ch Europe Western Europe FALSE 3 2021-02-03 91298032 way "Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building commercial 0.676611286810515 Schweiz/Suisse/Svizzera/Svizra FALSE
+army cf Africa Middle Africa FALSE 3 2021-02-03 51674182 node "Army, Vakaga, Ködörösêse tî Bêafrîka - République Centrafricaine" place village 0.375 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+mbari cf Africa Middle Africa FALSE 3 2021-02-03 258465218 relation "Mbari, Mbomou, Ködörösêse tî Bêafrîka - République Centrafricaine" waterway river 0.4 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+canadian space agency ca Americas Northern America FALSE 3 2021-02-03 156978929 way "Canadian Space Agency, Resources Row, Saskatoon, Saskatoon (city), Saskatchewan, S7N 3R3, Canada" building industrial 0.301 Canada FALSE
+chime ca Americas Northern America FALSE 3 2021-02-03 210495198 way "Canadian Hydrogen Intensity Mapping Experiment, White Lake Trail - East, Area I (Skaha West/Kaleden/Apex), Regional District of Okanagan-Similkameen, British Columbia, V0H 1R4, Canada" man_made telescope 0.320054390558144 Canada FALSE
+first nations ca Americas Northern America FALSE 3 2021-02-03 5550556 node "First Nations, West Mall, University of British Columbia, Electoral Area A, Metro Vancouver Regional District, British Columbia, V6T 1Z2, Canada" emergency phone 0.201 Canada FALSE
+international civil aviation organization ca Americas Northern America FALSE 3 2021-02-03 114910153 way "Organisation de l'Aviation Civile Internationale, 999, Boulevard Robert-Bourassa, René-Lévesque, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3C 5H7, Canada" office international_organization 0.301 Canada FALSE
+manitoba ca Americas Northern America FALSE 3 2021-02-03 258500059 relation "Manitoba, Canada" boundary administrative 0.758017394476413 Canada FALSE
+northwest territories ca Americas Northern America FALSE 3 2021-02-03 258121655 relation "Northwest Territories, Canada" boundary administrative 0.798189772893837 Canada FALSE
+nunavut ca Americas Northern America FALSE 3 2021-02-03 257857561 relation "ᓄᓇᕗᑦ Nunavut, Canada" boundary administrative 0.712760363996049 Canada FALSE
+professional institute of the public service of canada ca Americas Northern America FALSE 3 2021-02-03 64283995 node "Professional Institute Of The Public Service Of Canada, 250, Tremblay Road, Alta Vista, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1G 3H5, Canada" office association 0.801 Canada FALSE
+queen's university in kingston ca Americas Northern America FALSE 3 2021-02-03 85363828 way "Queen's University - West Campus, West Campus Lane, Portsmouth, Kingston, Eastern Ontario, Ontario, K7M 6G4, Canada" amenity university 0.501 Canada FALSE
+rural affairs ca Americas Northern America FALSE 3 2021-02-03 122759813 way "Ontario Ministry of Agriculture, Food, and Rural Affairs, 1, Stone Road West, Guelph, Southwestern Ontario, Ontario, N1G 0A9, Canada" office government 0.201 Canada FALSE
+university of windsor ca Americas Northern America FALSE 3 2021-02-03 259225016 relation "University of Windsor, California Avenue, Windsor, Southwestern Ontario, Ontario, N9B 2Z8, Canada" amenity university 0.744009006305759 Canada FALSE
+atp by Europe Eastern Europe FALSE 3 2021-02-03 206941011 way "Ð<90>ТП, ВерхнедвинÑ<81>к, ВерхнедвинÑ<81>кий район, ВитебÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, БеларуÑ<81>ÑŒ" landuse industrial 0.2 БеларуÑ<81>ÑŒ FALSE
+belarus by Europe Eastern Europe FALSE 3 2021-02-03 257723650 relation БеларуÑ<81>ÑŒ boundary administrative 0.756896296328902 БеларуÑ<81>ÑŒ FALSE
+ministry of agriculture bw Africa Southern Africa FALSE 3 2021-02-03 178648159 way "Ministry of Agriculture, Gaborone, South-East District, Botswana" landuse commercial 0.5 Botswana FALSE
+biomed central br Americas South America FALSE 3 2021-02-03 53650511 node "BioMed, 761, Rua Venâncio Aires, Centro Histórico, Centro, Cruz Alta, Região Geográfica Imediata de Cruz Alta, Região Geográfica Intermediária de Passo Fundo, Rio Grande do Sul, Região Sul, 98005-020, Brasil" shop yes 0.101 Brasil FALSE
+ebay br Americas South America FALSE 3 2021-02-03 83811700 node "eBay Jataizinho, 9513, Rodovia Melo Peixoto, Jataizinho, Região Geográfica Imediata de Londrina, Região Geográfica Intermediária de Londrina, Paraná, Região Sul, 86210-000, Brasil" shop yes 0.677751877815445 Brasil FALSE
+federal university of pernambuco br Americas South America FALSE 3 2021-02-03 197192851 way "Universidade Federal de Pernambuco, 1235, Avenida Professor Moraes Rego, Cidade Universitária, Recife, Região Geográfica Imediata do Recife, Região Metropolitana do Recife, Pernambuco, Região Nordeste, 50670-420, Brasil" amenity university 0.301 Brasil FALSE
+federal university of rio grande br Americas South America FALSE 3 2021-02-03 258468678 relation "Universidade Federal do Rio de Janeiro, Rua Dalias, Vila Residencial dos Funcionários, Cidade Universitária, Zona Norte do Rio de Janeiro, Rio de Janeiro, Região Geográfica Imediata do Rio de Janeiro, Região Metropolitana do Rio de Janeiro, Região Geográfica Intermediária do Rio de Janeiro, Rio de Janeiro, Região Sudeste, 21941-907, Brasil" amenity university 0.696203816091948 Brasil FALSE
+nejm br Americas South America FALSE 3 2021-02-03 174188055 way "Seme Nagib Nejm, Centro, Irati, Região Geográfica Imediata de Irati, Região Geográfica Intermediária de Ponta Grossa, Paraná, Região Sul, 84500-236, Brasil" highway residential 0.2 Brasil FALSE
+novozymes br Americas South America FALSE 3 2021-02-03 182674703 way "Novozymes, Araucária, Região Geográfica Imediata de Curitiba, Região Metropolitana de Curitiba, Região Geográfica Intermediária de Curitiba, Paraná, Região Sul, Brasil" landuse industrial 0.3 Brasil FALSE
+ufrj br Americas South America FALSE 3 2021-02-03 258468678 relation "Universidade Federal do Rio de Janeiro, Rua Dalias, Vila Residencial dos Funcionários, Cidade Universitária, Zona Norte do Rio de Janeiro, Rio de Janeiro, Região Geográfica Imediata do Rio de Janeiro, Região Metropolitana do Rio de Janeiro, Região Geográfica Intermediária do Rio de Janeiro, Rio de Janeiro, Região Sudeste, 21941-907, Brasil" amenity university 0.496203816091948 Brasil FALSE
+erasmus university medical center be Europe Western Europe FALSE 3 2021-02-03 314840 node "Erasme - Erasmus, Route de Lennik - Lennikse Baan, Anderlecht, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1070, België / Belgique / Belgien" railway station 0.444585942469205 België / Belgique / Belgien FALSE
+university of antwerp be Europe Western Europe FALSE 3 2021-02-03 85049624 way "Campus Middelheim Universiteit Antwerpen, Lindendreef, Middelheim, Antwerpen, Vlaanderen, 2020, België / Belgique / Belgien" amenity university 0.219931111449547 België / Belgique / Belgien FALSE
+university of leuven be Europe Western Europe FALSE 3 2021-02-03 110607812 way "University Snooker, 106, Hertogstraat, Matadi, Heverlee, Leuven, Vlaams-Brabant, Vlaanderen, 3001, België / Belgique / Belgien" amenity bar 0.201 België / Belgique / Belgien FALSE
+atomic energy commission bd Asia Southern Asia FALSE 3 2021-02-03 160816975 way "Atomic Energy Commission, বিà¦<8f>নপি বাজার-আগারগাà¦<81>ও পানির টà§<8d>যাংকি রোড, তালতলা, পশà§<8d>চিম আগারগাà¦<81>ও, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1207, বাংলাদেশ" office government 0.301 বাংলাদেশ FALSE
+daca bd Asia Southern Asia FALSE 3 2021-02-03 44550743 node "ঢাকা, Chanpara Bazar, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1230, বাংলাদেশ" place city 0.610110109270811 বাংলাদেশ FALSE
+arctic council au Oceania Australia and New Zealand FALSE 3 2021-02-03 158850149 way "Arctic Way, Kellyville Ridge, Sydney, Blacktown City Council, New South Wales, 2769, Australia" highway residential 0.3 Australia FALSE
+australia institute au Oceania Australia and New Zealand FALSE 3 2021-02-03 47173025 node "Fitness Institute Australia, Elizabeth Street, Melbourne Innovation District, Melbourne, City of Melbourne, Victoria, 3000, Australia" office company 0.201 Australia FALSE
+australian science media centre au Oceania Australia and New Zealand FALSE 3 2021-02-03 56940969 node "Australian Science Media Centre, 55, Exchange Place, Adelaide, Adelaide City Council, South Australia, 5000, Australia" office yes 0.401 Australia FALSE
+charles sturt university au Oceania Australia and New Zealand FALSE 3 2021-02-03 258986170 relation "Charles Sturt University, Wagga Wagga City Council, New South Wales, 2678, Australia" boundary administrative 0.55 Australia FALSE
+garvan institute of medical research au Oceania Australia and New Zealand FALSE 3 2021-02-03 212333308 way "Garvan Institute of Medical Research, Chaplin Street, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia" building yes 0.791360254031496 Australia FALSE
+general medical council au Oceania Australia and New Zealand FALSE 3 2021-02-03 212333308 way "Garvan Institute of Medical Research, Chaplin Street, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia" building yes 0.491360254031496 Australia FALSE
+murdoch university au Oceania Australia and New Zealand FALSE 3 2021-02-03 84018837 way "Murdoch University, Banksia Terrace, Murdoch, City Of Melville, Western Australia, 6150, Australia" amenity university 0.620333972314475 Australia FALSE
+parkes observatory au Oceania Australia and New Zealand FALSE 3 2021-02-03 267335 node "Parkes Observatory, Telescope Road, Parkes, Parkes Shire Council, New South Wales, 2870, Australia" tourism attraction 0.201 Australia FALSE
+rmit university au Oceania Australia and New Zealand FALSE 3 2021-02-03 134618167 way "RMIT University, Hamilton - Chatsworth Road, Tarrington, Hamilton, Shire of Southern Grampians, Victoria, 3300, Australia" amenity university 0.201 Australia FALSE
+science exchange au Oceania Australia and New Zealand FALSE 3 2021-02-03 144377931 way "The Science Exchange, 55, Exchange Place, Adelaide, Adelaide City Council, South Australia, 5000, Australia" building yes 0.201 Australia FALSE
+sunday times au Oceania Australia and New Zealand FALSE 3 2021-02-03 124957593 way "The Sunday Times, James Street, Perth, City of Perth, Western Australia, 6000, Australia" building yes 0.201 Australia FALSE
+swinburne university of technology au Oceania Australia and New Zealand FALSE 3 2021-02-03 258895413 relation "Swinburne University of Technology (Hawthorn Campus), John Street, Hawthorn, City of Boroondara, Victoria, 3122, Australia" amenity university 0.814183292472317 Australia FALSE
+graz university of technology at Europe Western Europe FALSE 3 2021-02-03 258643242 relation "Technische Universität Graz, Eduard-Richter-Gasse, Herz-Jesu-Viertel, Sankt Leonhard, Graz, Steiermark, 8010, Österreich" amenity university 0.532228989952608 Österreich FALSE
+ibs at Europe Western Europe FALSE 3 2021-02-03 110424761 way "22, IBS, Teufenbach, Teufenbach-Katsch, Bezirk Murau, Steiermark, 8833, Österreich" landuse industrial 0.3 Österreich FALSE
+international institute for applied systems analysis at Europe Western Europe FALSE 3 2021-02-03 41950525 node "IIASA, 1, Schlossplatz, Laxenburg, Gemeinde Laxenburg, Bezirk Mödling, Niederösterreich, 2361, Österreich" office research 0.001 Österreich FALSE
+paho at Europe Western Europe FALSE 3 2021-02-03 1154495 node "Per-Albin-Hansson-Siedlung Ost, KG Oberlaa Stadt, Favoriten, Wien, 1100, Österreich" place neighbourhood 0.25 Österreich FALSE
+space research institute at Europe Western Europe FALSE 3 2021-02-03 119966043 way "Österreichische Akademie der Wissenschaften, Institut für Weltraumforschung, 6, Schmiedlstraße, Messendorfberg, Sankt Peter, Graz, Steiermark, 8042, Österreich" amenity public_building 0.001 Österreich FALSE
+vienna university of technology at Europe Western Europe FALSE 3 2021-02-03 258307874 relation "TU Wien, Hauptgebäude, Olga-Wisinger-Florian-Platz, Wieden, KG Wieden, Wieden, Wien, 1040, Österreich" building university 0.286834742964615 Österreich FALSE
+pierre auger observatory ar Americas South America FALSE 3 2021-02-03 10519055 node "Observatorio Pierre Auger, 304, Avenida San MartÃn (Norte), Malargüe, Distrito Ciudad de Malargüe, Departamento Malargüe, Mendoza, Argentina" tourism attraction 0.53489332460211 Argentina FALSE
+subaru ar Americas South America FALSE 3 2021-02-03 201692997 way "Subaru, MartÃnez Oeste, MartÃnez, Partido de San Isidro, Buenos Aires, Argentina" landuse industrial 0.3 Argentina FALSE
+university of zimbabwe zw Africa Eastern Africa FALSE 2 2021-02-03 182258631 way "University of Zimbabwe, 630, Churchill Avenue, Avondale, Harare, Harare Province, 04-263, Zimbabwe" amenity university 0.685910756155564 Zimbabwe FALSE
+arthur mcdonald za Africa Southern Africa FALSE 2 2021-02-03 139766772 way "Arthur McDonald Avenue, Edleen, Ekurhuleni Ward 16, Kempton Park, City of Ekurhuleni Metropolitan Municipality, Gauteng, 1619, South Africa" highway residential 0.3 South Africa FALSE
+department of environmental affairs za Africa Southern Africa FALSE 2 2021-02-03 202039404 way "Department of Economic Development and Environmental Affairs, 5, Huntley Street, Makana Ward 8, Makhanda (Grahamstown), Makana Local Municipality, Sarah Baartman District Municipality, Eastern Cape, 6139, South Africa" office government 0.401 South Africa FALSE
+east asian observatory za Africa Southern Africa FALSE 2 2021-02-03 120613 node "Observatory, Lynton Road, Observatory, Cape Town Ward 57, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" railway station 0.241913844040538 South Africa FALSE
+international court of justice za Africa Southern Africa FALSE 2 2021-02-03 230999389 way "Curious Minds International School, 1016, Justice Mahomed Street, Menlo Park, Tshwane Ward 82, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0011, South Africa" amenity kindergarten 0.301 South Africa FALSE
+monash za Africa Southern Africa FALSE 2 2021-02-03 101123044 way "Monash, Monash Boulevard, Johannesburg Ward 97, Roodepoort, City of Johannesburg Metropolitan Municipality, Gauteng, South Africa" amenity university 0.373081870492623 South Africa FALSE
+ska observatory za Africa Southern Africa FALSE 2 2021-02-03 54591242 node "SKA South Africa, Park Road, Maitland Garden Village, Cape Town Ward 53, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" office ngo 0.101 South Africa FALSE
+south african medical research council za Africa Southern Africa FALSE 2 2021-02-03 230613646 way "South African Medical Research Council, 1, Soutpansberg Road, Tshwane Ward 58, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0007, South Africa" office research 0.501 South Africa FALSE
+university of south africa za Africa Southern Africa FALSE 2 2021-02-03 126210070 way "University of South Africa, Rabe Street, Polokwane Ward 22, Polokwane, Polokwane Local Municipality, Capricorn District Municipality, Limpopo, 0690, South Africa" amenity university 0.401 South Africa FALSE
+university of the free state za Africa Southern Africa FALSE 2 2021-02-03 10968312 node "University of the Free State, 205, Nelson Mandela Drive, Brandwag, Mangaung Ward 22, Bloemfontein, Mangaung Metropolitan Municipality, Free State, 9321, South Africa" amenity school 0.89425812326797 South Africa FALSE
+hadza ye Asia Western Asia FALSE 2 2021-02-03 12334974 node "Øجة, مديرية مدينة Øجة, Ù…ØاÙ<81>ظة Øجة, اليمن" place town 0.409632994596587 اليمن FALSE
+samoa ws Oceania Polynesia FALSE 2 2021-02-03 258569989 relation SÄ<81>moa boundary administrative 0.643977564870154 SÄ<81>moa FALSE
+htv vn Asia South-Eastern Asia FALSE 2 2021-02-03 127533062 way "9, Ä<90>aÌ€i Truyền hiÌ€nh TP.HCM (HTV), PhÆ°á»<9d>ng Bến Nghé, Quáºn 1, Thà nh phố Hồ Chà Minh, Việt Nam" landuse commercial 0.3 Việt Nam FALSE
+enea ve Americas South America FALSE 2 2021-02-03 255171662 way "La Enea, Parroquia Urbana Biruaca, Municipio Biruaca, Apure, Venezuela" place town 0.4 Venezuela FALSE
+pontifical academy of sciences va Europe Southern Europe FALSE 2 2021-02-03 58730114 node "Pontificia Accademia delle Scienze, Viale del Giardino Quadrato, Città del Vaticano, 00120, Città del Vaticano" office educational_institution 0.483796693268388 Città del Vaticano FALSE
+abbott laboratories us Americas Northern America FALSE 2 2021-02-03 214402852 way "Abbott Laboratories, North Chicago, Lake County, Illinois, United States" landuse industrial 0.660548150210851 United States FALSE
+acad us Americas Northern America FALSE 2 2021-02-03 88308109 way "Acad, Parlier, Fresno County, California, 93662, United States" highway residential 0.2 United States FALSE
+accuweather in state college us Americas Northern America FALSE 2 2021-02-03 177586041 way "AccuWeather, 385, Science Park Road, Science Park, State College, Centre County, Pennsylvania, 16803, United States" office company 0.301 United States FALSE
+aerospace corporation us Americas Northern America FALSE 2 2021-02-03 258788014 relation "The Aerospace Corporation, 2310, East El Segundo Boulevard, El Segundo, Los Angeles County, California, 90245, United States" office research 0.506728041583383 United States FALSE
+agios pharmaceuticals us Americas Northern America FALSE 2 2021-02-03 43500306 node "Agios Pharmaceuticals, 38, Sidney Street, University Park, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" place house 0.201 United States FALSE
+aia us Americas Northern America FALSE 2 2021-02-03 104903713 way "American Institute of Architects, 1735, New York Avenue Northwest, Washington, District of Columbia, 20006, United States" office ngo 0.482165402797397 United States FALSE
+alliance us Americas Northern America FALSE 2 2021-02-03 257848637 relation "Alliance, Box Butte County, Nebraska, 69301, United States" boundary administrative 0.545502923866838 United States FALSE
+alnylam pharmaceuticals us Americas Northern America FALSE 2 2021-02-03 43655569 node "Alnylam Pharmaceuticals, 300, Third Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" office research 0.201 United States FALSE
+american cancer society us Americas Northern America FALSE 2 2021-02-03 296512848 node "American Cancer Society, 3709, West Jetton Avenue, Palma Ceia, Tampa, Hillsborough County, Florida, 33629, United States" office ngo 0.301 United States FALSE
+american institute of physics us Americas Northern America FALSE 2 2021-02-03 210348591 way "American Institute of Physics, 500, Sunnyside Boulevard, Oyster Bay, Nassau County, New York, 11797, United States" building university 0.401 United States FALSE
+american lung association us Americas Northern America FALSE 2 2021-02-03 76922142 node "American Lung Association, 3000, Kelly Lane, Springfield, Sangamon County, Illinois, 62711, United States" amenity social_facility 0.301 United States FALSE
+american veterinary medical association us Americas Northern America FALSE 2 2021-02-03 75706148 node "AHVMA, 37, Kensington Parkway, Box Hill North, Harford County, Maryland, 21009, United States" office yes 0.001 United States FALSE
+amherst college us Americas Northern America FALSE 2 2021-02-03 162492573 way "Amherst College, Barrett Hill Road, Amherst, Hampshire County, Massachusetts, 01002, United States" amenity college 0.715982514090231 United States FALSE
+amo us Americas Northern America FALSE 2 2021-02-03 258145410 relation "Amo, Hendricks County, Indiana, 46103, United States" boundary administrative 0.415802194348805 United States FALSE
+aphis us Americas Northern America FALSE 2 2021-02-03 259242165 relation "Lake Aphis, Klamath County, Oregon, United States" natural water 0.3 United States FALSE
+appalachia us Americas Northern America FALSE 2 2021-02-03 257877414 relation "Appalachia, Wise County, Virginia, 24216, United States" boundary administrative 0.462086077089553 United States FALSE
+armstrong flight research center us Americas Northern America FALSE 2 2021-02-03 243644685 way "Armstrong Flight Research Center, Forbes Avenue, Kern County, California, 93524, United States" aeroway aerodrome 0.401 United States FALSE
+arnold us Americas Northern America FALSE 2 2021-02-03 257968026 relation "Arnold, Jefferson County, Missouri, 63010, United States" boundary administrative 0.513360018065774 United States FALSE
+atlantis bank us Americas Northern America FALSE 2 2021-02-03 258253193 relation "Atlantis, Palm Beach County, Florida, United States" boundary administrative 0.514922298920702 United States FALSE
+autism research centre us Americas Northern America FALSE 2 2021-02-03 171350220 way "Burkhart Center for Autism Education & Research, 2902, 18th Street, Lubbock, Lubbock County, Texas, 79409, United States" building college 0.201 United States FALSE
+b612 foundation us Americas Northern America FALSE 2 2021-02-03 80081794 node "B612 Foundation, 20, Sunnyside Avenue, Mill Valley, Marin County, California, 94941, United States" office foundation 0.201 United States FALSE
+bayer crop science us Americas Northern America FALSE 2 2021-02-03 194221252 way "Bayer Crop Science, East 50th Street, Lubbock, Lubbock County, Texas, 79404, United States" building yes 0.301 United States FALSE
+baylor university us Americas Northern America FALSE 2 2021-02-03 129265508 way "Baylor University, 1301, South University Parks Drive, Waco, McLennan County, Texas, 76706, United States" amenity university 0.719338807988632 United States FALSE
+bell labs us Americas Northern America FALSE 2 2021-02-03 177283205 way "Bell Labs Sewage Treatment, Ramanessin Trail, Holmdel, Holmdel Township, Monmouth County, New Jersey, 07733, United States" man_made wastewater_plant 0.201 United States FALSE
+betty moore foundation us Americas Northern America FALSE 2 2021-02-03 76687108 node "Annual Reviews, 4116 Park Boulevard, Palo Alto, CA 94306, Palo Alto, Santa Clara County, California, 94306, United States" shop bookmaker 0.001 United States FALSE
+binghamton university us Americas Northern America FALSE 2 2021-02-03 217349557 way "Binghamton University Nature Preserve, Vestal Town, Broome County, New York, United States" leisure park 0.35 United States FALSE
+black lives matter us Americas Northern America FALSE 2 2021-02-03 193863362 way "Black Lives Matter Plaza Northwest, Golden Triangle, Washington, District of Columbia, 20012, United States" highway secondary 0.4 United States FALSE
+books & arts us Americas Northern America FALSE 2 2021-02-03 137492216 way "Plaza: Cake Arts, Nevermore Books, Tombstone Tattoo, Twice But Nice, 2852, West Sylvania Avenue, Deaveaux, Fitch, Toledo, Lucas County, Ohio, 43613, United States" building yes 0.201 United States FALSE
+boston biomedical research institute us Americas Northern America FALSE 2 2021-02-03 97416620 way "Boston Biomedical Research Institute, 64, Grove Street, East Watertown, Watertown, Middlesex County, Massachusetts, 02135, United States" building yes 0.401 United States FALSE
+boston globe us Americas Northern America FALSE 2 2021-02-03 92324871 way "Boston Street, Globe, Gila County, Arizona, 85501, United States" highway residential 0.3 United States FALSE
+boston medical center us Americas Northern America FALSE 2 2021-02-03 257699340 relation "Boston Medical Center, 1, Albany Street, South End, Boston, Suffolk County, Massachusetts, 02118, United States" amenity hospital 0.615802194348806 United States FALSE
+brain institute us Americas Northern America FALSE 2 2021-02-03 157960992 way "McKnight Brain Institute, 1149, Newell Drive, Gainesville, Alachua County, Florida, 32610, United States" office research 0.528069876897978 United States FALSE
+brookhaven us Americas Northern America FALSE 2 2021-02-03 259194909 relation "Brookhaven, Lincoln County, Mississippi, 39601, United States" boundary administrative 0.571820093574305 United States FALSE
+bruins us Americas Northern America FALSE 2 2021-02-03 354197 node "Bruins, Crittenden County, Arkansas, United States" place hamlet 0.35 United States FALSE
+bureau of land management us Americas Northern America FALSE 2 2021-02-03 83548763 node "Bureau of Land Management, 1849, C Street Northwest, Washington, District of Columbia, 20240, United States" office government 0.910062690742063 United States FALSE
+burke museum of natural history and culture us Americas Northern America FALSE 2 2021-02-03 127334627 way "Burke Museum of Natural History and Culture, 4300, 15th Avenue Northeast, University District, Seattle, King County, Washington, 98105, United States" tourism museum 1.04572520594953 United States FALSE
+california air resources board us Americas Northern America FALSE 2 2021-02-03 51708475 node "California Air Resources Board, 1001, I Street, Sacramento, Sacramento County, California, 95814, United States" office government 0.780761518938055 United States FALSE
+california state polytechnic university us Americas Northern America FALSE 2 2021-02-03 259490882 relation "California State Polytechnic University, Pomona, 3801, Temple Avenue, Pomona, Los Angeles County, California, 91768, United States" amenity university 0.401 United States FALSE
+carnegie observatories us Americas Northern America FALSE 2 2021-02-03 158103230 way "The Carnegie Observatories, 813, Santa Barbara Street, Bungalow Heaven, Pasadena, Los Angeles County, California, 91101, United States" office research 0.201 United States FALSE
+cascadia us Americas Northern America FALSE 2 2021-02-03 321395 node "Cascadia, Linn County, Oregon, United States" place hamlet 0.399042266993274 United States FALSE
+cell research us Americas Northern America FALSE 2 2021-02-03 137785222 way "Former GM Fuel Cell Research Facility, Honeoye Falls, Mendon, Monroe County, New York, United States" landuse industrial 0.4 United States FALSE
+center for infectious disease research us Americas Northern America FALSE 2 2021-02-03 53565038 node "Center for Infectious Disease Research, 307, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office research 0.501 United States FALSE
+center for physics research us Americas Northern America FALSE 2 2021-02-03 96734346 way "American Center for Physics, Physics Ellipse Drive, University of Maryland Research Park, Riverdale Park, Prince George's County, Maryland, 20737, United States" building office 0.401 United States FALSE
+center for research us Americas Northern America FALSE 2 2021-02-03 100783959 way "National Center for Atmospheric Research Mesa Lab, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States" building government 0.691849073716688 United States FALSE
+central south university us Americas Northern America FALSE 2 2021-02-03 151708639 way "South University, 709, Mall Boulevard, Grove Park, Savannah, Chatham County, Georgia, 31406-4805, United States" amenity schoolgrounds 0.201 United States FALSE
+chinook us Americas Northern America FALSE 2 2021-02-03 258340210 relation "Chinook, Blaine County, Montana, 59523, United States" boundary administrative 0.445725205949526 United States FALSE
+cincinnati children's hospital medical center us Americas Northern America FALSE 2 2021-02-03 104904209 way "Cincinnati Children’s Hospital Medical Center, 3333, Burnet Avenue, Pill Hill, Corryville, Cincinnati, Hamilton County, Ohio, 45229-3026, United States" amenity hospital 0.883827688081076 United States FALSE
+clinical center us Americas Northern America FALSE 2 2021-02-03 97490319 way "Clinical Center, Deaconess Road, Boston, Suffolk County, Massachusetts, 02120, United States" building yes 0.201 United States FALSE
+colby college us Americas Northern America FALSE 2 2021-02-03 101282151 way "Colby College, 4000, Mayflower Hill Drive, Waterville, Kennebec County, Maine, 04901, United States" amenity college 0.640907941903285 United States FALSE
+colorado school of mines us Americas Northern America FALSE 2 2021-02-03 98946169 way "Colorado School of Mines, 1500, Illinois Street, Golden, Jefferson County, Colorado, 80401, United States" amenity university 0.401 United States FALSE
+complete genomics us Americas Northern America FALSE 2 2021-02-03 94062190 way "Complete Genomics, Inc., 2071, Stierlin Court, Britannia Shoreline Technology Park, Mountain View, Santa Clara County, California, 94043, United States" building yes 0.201 United States FALSE
+concord university us Americas Northern America FALSE 2 2021-02-03 181466493 way "Concord University, Oxley Road, Mercer County, West Virginia, 24712, United States" amenity university 0.533256970094253 United States FALSE
+congressional us Americas Northern America FALSE 2 2021-02-03 85947506 way "Congressional, La Quinta, Riverside County, California, 92247, United States" highway residential 0.2 United States FALSE
+conservation biology us Americas Northern America FALSE 2 2021-02-03 259518942 relation "Smithsonian Conservation Biology Institute, Front Royal, Warren County, Virginia, United States" boundary national_park 0.534080577887678 United States FALSE
+cornell laboratory of ornithology us Americas Northern America FALSE 2 2021-02-03 544921 node "159, Cornell Laboratory of Ornithology, Lansing, Lansing Town, Tompkins County, New York, 14850, United States" place locality 0.525 United States FALSE
+cos us Americas Northern America FALSE 2 2021-02-03 258401206 relation "Coshocton County, Ohio, United States" boundary administrative 0.614671596762107 United States FALSE
+council us Americas Northern America FALSE 2 2021-02-03 257438176 relation "Council, Adams County, Idaho, United States" boundary administrative 0.474154132137857 United States FALSE
+cowen and company us Americas Northern America FALSE 2 2021-02-03 258460482 relation "Cowen, Webster County, West Virginia, 26206, United States" boundary administrative 0.453558714867367 United States FALSE
+david geffen school of medicine us Americas Northern America FALSE 2 2021-02-03 147422515 way "David Geffen School of Medicine, Tiverton Drive, Westwood Village, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity university 0.842480646342894 United States FALSE
+delta us Americas Northern America FALSE 2 2021-02-03 258432495 relation "Delta County, Texas, United States" boundary administrative 0.656415995814331 United States FALSE
+department of state us Americas Northern America FALSE 2 2021-02-03 46783150 node "National foreign affairs, training center, Shultz, department of state, 4000, NFATC, Alcova Heights, Arlington, Arlington County, Virginia, 22204, United States" place house 0.301 United States FALSE
+desert research institute us Americas Northern America FALSE 2 2021-02-03 97296899 way "Desert Research Institute, University Center Drive, Hughes Center, Paradise, Clark County, Nevada, 89169-4813, United States" amenity university 0.301 United States FALSE
+digitalglobe us Americas Northern America FALSE 2 2021-02-03 104916466 way "DigitalGlobe, 12076, Grant Street, Thornton, Adams County, Colorado, 80241, United States" office company 0.503582454919981 United States FALSE
+doherty earth observatory us Americas Northern America FALSE 2 2021-02-03 101655405 way "Lamont-Doherty Earth Observatory, Ludlow Lane, Palisades, Town of Orangetown, Rockland County, New York, 10964, United States" amenity university 0.301 United States FALSE
+eagle us Americas Northern America FALSE 2 2021-02-03 258059994 relation "Eagle County, Colorado, United States" boundary administrative 0.607744508540787 United States FALSE
+electric power research institute us Americas Northern America FALSE 2 2021-02-03 236587227 way "Electric Power Research Institute, Corridor Park Boulevard, Knox County, Tennessee, 37932, United States" office research 0.401 United States FALSE
+eli us Americas Northern America FALSE 2 2021-02-03 258404300 relation "Ely, White Pine County, Nevada, United States" boundary administrative 0.445859697073655 United States FALSE
+emory university school of medicine us Americas Northern America FALSE 2 2021-02-03 101031365 way "Emory University School of Medicine, McTyeire Drive Northeast, Emory Highlands, Druid Hills, DeKalb County, Georgia, 30322, United States" amenity college 0.501 United States FALSE
+ericsson us Americas Northern America FALSE 2 2021-02-03 258529699 relation "Ericsson, Nokomis, Minneapolis, Hennepin County, Minnesota, United States" boundary administrative 0.395064603083614 United States FALSE
+esc us Americas Northern America FALSE 2 2021-02-03 98380724 way "Delta County Airport, Birch Street, Woodland Estates, Escanaba, Delta County, Michigan, 49829, United States" aeroway aerodrome 0.4004701084432 United States FALSE
+farber cancer institute us Americas Northern America FALSE 2 2021-02-03 145616376 way "Dana-Farber Cancer Institute, 450, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States" amenity hospital 0.61689306175332 United States FALSE
+federal aviation administration us Americas Northern America FALSE 2 2021-02-03 129948979 way "Federal Aviation Administration, Bernalillo County, New Mexico, United States" boundary administrative 0.65 United States FALSE
+federal communications commission us Americas Northern America FALSE 2 2021-02-03 301202937 node "Federal Communications Commission, 45, L Street Northeast, NoMa, Near Northeast, Washington, District of Columbia, 20554, United States" office government 0.894765406107107 United States FALSE
+fermi national laboratory us Americas Northern America FALSE 2 2021-02-03 99059145 way "Fermi National Accelerator Laboratory, DuPage County, Illinois, United States" landuse industrial 0.763054296170657 United States FALSE
+fertile crescent us Americas Northern America FALSE 2 2021-02-03 92672618 way "Fertile Crescent, Prince William County, Virginia, United States" highway residential 0.3 United States FALSE
+florida fish and wildlife conservation commission us Americas Northern America FALSE 2 2021-02-03 59942908 node "Split Oak Forest Wildlife & Environmental, Clapp Simms Duda Road, Orange County, Florida, 34771-9208, United States" tourism information 0.201 United States FALSE
+ford us Americas Northern America FALSE 2 2021-02-03 258207918 relation "Ford County, Illinois, United States" boundary administrative 0.635552540995357 United States FALSE
+forest service us Americas Northern America FALSE 2 2021-02-03 88138445 way "Forest Service, Calaveras County, California, United States" highway residential 0.3 United States FALSE
+future of research us Americas Northern America FALSE 2 2021-02-03 258950849 relation "Future Energy and Advanced Manufacturing, Technology Trail, GE Global Research Center, Niskayuna, Schenectady County, New York, 12309, United States" building industrial 0.201 United States FALSE
+gallaudet us Americas Northern America FALSE 2 2021-02-03 49650415 node "Bison Shop, Lincoln Circle, Ivy City, Washington, District of Columbia, 20242, United States" shop books 0.001 United States FALSE
+gettysburg college us Americas Northern America FALSE 2 2021-02-03 162608659 way "Gettysburg College, Carlisle Street, Gettysburg, Adams County, Pennsylvania, 17325, United States" amenity university 0.634194405720176 United States FALSE
+green bank observatory us Americas Northern America FALSE 2 2021-02-03 299024599 relation "Green Bank Observatory, ICB Road, Green Bank, Pocahontas County, West Virginia, 24944, United States" amenity research_institute 0.301 United States FALSE
+green bank telescope us Americas Northern America FALSE 2 2021-02-03 102881650 way "Green Bank Telescope, Slavin Hollow Road, Pocahontas County, West Virginia, 24944, United States" man_made telescope 0.690988572487363 United States FALSE
+greenfield us Americas Northern America FALSE 2 2021-02-03 258666758 relation "Greenfield, Franklin County, Massachusetts, 01301, United States" boundary administrative 0.56861574469538 United States FALSE
+hawc us Americas Northern America FALSE 2 2021-02-03 225795834 way "Gym / HAWC, Telluride Street, Aurora, Arapahoe County, Colorado, 80017, United States" leisure fitness_centre 0.101 United States FALSE
+heidelberg university us Americas Northern America FALSE 2 2021-02-03 164310513 way "Heidelberg University, Governor's Trail, College Hill, Tiffin, Seneca County, Ohio, 44883, United States" amenity university 0.519018527529768 United States FALSE
+heritage foundation us Americas Northern America FALSE 2 2021-02-03 104211345 way "The Heritage Foundation, 214, Massachusetts Avenue Northeast, Stanton Park, Washington, District of Columbia, 20002, United States" building yes 0.201 United States FALSE
+hertz us Americas Northern America FALSE 2 2021-02-03 103372207 way "Hertz, Westchester, Los Angeles, Los Angeles County, California, United States" landuse commercial 0.3 United States FALSE
+huffington post us Americas Northern America FALSE 2 2021-02-03 301205265 way "Beaver-Huffington Dam, Mesa County, Colorado, United States" waterway dam 0.35 United States FALSE
+hyundai motor us Americas Northern America FALSE 2 2021-02-03 133389707 way "Lithia Hyundai Of Odessa, John Ben Shepperd Parkway Boulevard, ASB Replat, Odessa, Ector County, Texas, 79762, United States" shop car 0.101 United States FALSE
+ieee-usa us Americas Northern America FALSE 2 2021-02-03 258920692 relation "IEEE, 445, Hoes Lane, Piscataway Township, Middlesex County, New Jersey, 08854, United States" building yes 0.101 United States FALSE
+ihs energy us Americas Northern America FALSE 2 2021-02-03 17408922 node "Texaco, Kapouka Place, City Center, Makakilo City, Kapolei, Honolulu County, Hawaii, 96707, United States" amenity fuel 0.001 United States FALSE
+institute for advanced study us Americas Northern America FALSE 2 2021-02-03 96388432 way "Institute for Advanced Study, Goldman Lane, Princeton, Mercer County, New Jersey, 08540, United States" amenity university 0.9343793531708 United States FALSE
+institute of virology us Americas Northern America FALSE 2 2021-02-03 171936676 way "Institute of Human Virology, 725, West Lombard Street, Ridgely's Delight, Baltimore, Maryland, 21201, United States" building university 0.301 United States FALSE
+international commission us Americas Northern America FALSE 2 2021-02-03 71043842 node "Great Commission Church International, 16152, Gale Avenue, Hacienda Heights, Industry, Los Angeles County, California, 91745, United States" amenity place_of_worship 0.201 United States FALSE
+iowa state us Americas Northern America FALSE 2 2021-02-03 91448035 way "Iowa State, Fawn Creek Court, Maquoketa, Jackson County, Iowa, 52060, United States" highway service 0.275 United States FALSE
+iowa state university in ames us Americas Northern America FALSE 2 2021-02-03 258786807 relation "Iowa State University, US 30, Ames, Story County, Iowa, 50011, United States" amenity university 0.929769585619443 United States FALSE
+iridium us Americas Northern America FALSE 2 2021-02-03 69858803 node "Iridium, 1330, North Milwaukee Avenue, Wicker Park, West Town, Chicago, Cook County, Illinois, 60622, United States" shop clothes 0.101 United States FALSE
+island conservation us Americas Northern America FALSE 2 2021-02-03 57458246 node "Brooks Island, Concord, Middlesex County, Massachusetts, 01733, United States" place island 0.425 United States FALSE
+jackson lab us Americas Northern America FALSE 2 2021-02-03 87279896 way "Jackson, Castleberry, Conecuh County, Alabama, 36432, United States" highway primary 0.3 United States FALSE
+janelia farm research campus us Americas Northern America FALSE 2 2021-02-03 258401070 relation "Janelia Research Campus, 19700, Helix Drive, Ashburn, Loudoun County, Virginia, 20147, United States" amenity research_institute 0.546981559290857 United States FALSE
+janelia research campus us Americas Northern America FALSE 2 2021-02-03 258401070 relation "Janelia Research Campus, 19700, Helix Drive, Ashburn, Loudoun County, Virginia, 20147, United States" amenity research_institute 0.546981559290857 United States FALSE
+joint genome institute us Americas Northern America FALSE 2 2021-02-03 235834399 way "Joint Genome Institute, Smoot Road, Berkeley, Alameda County, California, 94720, United States" building yes 0.610439474412231 United States FALSE
+joint global change research institute us Americas Northern America FALSE 2 2021-02-03 24146752 node "Joint Global Change Research Institute, 5825, University Research Court, University of Maryland Research Park, Riverdale Park, Prince George's County, Maryland, 20740, United States" amenity research_institute 0.635420222661424 United States FALSE
+justice us Americas Northern America FALSE 2 2021-02-03 258429262 relation "Justice, Lyons Township, Cook County, Illinois, 60458, United States" boundary administrative 0.566266067536779 United States FALSE
+keck observatory us Americas Northern America FALSE 2 2021-02-03 215780342 way "Keck Observatory, 124th Street South, Pierce County, Washington, 98447, United States" man_made observatory 0.201 United States FALSE
+keystone xl us Americas Northern America FALSE 2 2021-02-03 83355450 node "Keystone XL Whitewater Heliport, East Whitewater Road, Whitewater, Phillips County, Montana, 59544, United States" aeroway helipad 0.201 United States FALSE
+langley research center us Americas Northern America FALSE 2 2021-02-03 259101253 relation "NASA Langley Research Center, Hampton, Virginia, United States" landuse military 0.744328937907079 United States FALSE
+lawrence berkeley national laboratory in berkeley us Americas Northern America FALSE 2 2021-02-03 201093023 way "Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States" amenity research_institute 0.501 United States FALSE
+lcls us Americas Northern America FALSE 2 2021-02-03 113981149 way "LCLS X-Ray Transport Tunnel, Stanford Hills, San Mateo County, California, 94028, United States" highway service 0.175 United States FALSE
+liberal-national us Americas Northern America FALSE 2 2021-02-03 258136520 relation "Liberal, Seward County, Kansas, United States" boundary administrative 0.57453184281069 United States FALSE
+locus biosciences us Americas Northern America FALSE 2 2021-02-03 73461690 node "Locus Biosciences, 523, Davis Drive, Research Triangle Park, Morrisville, Durham County, North Carolina, 27560, United States" office company 0.201 United States FALSE
+lsu us Americas Northern America FALSE 2 2021-02-03 100338394 way "Louisiana State University, West Lakeshore Drive, College Town, Baton Rouge, East Baton Rouge Parish, Louisiana, 70802, United States" amenity university 0.550358843721885 United States FALSE
+mci us Americas Northern America FALSE 2 2021-02-03 140762532 way "Kansas City International Airport, 1, Northwest Cookingham Drive, Kansas City, Platte County, Missouri, 64153, United States" aeroway aerodrome 0.411679724670082 United States FALSE
+medicine foundation us Americas Northern America FALSE 2 2021-02-03 10663071 node "OU Physicians Reproductive Medicine, 840, Research Parkway, Presbyterian Health Foundation, Oklahoma City, Oklahoma County, Oklahoma, 73104, United States" amenity doctors 0.201 United States FALSE
+miami university in oxford us Americas Northern America FALSE 2 2021-02-03 134890642 way "Miami University, McKee Avenue, Oxford, Oxford Township, Butler County, Ohio, 45056, United States" amenity university 0.801832830623064 United States FALSE
+missouri state university us Americas Northern America FALSE 2 2021-02-03 2719859 node "Missouri State University, 901, South National Avenue, Phelps Grove/University Heights, Springfield, Greene County, Missouri, 65807, United States" amenity university 0.732450490278609 United States FALSE
+moffitt cancer center us Americas Northern America FALSE 2 2021-02-03 196997535 way "H. Lee Moffitt Cancer Center, 12902, USF Magnolia Drive, Tampa, Hillsborough County, Florida, 33612, United States" amenity hospital 0.64030088440925 United States FALSE
+monell chemical senses center us Americas Northern America FALSE 2 2021-02-03 237615520 way "Monell Chemical Senses Center, Market Street, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19104, United States" building yes 0.401 United States FALSE
+montana state university in bozeman us Americas Northern America FALSE 2 2021-02-03 165822886 way "Montana State University, West College Street, Bozeman, Gallatin County, Montana, 59715, United States" amenity university 0.929796188420265 United States FALSE
+mount st helens us Americas Northern America FALSE 2 2021-02-03 2373758 node "Mount St. Helens, Skamania County, Washington, United States" natural volcano 0.790999852984371 United States FALSE
+national centre us Americas Northern America FALSE 2 2021-02-03 418056 node "National, Monongalia County, West Virginia, United States" place hamlet 0.389139026272805 United States FALSE
+national institute for public health us Americas Northern America FALSE 2 2021-02-03 35683102 node "Washington University, Institute for Public Health, 600, South Taylor Avenue, WashU, City of Saint Louis, Missouri, 63110, United States" office university 0.401 United States FALSE
+national mining association us Americas Northern America FALSE 2 2021-02-03 3185607 node "Western Minnesota Mining Association Placer Mine, Mazourka Canyon Road, Inyo County, California, United States" landuse quarry 0.201 United States FALSE
+national optical astronomy observatory us Americas Northern America FALSE 2 2021-02-03 39657118 node "National Optical Astronomy Observatory, 950, North Cherry Avenue, Tucson, Pima County, Arizona, 85721, United States" amenity research_institute 0.401 United States FALSE
+national park service us Americas Northern America FALSE 2 2021-02-03 97935238 way "The Battle of Bunker Hill Museum, 43, Monument Square, Charlestown, Boston, Suffolk County, Massachusetts, 02129, United States" tourism museum 0.479827038246968 United States FALSE
+national solar observatory us Americas Northern America FALSE 2 2021-02-03 51609551 node "National Solar Observatory, 3665, Discovery Drive, Boulder, Boulder County, Colorado, 80303, United States" office research 0.56358119422997 United States FALSE
+natural history museum of utah us Americas Northern America FALSE 2 2021-02-03 126656490 way "Natural History Museum Of Utah, 301, Wakara Way, Research Park, Salt Lake City, Salt Lake County, Utah, 84108, United States" tourism museum 0.787418940697571 United States FALSE
+nature conservancy us Americas Northern America FALSE 2 2021-02-03 175509415 way "Nature Conservancy, Ballston, Arlington, Arlington County, Virginia, United States" leisure park 0.35 United States FALSE
+navajo nation us Americas Northern America FALSE 2 2021-02-03 259240483 relation "Navajo Nation, United States" boundary aboriginal_lands 0.692311230103081 United States FALSE
+needham & company us Americas Northern America FALSE 2 2021-02-03 97473265 way "Needham, Choctaw County, Alabama, United States" place town 0.507183702790066 United States FALSE
+neptune us Americas Northern America FALSE 2 2021-02-03 22534659 node "Neptune, Neptune Township, Monmouth County, New Jersey, 07753, United States" place town 0.4 United States FALSE
+new mexico state university us Americas Northern America FALSE 2 2021-02-03 258148480 relation "New Mexico State University, Triviz Drive, Las Cruces, Doña Ana County, New Mexico, 88003, United States" amenity university 0.861659299619142 United States FALSE
+new york university langone medical center us Americas Northern America FALSE 2 2021-02-03 125494622 way "NYU Langone Medical Center, East 30th Street, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10016, United States" amenity hospital 0.853159798268413 United States FALSE
+noaa earth system research laboratory us Americas Northern America FALSE 2 2021-02-03 153944153 way "NOAA - Earth System Research Laboratory, 325, Broadway, Boulder, Boulder County, Colorado, 80305, United States" office government 0.501 United States FALSE
+north dakota state university us Americas Northern America FALSE 2 2021-02-03 127054506 way "North Dakota State University, 13th Avenue North, Roosevelt/NDSU, Fargo, Cass County, North Dakota, 58102, United States" amenity university 0.852950729263141 United States FALSE
+north-west university us Americas Northern America FALSE 2 2021-02-03 133962677 way "Northwest University, 5520, 108th Avenue Northeast, Kirkland, King County, Washington, 98033, United States" amenity university 0.64030088440925 United States FALSE
+northern illinois university in dekalb us Americas Northern America FALSE 2 2021-02-03 192458528 way "Northern Illinois University, Stadium Drive, DeKalb, DeKalb County, Illinois, 60115, United States" amenity university 0.501 United States FALSE
+northrop grumman us Americas Northern America FALSE 2 2021-02-03 240632398 way "Northrop Grumman, Mesa, Maricopa County, Arizona, United States" landuse industrial 0.4 United States FALSE
+northwestern university feinberg school of medicine us Americas Northern America FALSE 2 2021-02-03 2270537 node "Northwestern University Feinberg School of Medicine, East Superior Street, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States" amenity school 0.945725205949526 United States FALSE
+nps us Americas Northern America FALSE 2 2021-02-03 132103655 way "Martin Luther King Jr. National Historic Site, 450, Auburn Avenue Northeast, Sweet Auburn, Atlanta, Fulton County, Georgia, 30312, United States" tourism museum 0.387764501888856 United States FALSE
+nssc us Americas Northern America FALSE 2 2021-02-03 153141063 way "NSSC, CSS-1, CSS-3, Clark Street, Waipahu, Honolulu County, Hawaii, 9818, United States" office government 0.101 United States FALSE
+nvidia us Americas Northern America FALSE 2 2021-02-03 101896241 way "Nvidia, Santa Clara, Santa Clara County, California, United States" landuse commercial 0.3 United States FALSE
+oh us Americas Northern America FALSE 2 2021-02-03 295875618 relation "Ohio, United States" boundary administrative 0.8407357649767 United States FALSE
+oneweb us Americas Northern America FALSE 2 2021-02-03 219129611 way "OneWeb Satellites Manufacturing Facility, Odyssey Way, Brevard County, Florida, United States" building industrial 0.447724269818501 United States FALSE
+pacific gas and electric company us Americas Northern America FALSE 2 2021-02-03 144924090 way "Pacific Gas and Electric Company, 6121, Bollinger Canyon Road, Bishop Ranch Business Park, San Ramon, Contra Costa County, California, 94583, United States" building yes 0.501 United States FALSE
+pamela us Americas Northern America FALSE 2 2021-02-03 86413400 way "Pamela, Taylor, Wayne County, Michigan, 48180, United States" highway residential 0.2 United States FALSE
+parker foundation us Americas Northern America FALSE 2 2021-02-03 185560955 way "Allen Park, Metropolitan, Monahans, Ward County, Texas, United States" leisure park 0.15 United States FALSE
+parker institute us Americas Northern America FALSE 2 2021-02-03 297677026 way "Quad Park, Institute, Jefferson, Kanawha County, West Virginia, United States" leisure park 0.25 United States FALSE
+peninsula medical school us Americas Northern America FALSE 2 2021-02-03 191165616 way "Peninsula Regional Medical Center, 100, East Carroll Street, Salisbury, Wicomico County, Maryland, 21801, United States" amenity hospital 0.46691348680426 United States FALSE
+penn state us Americas Northern America FALSE 2 2021-02-03 258601905 relation "Penn State University, Mount Nittany Expressway, Houserville, College Township, Centre County, Pennsylvania, 16802-2604, United States" amenity university 0.762656889872636 United States FALSE
+personal genome diagnostics us Americas Northern America FALSE 2 2021-02-03 54194328 node "Personal Genome Diagnostics (PGDx), 2809, Boston Street, Canton, Baltimore, Maryland, 21224, United States" office company 0.301 United States FALSE
+pg&e us Americas Northern America FALSE 2 2021-02-03 105553435 way "PG&E, Fresno, Fresno County, California, United States" landuse industrial 0.4 United States FALSE
+piper jaffray us Americas Northern America FALSE 2 2021-02-03 11509658 node "Piper Jaffray, 53, Vantis Drive, Vantis, Aliso Viejo, Orange County, California, 92656, United States" shop financial_services 0.201 United States FALSE
+planetary society us Americas Northern America FALSE 2 2021-02-03 188431321 way "The Planetary Society, Cordova Street, Pasadena, Los Angeles County, California, 91129, United States" building yes 0.201 United States FALSE
+pomona college us Americas Northern America FALSE 2 2021-02-03 193227969 way "Pomona College, Harrison Avenue, Claremont, Los Angeles County, California, 91711, United States" amenity university 0.649611830504229 United States FALSE
+portland state university us Americas Northern America FALSE 2 2021-02-03 258656375 relation "Portland State University, Southwest Terwilliger Boulevard, Marquam Hill, Homestead, Portland, Metro, Oregon, 97201, United States" amenity university 0.773801459429994 United States FALSE
+post us Americas Northern America FALSE 2 2021-02-03 259216694 relation "Post, Garza County, Texas, United States" boundary administrative 0.567279572790411 United States FALSE
+preparedness and response branch us Americas Northern America FALSE 2 2021-02-03 2976629 node "Office of Emergency Preparedness and Response, 3661, East Virginia Beach Boulevard, Ingleside, Norfolk, Virginia, 23502, United States" amenity public_building 0.301 United States FALSE
+purdue us Americas Northern America FALSE 2 2021-02-03 87684719 way "Purdue, Auburn Heights, Auburn Hills, Oakland County, Michigan, 48326-2766, United States" highway residential 0.2 United States FALSE
+qualcomm us Americas Northern America FALSE 2 2021-02-03 98480927 way "Qualcomm, 10555, Sorrento Valley Road, San Diego, San Diego County, California, 92140, United States" building yes 0.101 United States FALSE
+rand corporation us Americas Northern America FALSE 2 2021-02-03 259211702 relation "RAND Corporation, Main Street, Santa Monica, Los Angeles County, California, 90401-2405, United States" building office 0.201 United States FALSE
+relativistic heavy ion collider us Americas Northern America FALSE 2 2021-02-03 258938147 relation "NSLS II, Brookhaven National Laboratory, Suffolk County, New York, 11961, United States" place locality 0.225 United States FALSE
+rensselaer polytechnic institute in troy us Americas Northern America FALSE 2 2021-02-03 259514286 relation "Rensselaer Polytechnic Institute, 110, 8th Street, Downtown, City of Troy, Rensselaer County, New York, 12180, United States" amenity university 0.985127795668338 United States FALSE
+research on research institute us Americas Northern America FALSE 2 2021-02-03 175713833 way "Buck Institute for Research on Aging, 8001, Redwood Boulevard, Novato, Marin County, California, 94945, United States" place house 0.712019878936673 United States FALSE
+rockefeller foundation us Americas Northern America FALSE 2 2021-02-03 302150637 node "Rockefeller Foundation, 420, 5th Avenue, Midtown South, Manhattan Community Board 5, Manhattan, New York County, New York, 10035, United States" office foundation 0.201 United States FALSE
+rowan university us Americas Northern America FALSE 2 2021-02-03 96572300 way "Rowan University, High Street West, Glassboro, Gloucester County, New Jersey, 08028, United States" amenity university 0.601881525490356 United States FALSE
+rti international us Americas Northern America FALSE 2 2021-02-03 161347827 way "RTI International, Durham County, North Carolina, United States" landuse commercial 0.4 United States FALSE
+rutgers us Americas Northern America FALSE 2 2021-02-03 246008043 way "Rutgers, Cherry Street, Two Bridges, Manhattan Community Board 3, Manhattan, New York County, New York, 10002, United States" building yes 0.101 United States FALSE
+saint louis zoo us Americas Northern America FALSE 2 2021-02-03 96373365 way "Saint Louis Zoo, 1, Government Drive, City of Saint Louis, Missouri, 63110, United States" tourism zoo 0.623386683132434 United States FALSE
+san diego natural history museum us Americas Northern America FALSE 2 2021-02-03 108650649 way "San Diego Natural History Museum, Plaza de Balboa, San Diego, San Diego County, California, United States" tourism museum 0.83489332460211 United States FALSE
+san diego state university us Americas Northern America FALSE 2 2021-02-03 259507492 relation "San Diego State University, 1, Campanile Mall, Montezuma Mesa, Del Cerro, San Diego, San Diego County, California, 92182, United States" amenity university 0.909716528793983 United States FALSE
+san josé state university us Americas Northern America FALSE 2 2021-02-03 258921314 relation "San José State University, Woodborough Place, San Jose, Santa Clara County, California, 95116-2246, United States" amenity university 0.896654046833393 United States FALSE
+security board us Americas Northern America FALSE 2 2021-02-03 48301592 node "Social Security Administration, 123, William Street, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10038, United States" office government 0.201 United States FALSE
+sharp us Americas Northern America FALSE 2 2021-02-03 258286474 relation "Sharp County, Arkansas, United States" boundary administrative 0.596809881048835 United States FALSE
+sierra club us Americas Northern America FALSE 2 2021-02-03 129277947 way "Yosemite Conservation Heritage Center, Valley Loop Trail, Curry Village, Mariposa County, California, 95389, United States" tourism museum 0.349235472656649 United States FALSE
+sloan digital sky survey us Americas Northern America FALSE 2 2021-02-03 3752682 node "Sloan Digital Sky Survey telescope, Apache Point Road, Otero County, New Mexico, 88349, United States" man_made telescope 0.401 United States FALSE
+smith college us Americas Northern America FALSE 2 2021-02-03 213618475 way "Smith College, Main Street, Northampton, Hampshire County, Massachusetts, 01060, United States" amenity college 0.201 United States FALSE
+smithsonian national air and space museum us Americas Northern America FALSE 2 2021-02-03 106698268 way "National Air and Space Museum, 655, Jefferson Drive Southwest, Washington, District of Columbia, 20560, United States" tourism museum 0.942899315724623 United States FALSE
+southern illinois university us Americas Northern America FALSE 2 2021-02-03 196119226 way "Southern Illinois University, University Park Drive, Edwardsville, Madison County, Illinois, 62025, United States" amenity university 0.301 United States FALSE
+stanford university in california us Americas Northern America FALSE 2 2021-02-03 97833344 way "Stanford University, 408, Panama Mall, Stanford, Santa Clara County, California, 94305, United States" amenity university 0.955492545367418 United States FALSE
+stantec consulting us Americas Northern America FALSE 2 2021-02-03 302290273 node "Stantec Consulting, 584, West 5th Avenue, Naperville, DuPage County, Illinois, 60563, United States" place house 0.201 United States FALSE
+state oceanic administration us Americas Northern America FALSE 2 2021-02-03 477271 node "Oceanic, Rumson, Monmouth County, New Jersey, 07760, United States" place hamlet 0.542954744060451 United States FALSE
+stetson university us Americas Northern America FALSE 2 2021-02-03 258984879 relation "Stetson University, 421, DeLand Greenway, DeLand, Volusia County, Florida, 32723, United States" amenity university 0.601059138797379 United States FALSE
+swarthmore college us Americas Northern America FALSE 2 2021-02-03 258051478 relation "Swarthmore College, 500, College Avenue, Swarthmore, Delaware County, Pennsylvania, 19081, United States" amenity university 0.691042593901044 United States FALSE
+teva pharmaceuticals us Americas Northern America FALSE 2 2021-02-03 188636672 way "Teva Pharmaceuticals, 1090, Horsham Road, Montgomeryville, North Wales, Montgomery County, Pennsylvania, 19454, United States" building industrial 0.201 United States FALSE
+texas a&m university in corpus christi us Americas Northern America FALSE 2 2021-02-03 81754693 node "Texas A&M University, Ocean Drive, Corpus Christi, Nueces County, Texas, 78418, United States" highway bus_stop 0.601 United States FALSE
+texas commission on environmental quality us Americas Northern America FALSE 2 2021-02-03 134581871 way "Texas Commission on Environmental Quality, South Interstate 35, Parker Lane, Austin, Travis County, Texas, 78704-5639, United States" building yes 0.501 United States FALSE
+the new york times us Americas Northern America FALSE 2 2021-02-03 138755486 way "The New York Times, Woodbridge Avenue, Bonhamtown, Edison, Middlesex County, New Jersey, 08818, United States" building warehouse 0.401 United States FALSE
+the university of texas md anderson cancer center us Americas Northern America FALSE 2 2021-02-03 103450497 way "University of Texas MD Anderson Cancer Center, 1515, Holcombe Boulevard, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity hospital 1.04319043229938 United States FALSE
+the washington post us Americas Northern America FALSE 2 2021-02-03 259037983 relation "Washington, District of Columbia, United States" boundary administrative 0.849288898611582 United States FALSE
+thermo fisher scientific us Americas Northern America FALSE 2 2021-02-03 192725475 way "Thermo-Fisher Scientific, Northeast Hillsboro, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, United States" landuse industrial 0.5 United States FALSE
+time us Americas Northern America FALSE 2 2021-02-03 258313454 relation "Time, Pike County, Illinois, United States" boundary administrative 0.524684773212593 United States FALSE
+time machine us Americas Northern America FALSE 2 2021-02-03 256915027 way "Time Machine, 4600, Sea Breeze, Rochester, Monroe County, New York, 14622, United States" natural scree 0.4 United States FALSE
+transportation us Americas Northern America FALSE 2 2021-02-03 248523248 way "Transportation, Willard, Greene County, Missouri, 65781, United States" highway unclassified 0.2 United States FALSE
+trump administration us Americas Northern America FALSE 2 2021-02-03 445769 node "Trump, Baltimore County, Maryland, 21161, United States" place hamlet 0.375244632729739 United States FALSE
+turner us Americas Northern America FALSE 2 2021-02-03 258422326 relation "Turner County, South Dakota, United States" boundary administrative 0.573546604210725 United States FALSE
+un children's fund us Americas Northern America FALSE 2 2021-02-03 3035691 node "Children's Trust Fund Resource Library, 350, Washington Street, Downtown Crossing, Financial District, Boston, Suffolk County, Massachusetts, 02110-1301, United States" amenity library 0.401 United States FALSE
+unavco us Americas Northern America FALSE 2 2021-02-03 125153322 way "UNAVCO, Inc, 6350, Nautilus Drive, Boulder, Boulder County, Colorado, 80301, United States" building office 0.26265143530573 United States FALSE
+united states department of agriculture us Americas Northern America FALSE 2 2021-02-03 21512544 node "United States Department of Agriculture, Jefferson Drive Southwest, Washington, District of Columbia, 20013, United States" office government 0.501 United States FALSE
+universities us Americas Northern America FALSE 2 2021-02-03 58939938 node "Universities, Troost Avenue, Kansas City, Jackson County, Missouri, 64131, United States" highway bus_stop 0.101 United States FALSE
+university of alaska anchorage us Americas Northern America FALSE 2 2021-02-03 230804355 way "University of Alaska Anchorage, 3211, Providence Drive, Anchorage, Alaska, 99508, United States" amenity university 0.795478606702112 United States FALSE
+university of athens us Americas Northern America FALSE 2 2021-02-03 259130044 relation "University of Georgia, East Green Street, Athens-Clarke County Unified Government, Athens-Clarke County, Georgia, 30602, United States" amenity university 0.854309471737941 United States FALSE
+university of california at santa barbara us Americas Northern America FALSE 2 2021-02-03 205319990 way "University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States" place locality 0.725 United States FALSE
+university of california hastings college us Americas Northern America FALSE 2 2021-02-03 163487930 way "University of California, Hastings College of the Law, Larkin Street, Civic Center, San Francisco, San Francisco City and County, California, 94102, United States" amenity university 0.882401781952281 United States FALSE
+university of california in santa cruz us Americas Northern America FALSE 2 2021-02-03 75590962 node "University of California, Santa Cruz, Coolidge Drive, Santa Cruz, Santa Cruz County, California, 95064, United States" tourism information 0.501 United States FALSE
+university of california los angeles us Americas Northern America FALSE 2 2021-02-03 258998179 relation "University of California, Los Angeles, Westholme Avenue, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity university 0.501 United States FALSE
+university of california san francisco us Americas Northern America FALSE 2 2021-02-03 99733448 way "University of California, San Francisco, Irving Street, Inner Sunset, San Francisco, San Francisco City and County, California, 94122, United States" amenity university 0.979827038246968 United States FALSE
+university of california santa cruz us Americas Northern America FALSE 2 2021-02-03 224580983 way "University of California Santa Cruz, CA 9, Santa Cruz, Santa Cruz County, California, 95064, United States" amenity university 1.00220825756689 United States FALSE
+"university of california, merced" us Americas Northern America FALSE 2 2021-02-03 129779241 way "University of California, Merced, 5200, Mineral King Road, Merced County, California, 95343, United States" amenity university 0.813735597530124 United States FALSE
+"university of california, riverside" us Americas Northern America FALSE 2 2021-02-03 33709158 node "UCR ARTSblock, 3824, Main Street, Riverside, Riverside County, California, 92501, United States" tourism museum 0.458218474293395 United States FALSE
+university of denver us Americas Northern America FALSE 2 2021-02-03 14604373 node "University of Denver, 1901, East Buchtel Boulevard, Denver, Denver County, Colorado, 80210, United States" railway station 0.466903631515068 United States FALSE
+university of maryland at college park us Americas Northern America FALSE 2 2021-02-03 198712103 way "University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States" amenity university 1.15966453785279 United States FALSE
+"university of maryland, college park" us Americas Northern America FALSE 2 2021-02-03 198712103 way "University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States" amenity university 1.05966453785279 United States FALSE
+"university of massachusetts," us Americas Northern America FALSE 2 2021-02-03 75830459 node "Cold Spring Orchard, 391, Sabin Street, Cold Spring, Belchertown, Hampshire County, Massachusetts, 01009, United States" shop farm 0.101 United States FALSE
+university of memphis us Americas Northern America FALSE 2 2021-02-03 103281268 way "The University of Memphis, University, Normal, Memphis, Shelby County, Tennessee, 38152, United States" amenity university 0.779389836000794 United States FALSE
+university of minnesota duluth us Americas Northern America FALSE 2 2021-02-03 117000042 way "University of Minnesota Duluth, West Saint Marie Street, Duluth, Saint Louis County, Minnesota, 55803, United States" amenity university 0.808420514850446 United States FALSE
+university of mississippi medical center us Americas Northern America FALSE 2 2021-02-03 198707196 way "University of Mississippi Medical Center, 2500, North State Street, Woodland Hills, Jackson, Hinds County, Mississippi, 39216, United States" amenity hospital 0.820054390558144 United States FALSE
+university of nebraska-lincoln us Americas Northern America FALSE 2 2021-02-03 105525403 way "Sheldon Museum of Art, North 12th Street, Downtown, Haymarket, Lincoln, Lancaster County, Nebraska, 68588-0300, United States" tourism gallery 0.603230229325644 United States FALSE
+university of north texas us Americas Northern America FALSE 2 2021-02-03 259116319 relation "University of North Texas, 1155, Union Circle, Denton, Denton County, Texas, 76203, United States" amenity university 0.884465837950001 United States FALSE
+university of pittsburgh medical center us Americas Northern America FALSE 2 2021-02-03 258622513 relation "University of Pittsburgh, Strip District, Pittsburgh, Allegheny County, Pennsylvania, United States" amenity university 0.870726964523873 United States FALSE
+university of southern california in los angeles us Americas Northern America FALSE 2 2021-02-03 128225751 way "University of Southern California, West Jefferson Boulevard, University Park, Los Angeles, Los Angeles County, California, 90089, United States" amenity university 1.21587616839984 United States FALSE
+university of texas marine science institute us Americas Northern America FALSE 2 2021-02-03 202308911 way "University of Texas Marine Science Institute, 750, Channel View Drive, Port Aransas, Nueces County, Texas, 78373, United States" amenity university 0.601 United States FALSE
+university of ulster us Americas Northern America FALSE 2 2021-02-03 43591523 node "University Police, Southside Loop Road, New Paltz, Town of New Paltz, Ulster County, New York, 12561, United States" amenity police 0.301 United States FALSE
+us census bureau us Americas Northern America FALSE 2 2021-02-03 64680847 node "US Census Bureau, 32, Old Slip, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10005, United States" office government 0.567719150556049 United States FALSE
+us federal bureau of investigation us Americas Northern America FALSE 2 2021-02-03 295889146 relation "Federal Bureau of Investigation, 935, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20535, United States" amenity police 0.742718151065986 United States FALSE
+us federal trade commission us Americas Northern America FALSE 2 2021-02-03 258221902 relation "Federal Trade Commission, 600, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20565, United States" office government 0.474617736328324 United States FALSE
+us justice department us Americas Northern America FALSE 2 2021-02-03 75624556 node "US Justice Department, 9257, Lee Avenue, Manassas, Prince William County, Virginia, 20110, United States" office government 0.301 United States FALSE
+us national science board us Americas Northern America FALSE 2 2021-02-03 12578717 node "NYU School of Medicine, 562, 1st Avenue, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10017-6927, United States" amenity university 0.499286093607089 United States FALSE
+us national security agency us Americas Northern America FALSE 2 2021-02-03 135361590 way "National Security Agency, Anne Arundel County, Maryland, United States" landuse government 0.866177100706018 United States FALSE
+usfws us Americas Northern America FALSE 2 2021-02-03 126924258 way "USFWS, Gallatin County, Montana, United States" boundary protected_area 0.225 United States FALSE
+vanderbilt us Americas Northern America FALSE 2 2021-02-03 257898818 relation "Vanderbilt, Fayette County, Pennsylvania, United States" boundary administrative 0.400938798149577 United States FALSE
+vermont law school us Americas Northern America FALSE 2 2021-02-03 2406305 node "Vermont Law School, Chelsea Street, South Royalton, Royalton, Windsor County, Vermont, 05068, United States" amenity school 0.612795139465266 United States FALSE
+villanova university us Americas Northern America FALSE 2 2021-02-03 106294586 way "Villanova University, Aldwyn Lane, Villanova, Radnor, Radnor Township, Delaware County, Pennsylvania, 19085, United States" amenity university 0.700710894545203 United States FALSE
+virginia polytechnic institute and state university us Americas Northern America FALSE 2 2021-02-03 258252884 relation "Virginia Polytechnic Institute and State University, Drillfield Drive, Blacksburg, Montgomery County, Virginia, 24061, United States" amenity university 1.12437784952094 United States FALSE
+vocs us Americas Northern America FALSE 2 2021-02-03 302296009 node "Voc's Westside Pizza, 273, West Main Street, Thamesville, Norwich, New London County, Connecticut, 06360, United States" amenity restaurant 0.001 United States FALSE
+vu university medical center us Americas Northern America FALSE 2 2021-02-03 201868510 way "The Vue, Fayetteville, Washington County, Arkansas, United States" place neighbourhood 0.35 United States FALSE
+w. m. keck observatory us Americas Northern America FALSE 2 2021-02-03 102803081 way "W. M. Keck Observatory, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made observatory 0.890613845045925 United States FALSE
+wake forest school of medicine us Americas Northern America FALSE 2 2021-02-03 33980201 node "Wake Forest School of Medicine, 1, Medical Center Boulevard, Ardmore, Winston-Salem, Forsyth County, North Carolina, 27157, United States" amenity university 0.755351334110971 United States FALSE
+walgreens us Americas Northern America FALSE 2 2021-02-03 210267533 way "Walgreens, Westwood Manor, Ardencroft, New Castle County, Delaware, United States" landuse retail 0.3 United States FALSE
+walter reed army institute of research us Americas Northern America FALSE 2 2021-02-03 179850833 way "Walter Reed Army Institute of Research, Robert Grant Avenue, Linden, Lyttonsville, Silver Spring, Montgomery County, Maryland, 20895-3199, United States" office research 0.601 United States FALSE
+warner us Americas Northern America FALSE 2 2021-02-03 257311026 relation "Warner, Brown County, South Dakota, 57479, United States" boundary administrative 0.448159836291227 United States FALSE
+washington post us Americas Northern America FALSE 2 2021-02-03 259037983 relation "Washington, District of Columbia, United States" boundary administrative 0.849288898611582 United States FALSE
+wesleyan university us Americas Northern America FALSE 2 2021-02-03 259300886 relation "Wesleyan University, High Street, Middletown, Middlesex County, Connecticut, 06457, United States" amenity university 0.717126371953885 United States FALSE
+western washington university us Americas Northern America FALSE 2 2021-02-03 16114905 node "Campus Services, 2001, Bill McDonald Parkway, WWU, Bellingham, Whatcom County, Washington, 98225-8225, United States" tourism information 0.101 United States FALSE
+white house office of management and budget us Americas Northern America FALSE 2 2021-02-03 152300809 way "Office of Management and Budget, 254, Calle Cruz, La Perla, San Juan Antiguo, San Juan, Puerto Rico, 00901, United States" office government 0.501 United States FALSE
+whitman college us Americas Northern America FALSE 2 2021-02-03 2986474 node "Whitman College, Princeton, Mercer County, New Jersey, 08544, United States" place locality 0.325 United States FALSE
+williams college us Americas Northern America FALSE 2 2021-02-03 2700617 node "Williams College, Hopkins Hall Drive, Williamstown, Berkshire County, Massachusetts, 01267, United States" amenity college 0.705335713109323 United States FALSE
+wisconsin national primate research center us Americas Northern America FALSE 2 2021-02-03 131313097 way "Wisconsin National Primate Research Center, 1220, Capitol Court, South Campus, Bowens Addition, Madison, Dane County, Wisconsin, 53715, United States" building university 0.501 United States FALSE
+wri us Americas Northern America FALSE 2 2021-02-03 229580679 way "McGuire Air Force Base, Polking Road, New Hanover Township, Burlington County, New Jersey, 08641, United States" aeroway aerodrome 0.461279597273909 United States FALSE
+wyss institute us Americas Northern America FALSE 2 2021-02-03 22973651 node "Wyss Institute, 3, Blackfan Street, Boston, Suffolk County, Massachusetts, 02120, United States" office research 0.201 United States FALSE
+xcor aerospace us Americas Northern America FALSE 2 2021-02-03 296995407 way "Xcor Aerospace, Earhart Drive, Midland Spaceport Business Park, Midland, Midland County, Texas, United States" aeroway hangar 0.201 United States FALSE
+yerkes national primate research center us Americas Northern America FALSE 2 2021-02-03 3028732 node "Yerkes Primate Research Center, Gatewood Road Northeast, Druid Hills, DeKalb County, Georgia, 30329, United States" building yes 0.401 United States FALSE
+makerere university ug Africa Eastern Africa FALSE 2 2021-02-03 171750869 way "Makerere University, Makerere Hill Road, Makerere Kivulu, Nakulabye, Kampala Capital City, Kampala, Central Region, P.O BOX 9 MBARARA, Uganda" amenity university 0.655626604417121 Uganda FALSE
+risk network ug Africa Eastern Africa FALSE 2 2021-02-03 63292544 node "Children At Risk Action Network, Willis Road, Namirembe, Mengo, Kampala Capital City, Kampala, Central Region, 33903, Uganda" office association 0.201 Uganda FALSE
+ashg ua Europe Eastern Europe FALSE 2 2021-02-03 182600471 way "м.Южне, Ð<90>ШГ, Хіміків вулицÑ<8f>, Южне, ОдеÑ<81>ький район, ОдеÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 65481-65489, Україна" amenity school 0.001 Україна FALSE
+bogolyubov institute for theoretical physics ua Europe Eastern Europe FALSE 2 2021-02-03 117826903 way "ІнÑ<81>титут теоретичної фізики ім. Ðœ.Ðœ. Боголюбова Ð<9d>Ð<90>Ð<9d> України, 14б/1, Метрологічна вулицÑ<8f>, Ñ<81>елище Ð<9d>аукове, ФеофаніÑ<8f>, ГолоÑ<81>іївÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 03143, Україна" office research 0.001 Україна FALSE
+tokyo medical university ua Europe Eastern Europe FALSE 2 2021-02-03 17911626 node "Медичний універÑ<81>итет, ЛичаківÑ<81>ька вулицÑ<8f>, Личаків, ЛичаківÑ<81>ький район, Львів, ЛьвівÑ<81>ька міÑ<81>ька громада, ЛьвівÑ<81>ький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 79010, Україна" railway tram_stop 0.001 Україна FALSE
+ua ua Europe Eastern Europe FALSE 2 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна FALSE
+uea ua Europe Eastern Europe FALSE 2 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна FALSE
+national institute for medical research tz Africa Eastern Africa FALSE 2 2021-02-03 68851905 node "National Institute for Medical Research, Makuburi Rd, Makuburi, Dar es Salaam, Coastal Zone, 21493, Tanzania" office educational_institution 0.501 Tanzania FALSE
+national sun yat-sen university tw Asia Eastern Asia FALSE 2 2021-02-03 259320035 relation "國立ä¸å±±å¤§å¸, 70, 蓮海路, 桃æº<90>里, 鼓山å<8d>€, 高雄市, 804, 臺ç<81>£" amenity university 0.444647217327514 臺ç<81>£ FALSE
+adf tr Asia Western Asia FALSE 2 2021-02-03 122265582 way "Adıyaman Havalimanı, 02-26, Adıyaman merkez, Adıyaman, Güneydoğu Anadolu Bölgesi, Türkiye" aeroway aerodrome 0.274532111506442 Türkiye FALSE
+eric tr Asia Western Asia FALSE 2 2021-02-03 15819058 node "Eriç, Kemah, Erzincan, Doğu Anadolu Bölgesi, Türkiye" place village 0.289139026272805 Türkiye FALSE
+middle east technical university tr Asia Western Asia FALSE 2 2021-02-03 259201298 relation "Orta Doğu Teknik Üniversitesi, 1, 1580. Sokak, Çiğdem Mahallesi, Ankara, Çankaya, Ankara, İç Anadolu Bölgesi, 06800, Türkiye" amenity university 0.473631673098451 Türkiye FALSE
+nif tr Asia Western Asia FALSE 2 2021-02-03 302529699 node "Nif, Fethiye, Muğla, Ege Bölgesi, Türkiye" place village 0.375 Türkiye FALSE
+european bank for reconstruction and development tm Asia Central Asia FALSE 2 2021-02-03 48191450 node "European Bank for Reconstruction and Development, 82, Atatürk (1972) köçesi, Berzeňňi (Berzengi), Aşgabat, Köpetdag etraby, 744000, Türkmenistan" amenity bank 0.601 Türkmenistan FALSE
+nma th Asia South-Eastern Asia FALSE 2 2021-02-03 258233320 relation "จังหวัดนครราชสีมา, ประเทศไทย" boundary administrative 0.493204619476859 ประเทศไทย FALSE
+pri th Asia South-Eastern Asia FALSE 2 2021-02-03 258679311 relation "จังหวัดปราจีนบุรี, ประเทศไทย" boundary administrative 0.47016384498111 ประเทศไทย FALSE
+togo tg Africa Western Africa FALSE 2 2021-02-03 257546531 relation Togo boundary administrative 0.759992633432734 Togo FALSE
+swaziland sz Africa Southern Africa FALSE 2 2021-02-03 257310894 relation eSwatini boundary administrative 0.621640856732353 eSwatini FALSE
+african institute for mathematical sciences sn Africa Western Africa FALSE 2 2021-02-03 245500132 way "African Institute for Mathematical Sciences, Accès IRD, M'bour, Thiès, 23000, Sénégal" amenity university 0.501 Sénégal FALSE
+ras sk Europe Eastern Europe FALSE 2 2021-02-03 258705009 relation "HraÅ¡ovÃk, okres KoÅ¡ice - okolie, KoÅ¡ický kraj, Východné Slovensko, Slovensko" boundary administrative 0.468214832002329 Slovensko FALSE
+goce si Europe Southern Europe FALSE 2 2021-02-03 4307950 node "GoÄ<8d>e, Vipava, 5271, Slovenija" place village 0.311234742212342 Slovenija FALSE
+university of ljubljana si Europe Southern Europe FALSE 2 2021-02-03 146644115 way "Astronomsko geofizikalni observatorij Golovec, 25, Pot na Golovec, Rakovnik, Ljubljana, Upravna Enota Ljubljana, 1000, Slovenija" tourism attraction 0.387641222780259 Slovenija FALSE
+essec business school sg Asia South-Eastern Asia FALSE 2 2021-02-03 184053844 way "ESSEC Business School, Asia-Pacific, Nepal Park, Nepal Hill, Queenstown, Southwest, 138502, Singapore" building school 0.301 Singapore FALSE
+atcc se Europe Northern Europe FALSE 2 2021-02-03 91884358 way "LFV ATCC, Luftleden, Sigtuna kommun, Stockholms län, 19060, Sverige" building office 0.101 Sverige FALSE
+ecdc se Europe Northern Europe FALSE 2 2021-02-03 95487742 way "Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige" office government 0.450936419284163 Sverige FALSE
+naver se Europe Northern Europe FALSE 2 2021-02-03 80191509 node "Näver, Årjängs kommun, Värmlands län, Sverige" place isolated_dwelling 0.2 Sverige FALSE
+the sudan sd Africa Northern Africa FALSE 2 2021-02-03 258367505 relation السودان boundary administrative 0.696406722929938 السودان FALSE
+university of khartoum sd Africa Northern Africa FALSE 2 2021-02-03 164806297 way "جامعة الخرطوم, شارع النيل, قاردن سيتي, الخرطوم, ولاية الخرطوم, 11111, السودان" amenity university 0.401608614050897 السودان FALSE
+leru sb Oceania Melanesia FALSE 2 2021-02-03 103487137 way "Leru, Central, Solomon Islands" place island 0.425 Solomon Islands FALSE
+dian fossey gorilla fund international rw Africa Eastern Africa FALSE 2 2021-02-03 155569354 way "The Dian Fossey Gorilla Fund International, Ruhengeri - Gisenyi Road, Musanze, Muhoza, Musanze, Majyaruguru, Rwanda" office ngo 0.501 Rwanda FALSE
+university of rwanda rw Africa Eastern Africa FALSE 2 2021-02-03 241100019 way "Dusaidi Hostel, KN 7 Avenue, Nyamirambo, Kigali, Akarere ka Nyarugenge, Umujyi wa Kigali, 250, Rwanda" tourism hostel 0.101 Rwanda FALSE
+enso ru Europe Eastern Europe FALSE 2 2021-02-03 258512122 relation "СветогорÑ<81>к, СветогорÑ<81>кое городÑ<81>кое поÑ<81>еление, ВыборгÑ<81>кий район, ЛенинградÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Северо-Западный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place town 0.495333231609556 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+higher school of economics ru Europe Eastern Europe FALSE 2 2021-02-03 107832324 way "Ð<9d>ИУ ВШРСПб, ОП ФилологиÑ<8f>, 123, набережнаÑ<8f> канала Грибоедова, Ð<90>дмиралтейÑ<81>кий округ, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" amenity college 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+iaea ru Europe Eastern Europe FALSE 2 2021-02-03 258389991 relation "Ð<90>Ñ<8d>ропорт Игарка, улица Большого Театра, Игарка, городÑ<81>кое поÑ<81>еление Игарка, ТуруханÑ<81>кий район, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>кий край, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.435101173083885 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+isas ru Europe Eastern Europe FALSE 2 2021-02-03 258476402 relation "ИÑ<81>аÑ<81>, Голубовка, ГолубовÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, СедельниковÑ<81>кий район, ОмÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" waterway river 0.3 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lro ru Europe Eastern Europe FALSE 2 2021-02-03 5887081 node "ЛРО, переулок Шаронова, iTower, Ð<90>втовокзал, ЧкаловÑ<81>кий район, Екатеринбург, городÑ<81>кой округ Екатеринбург, СвердловÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, 620142, РоÑ<81>Ñ<81>иÑ<8f>" amenity police 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+polytechnic university ru Europe Eastern Europe FALSE 2 2021-02-03 8106175 node "ПолитехничеÑ<81>кий УниверÑ<81>итет, проÑ<81>пект Кирова, КировÑ<81>кий район, ТомÑ<81>к, городÑ<81>кой округ ТомÑ<81>к, ТомÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 634000, РоÑ<81>Ñ<81>иÑ<8f>" highway bus_stop 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+uct ru Europe Eastern Europe FALSE 2 2021-02-03 108073391 way "Ð<90>Ñ<8d>ропорт Ухта, РучейнаÑ<8f> улица, Подгорный, Ухта, городÑ<81>кой округ Ухта, РеÑ<81>публика Коми, Северо-Западный федеральный округ, 169302, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.428748587005153 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+niehs rs Europe Southern Europe FALSE 2 2021-02-03 258717718 relation "Град Ð<9d>иш, Ð<9d>ишавÑ<81>ки управни округ, Централна Србија, Србија" boundary administrative 0.581344117584867 Србија FALSE
+serbia rs Europe Southern Europe FALSE 2 2021-02-03 258556028 relation Србија boundary administrative 0.777253646015475 Србија FALSE
+babeş-bolyai university ro Europe Eastern Europe FALSE 2 2021-02-03 258406266 relation "Universitatea BabeÈ™-Bolyai, 1, Strada Mihail Kogălniceanu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400084, România" amenity university 0.593983489561696 România FALSE
+czi ro Europe Eastern Europe FALSE 2 2021-02-03 54133045 node "CZI srl, Șoseaua București-Alexandria, Drăgănești-Vlașca, Teleorman, 147135, România" shop convenience 0.101 România FALSE
+international service ro Europe Eastern Europe FALSE 2 2021-02-03 146925092 way "International Service, DN2A, Bora, Slobozia, Ialomița, 920001, România" shop car 0.201 România FALSE
+arv pt Europe Southern Europe FALSE 2 2021-02-03 259038370 relation "Arruda dos Vinhos, Lisboa, Oeste, Centro, Portugal" boundary administrative 0.413435317280238 Portugal FALSE
+hrt pt Europe Southern Europe FALSE 2 2021-02-03 259203953 relation "Horta, Faial, Açores, Portugal" boundary administrative 0.457605882150238 Portugal FALSE
+mdr pt Europe Southern Europe FALSE 2 2021-02-03 258777777 relation "Miranda do Douro, Bragança, Terras de Trás-os-Montes, Norte, Portugal" boundary administrative 0.448086827357741 Portugal FALSE
+mrt pt Europe Southern Europe FALSE 2 2021-02-03 258732826 relation "Mortágua, Viseu, Viseu Dão-Lafões, Centro, Portugal" boundary administrative 0.422968236493861 Portugal FALSE
+pbl pt Europe Southern Europe FALSE 2 2021-02-03 258744849 relation "Pombal, Leiria, Pinhal Litoral, Centro, Portugal" boundary administrative 0.439395713780888 Portugal FALSE
+ptb pt Europe Southern Europe FALSE 2 2021-02-03 258563650 relation "Ponte da Barca, Viana do Castelo, Alto Minho, Norte, Portugal" boundary administrative 0.42341787558624 Portugal FALSE
+al-quds university ps Asia Western Asia FALSE 2 2021-02-03 171696127 way "Al-Quds University, University Street, أبو ديس, שטח C, יהודה ושומרון, Palestinian Territory" amenity university 0.670940340656356 Palestinian Territory FALSE
+lg electronics pl Europe Eastern Europe FALSE 2 2021-02-03 99577118 way "LG Electronics, Mława-Wólka, Mława, powiat mławski, województwo mazowieckie, 06-500, Polska" highway residential 0.3 Polska FALSE
+ursus pl Europe Eastern Europe FALSE 2 2021-02-03 258751350 relation "Ursus, Warszawa, województwo mazowieckie, Polska" boundary administrative 0.454934934074513 Polska FALSE
+atrap pk Asia Southern Asia FALSE 2 2021-02-03 24498241 node "AtrÄ<81>p, ضلع آواران / Awaran, بلوچستان, پاکستان" place village 0.275 پاکستان FALSE
+data & society pk Asia Southern Asia FALSE 2 2021-02-03 54880380 node "Data Coach, یونیورسٹی روڈ, Gulshan-e-Iqbal Block 11, Gulshan-e-Iqbal, کراچی, سنڌ, 75300, پاکستان" highway bus_stop 0.101 پاکستان FALSE
+higher education commission pk Asia Southern Asia FALSE 2 2021-02-03 57649548 node "Higher Education Commission, Maqboolabad Road 11, Dawood Society, بÛ<81>ادر آباد, کراچی, سنڌ, 75460, پاکستان" office government 0.301 پاکستان FALSE
+lahore university of management sciences pk Asia Southern Asia FALSE 2 2021-02-03 107688614 way "Lahore University of Management Sciences, Street 18, Rehman Villas, Chung Khurad, Lahore District, پنجاب, 54792, پاکستان" amenity university 0.501 پاکستان FALSE
+pakistan meteorological department pk Asia Southern Asia FALSE 2 2021-02-03 250344164 way "Pakistan Meteorological Department, Bannu Road, Al-Waris Town, ڈیرÛ<81> اسماعیل خان, خیبر پښتونخوا, 29050, پاکستان" office government 0.301 پاکستان FALSE
+physics society of iran pk Asia Southern Asia FALSE 2 2021-02-03 55665155 node "Talha's Physics Academy, Begum Khursheed Road, Malir Town, Malir, کراچی, سنڌ, 75080, پاکستان" office educational_institution 0.101 پاکستان FALSE
+psi pk Asia Southern Asia FALSE 2 2021-02-03 48903686 node "Peshi, بلوچستان, پاکستان" railway station 0.435785692031318 پاکستان FALSE
+university of pk Asia Southern Asia FALSE 2 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان FALSE
+university of trieste pk Asia Southern Asia FALSE 2 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان FALSE
+climate science center ph Asia South-Eastern Asia FALSE 2 2021-02-03 244989659 way "Climate Change Center, Academic Avenue, Villa Isidra, Bagong Sikat, Nueva Ecija, Central Luzon, 3120, Luzon" building university 0.201 Luzon FALSE
+ecol ph Asia South-Eastern Asia FALSE 2 2021-02-03 301230341 way "Ecol, Purok 16, Commonwealth, 2nd District, Quezon City, Metro Manila, 1121, Luzon" highway residential 0.2 Luzon FALSE
+environmental change institute ph Asia South-Eastern Asia FALSE 2 2021-02-03 192350518 way "Institute of Climate Change and Environmental Management, Academic Avenue, Villa Isidra, Bagong Sikat, Nueva Ecija, Central Luzon, 3120, Luzon" building university 0.301 Luzon FALSE
+icct ph Asia South-Eastern Asia FALSE 2 2021-02-03 66980232 node "ICCT College, Manila East Road, Grand Monaco Casa Royale, Calumpang, Rizal, Calabarzon, 01940, Luzon" amenity college 0.101 Luzon FALSE
+institute of tropical medicine ph Asia South-Eastern Asia FALSE 2 2021-02-03 106986237 way "Research Institute for Tropical Medicine, Research Drive, Filinvest City, Alabang, Muntinlupa, Fourth District, Metro Manila, 1781, Luzon" amenity hospital 0.560958143076972 Luzon FALSE
+irri ph Asia South-Eastern Asia FALSE 2 2021-02-03 258457516 relation "International Rice Research Institute, Sampaguita, Masaya, Los Baños, Bay, Laguna, Calabarzon, 4031, Luzon" amenity research_institute 0.375700293936422 Luzon FALSE
+john arnold foundation ph Asia South-Eastern Asia FALSE 2 2021-02-03 80843435 node "Arnold Jansenn Catholic Mission Foundation, Inc., Luzviminda Road, Luzviminda 2, Bagong Bayan, Dasmariñas, Cavite, Calabarzon, 4115, Luzon" amenity social_facility 0.201 Luzon FALSE
+john hopkins university ph Asia South-Eastern Asia FALSE 2 2021-02-03 97992857 way "Johns Hopkins Street, Sampaloc 4, Bagong Bayan, University Hills Estate, Cavite, Calabarzon, 4115, Luzon" highway residential 0.4 Luzon FALSE
+medicare ph Asia South-Eastern Asia FALSE 2 2021-02-03 214582438 way "Medicare, SSS Employees Housing Project, North Fairview, 5th District, Quezon City, Metro Manila, 1118, Luzon" highway residential 0.2 Luzon FALSE
+new york supreme court ph Asia South-Eastern Asia FALSE 2 2021-02-03 81926168 node "New York Supreme, Plaridel Street, Nepo Center, Angeles, Pampanga, Central Luzon, 1992, Luzon" amenity restaurant 0.301 Luzon FALSE
+pinatubo ph Asia South-Eastern Asia FALSE 2 2021-02-03 300899502 way "Pinatubo, Clark Center Townhomes, Margot, Mabalacat, Pampanga, Central Luzon, 2010, Luzon" highway unclassified 0.2 Luzon FALSE
+ird pe Americas South America FALSE 2 2021-02-03 22294051 node "Institut de Recherche pour le Developpement, 455, Calle 17, Corpac, San Isidro, Lince, Lima, 27, Perú" office ngo 0.412830331815194 Perú FALSE
+ssrn pe Americas South America FALSE 2 2021-02-03 258244064 relation "Lima, Perú" boundary administrative 0.673001488378204 Perú FALSE
+tambopata national reserve pe Americas South America FALSE 2 2021-02-03 259211841 relation "Reserva Nacional Tambopata, Madre de Dios, Perú" boundary protected_area 0.407572334229807 Perú FALSE
+business pharma pa Americas Central America FALSE 2 2021-02-03 80340067 node "pharma, Calle E Norte, Barrio Manuel Quintero Villareal, David, Distrito David, ChiriquÃ, 7790414, Panamá" shop convenience 0.111 Panamá FALSE
+pdo om Asia Western Asia FALSE 2 2021-02-03 92974544 way "PDO, مسقط, عمان" landuse industrial 0.3 عمان FALSE
+nauru nr Oceania Micronesia FALSE 2 2021-02-03 257951954 relation Naoero boundary administrative 0.617910993005739 Naoero FALSE
+district court np Asia Southern Asia FALSE 2 2021-02-03 139879884 way "District Court, Dhulikhel, काà¤à¥<8d>रेपलाञà¥<8d>चोक, वागà¥<8d>मती पà¥<8d>रदेश, नेपाल" landuse commercial 0.4 नेपाल FALSE
+integrated mountain development np Asia Southern Asia FALSE 2 2021-02-03 76912703 node "Snowland Integrated Development Center, Great Himalaya Trail, Tallo Basti, Simikot, Simkot, हà¥<81>मà¥<8d>ला, मधà¥<8d>य-पशà¥<8d>चिमाञà¥<8d>चल विकास कà¥<8d>षेतà¥<8d>र, करà¥<8d>णाली पà¥<8d>रदेश, नेपाल" office ngo 0.201 नेपाल FALSE
+np np Asia Southern Asia FALSE 2 2021-02-03 298303229 relation नेपाल boundary administrative 0.709769815032436 नेपाल FALSE
+abdul latif jameel poverty action lab NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+abel committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+academia sinica institute of astronomy and astrophysics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of military medical sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+active tectonics and seafloor mapping laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced camera for surveys NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+aerosol and particle technology laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+african society of human genetics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency for healthcare research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+aids programme of research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+alexandria real estate equities NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+allen institute for cell science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance for a stronger fda NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+alpha magnetic spectrometer NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american anthropological association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american chemistry council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of medical genetics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american go association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for reproductive medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of civil engineers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of nephrology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of tropical medicine and hygiene NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+aquabounty NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+archives of internal medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+arena pharmaceuticals NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+arivale NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for women in mathematics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of australian medical research institutes NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of canadian universities for research in astronomy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of schools and programs of public health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of university technology managers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+atlantic multidecadal oscillation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+atmospheric chemistry and physics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+aurum institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian academy of technology and engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian animal health laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian human rights commission NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian labor party NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian research council centre of excellence for coral reef studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+avm biotechnology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+babylonians NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+banner alzheimer's institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+bgi research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+biodigitalvalley NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomolecular resources research infrastructure NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology and biological sciences research council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology industry research assistance council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg news NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+blue ribbon study panel on biodefense NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+bogor agricultural university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+boldlygo institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+bracewell & giuliani NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian democratic movement party NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian institute of environment and renewable natural resources NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian society of genetic medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+breakthrough listen NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+brian sciences unit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+british pharmacological society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+british science association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+burnet institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+buzzfeed news NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cabell's international NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+campaign for science & engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+canaccord genuity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian astronomy data centre NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian foundation for climate and atmospheric sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas institute of neuroscience NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+catalan institute for research and advanced studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of leuven (ku leuven NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ccamlr NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for alternatives to animal testing NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for american paleolithic research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for business law and regulation at case western reserve university school of law NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate and energy solutions NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate and life NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for clinical trials NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for computational astrophysics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"center for disease dynamics, economics and policy" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for genetics and society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for human rights in iran NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international climate and environmental research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"center for science, technology and congress" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for climate economics and policy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for genomic regulation in barcelona NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for global health research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for synthetic biology and innovation at imperial college london NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre of excellence for coral reef studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cern council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+changchun changsheng biotechnology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+charlotte lozier institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+chilean academy of science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+china initiative NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+china meteorological administration NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of zoology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese society for stem cell research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+chiron corporation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+christian democratic union NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean air scientific advisory committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cleantech group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate action tracker NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate change research centre NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate investigations center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate leadership council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr institute for sustainable plant protection NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs institute of plant molecular biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for responsible sharing NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+coastal response research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+codata NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+collaborative approach to meta analysis and review of animal data NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+competitive enterprise institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+conference of university presidents NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+congressional budget office NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortium for ocean leadership NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+consultative group on international agricultural research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+consultative group on international agriculture research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+continuous electron beam accelerator facility NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+copenhagen accord NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+copernicus atmosphere monitoring service NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+coral reef watch NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+côte d'azur observatory in nice NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for science and technology policy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of advisors on science and technology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of graduate schools NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of young scientists NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+court of appeals for the federal circuit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+crop trust NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cryogenic underground observatory for rare events NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+csiro staff association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+cuban academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+daegu gyeongbuk institute of science and technology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+dagens nyheter NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+danish cancer society research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+datamonitor NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep space industries NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep underground science and engineering laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+defence science and technology laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"department for business, energy and industrial strategy" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"department for environment, food and rural affairs" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of health research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+doaj NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+drc ministry of health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke university marine laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke university's margolis center for health policy in durham NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+dusel research association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch national institute for subatomic physics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth innovation institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+editas medicine of cambridge NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+egfr NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+el niño southern oscillation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+eligo bioscience NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+eliminate dengue NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+elon musk NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+embo press NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+emergency committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy innovation hubs NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental investigation agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental observation network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental protection network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+epsrc NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ethiopian academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+eu policy at wellcome NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+eu research division NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+europe ecology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european centre for training and research in earthquake engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european consortium for ocean research drilling NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european council of ministers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european federation of pharmaceutical industries NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european mobile laboratory project NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european molecular biology laboratory-european bioinformatics institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european molecular biology organization NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european parliament and council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european research area board NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european research infrastructure consortium NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+european universities association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+evandro chagas institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+facebook and twitter NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+falcon heavy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal science partners NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of australian scientific and technological societies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of young researchers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+feinberg school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+fogarty international center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+forensic science society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+framework programme NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+free university of berlin NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national institute of health and medical research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national research agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gairdner foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gamaleya national center of epidemiology and microbiology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gates foundation's global health program NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gavi alliance NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+general assembly of the united nations NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+general data protection regulation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic engineering appraisal committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetics society of china NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+georgia department of public health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+german centre for neurodegenerative diseases NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+german national metrology institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+german research center for environmental health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gfmc NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global climate and energy initiative NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global crop diversity trust NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global ecosystem dynamics investigation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global rust reference center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global weather corporation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+global young academy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gns science research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google books NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google deepmind NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google life sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google lunar xprize NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+google translate NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+government office for science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gran sasso national laboratories NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+great barrier reef foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+greek ephorate of underwater antiquities NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+group of eight NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gtc biotherapeutics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangzhou institutes of biomedicine and health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+guild of european research-intensive universities NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf of maine research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf of mexico research initiative NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+gustave roussy institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+hadal science and technology research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+harte research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university press NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+heartland institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+heinrich heine university of düsseldorf NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+heising-simons foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz centre for environmental research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+henri poincaré institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+herzberg institute of astrophysics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education and research bill NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education policy institute in oxford NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on appropriations NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on oversight and government reform NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"house committee on science, space and technology" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of lords science and technology committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+howard hughes medical institute's janelia farm research campus NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+hse's institute of education NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+human fertilisation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+iarpa NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibs center for axion NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+impactstory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+imperial cancer research fund NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+impulsing paradigm change NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+inaf astronomical observatory of capdiomonte NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+inamori foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+independence party NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian council of agricultural research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institute of technology madras NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+inmed pharmaceuticals NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institut de physique du globe NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for ageing and health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for cell engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for coastal research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for developmental research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for european environmental policy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for foreign policy analysis NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for genome sciences and policy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for molecular medicine finland NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for mummies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for quality and efficiency in health care NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for research in biomedicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for science and international security NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"institute for science, society" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for scientific and technological research of san NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for sustainable development and international relations NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for sustainable plant protection NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of atmospheric sciences and climate NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of drug regulatory science at shenyang pharmaceutical university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of earth physics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of electronic structure and laser NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of scientific and technical information of china NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+intelligence advanced research projects activity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international aids society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of scientific NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cell line authentication committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international census of marine microbes NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international center for lightning research and testing NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for integrated mountain development NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission for the conservation of atlantic tunas NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international committee for future accelerators NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international continental scientific drilling program NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international council for science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international emissions trading association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international fertilizer industry association NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international go federation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international human epigenome consortium NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international institute of molecular and cell biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international life sciences institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international linear collider NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international maize and wheat improvement center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international renewable energy agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international school for advanced studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international thwaites glacier collaboration NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+international trade in endangered species of wild fauna NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+iodp NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ion torrent NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+israel antiquities authority NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+james s. mcdonnell foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan society for the promotion of science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins center for tuberculosis research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins kimmel cancer center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins school of advanced international studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint analysis group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+jordan atomic energy commission NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+joseph fourier university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of biological chemistry NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of mammalogy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of neuroscience NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaiser permanente washington health research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kamioka observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli institute for astronomy and astrophysics at peking university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kite pharma NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+koch institute for integrative cancer research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea polar research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+kyoto university's research institute for mathematical sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory of dynamic meteorology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+lancet oncology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+large high altitude air shower observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"leavy, frank & delaney" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+leverhulme trust NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+liberal democrat member of parliament NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+linear accelerator laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+london natural history museum NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+lund observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+macmillan publishers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+macmillan science and education NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+maharashtra hybrid seeds company NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mahidol oxford tropical medicine research unit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mapp biopharmaceutical NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mars exploration program analysis group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mars science laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+martin luther university of halle-wittenberg NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for biogeochemistry NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for chemical physics of solids NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for molecular cell biology and genetics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for physics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of colloids and interfaces NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcdonnell boehnen hulbert & berghoff NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mdma NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+medicines for malaria venture NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mediterranean agronomic institute of bari NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mediterranean institute for biodiversity and ecology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mercator institute for china studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+meridiani planum NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mertz glacier NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+metrologists NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+minerals management service NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of earth sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of science, technology" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mit energy initiative NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+monsanto biotech NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+mount sinai health system NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+multidisciplinary drifting observatory for the study of arctic climate NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+myheritage NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nagoya protocol NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanjing agricultural university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+narayan strategy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academy of medicine and national academy of engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agency for medicines and health products safety NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association for biomedical research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national astronomical observatory of japan NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for atmospheric research's high altitude observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for immunization and respiratory diseases NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for science education NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for immunisation research and surveillance NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for indigenous genomics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for scientific research in nice NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for space studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national climatic data center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national commission for scientific and technological research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national conservatory of arts and crafts NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council for research and development NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council of science and technology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for health and welfare NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for pharmaceutical research and development NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for research on safety NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of astrophysics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of diabetes NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of environmental health sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of medical research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on alcohol abuse and alcoholism NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on deafness NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institutes of allergy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national office for technology acquisition NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research universal NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"national research, development and innovation office" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science and technology institutes NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national tertiary education union NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national union of students NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of salta NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of singapore medical school NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural resource damage assessment NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncig NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+neon therapeutics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands organisation for scientific research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+new energy finance NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york air national guard NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york genome center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york stem cell foundation research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+newclimate institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+niaaa NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nicholson price NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih office of extramural research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's division of program coordination NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's national institute of general medical sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nikon small world NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nimal welfare federation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ninth international congress of vertebrate morphology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel prize committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+noel kempff mercado natural history museum NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nordic cochrane centre NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+north carolina a&t state university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+northern sky research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+northrop grumman aerospace systems NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+novogene NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nrdio NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear science advisory committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear suppliers group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean sciences meeting NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of integrative activities NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of naval research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ohrp NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+oklahoma corporation commission NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+omics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+ontario institute for cancer research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+optics and electronics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+orbiting carbon observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+oswaldo cruz foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford nanopore NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford radiocarbon accelerator unit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific decadal oscillation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific northwest seismic network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+parker institute for cancer immunotherapy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+parker solar probe NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliamentary office of science and technology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pbl netherlands environmental assessment agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+peace research institute oslo NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pembina institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pennington biomedical research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pepfar NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+perseids NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+peta's laboratory investigations department NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew center on global climate change NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+plos biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+plos genetics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy cures research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+polish academy of sciences' mammal research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+premier biotech NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+prevention and public health fund NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+qimr berghofer medical research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+refractivity observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+regional aquatics monitoring program NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+reproductive genetics institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+research affairs at children's hospital boston NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+research assessment exercise NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+research council of norway NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+research institute for mathematical sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+revolutionary armed forces of colombia NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken center for biosystems dynamics research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken nishina center for accelerator NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+rossiyskaya gazeta NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+roswell park cancer institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society of biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society of canada NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal tyrrell museum of palaeontology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian corporation of nanotechnologies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian housing development foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian quantum center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sabin center for climate change law NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sagient research systems NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sanford underground laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sangamo therapeutics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sant'anna school of advanced studies NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+santa cruz biotech NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+savitribai phule pune university NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scienceopen NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific management review board NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific women's academic network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientometrics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+scripps research translational institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+seed media group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate committee on commerce NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+senckenberg research institute and natural history museum NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+seventh framework programme NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai astronomical observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+shenzhen center for disease control and prevention NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sichuan university's west china hospital NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sidney kimmel comprehensive cancer center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+silicon quantum computing NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sinovac NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sirtris NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sirtris pharmaceuticals NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+soccom NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+social science research network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for integrative and comparative biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for molecular biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for scientific values NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of biology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of german nature photographers NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+solyndra of fremont NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+sony world photography awards NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+south african national biodiversity institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern california earthquake center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+southwest national primate research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+space and technology committee NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+standing committee of the national people's congress NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+stawell underground physics laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+svb leerink NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+synthetic genomics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tamil nadu pollution control board NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tcga NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology and innovation council NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+terrestrial ecosystem research network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+theodosius dobzhansky center for genome bioinformatics NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+time magazine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+trace gas orbiter NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+translational health science and technology institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical atmosphere ocean NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical forest group NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tsunami research center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+turkish academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+turkish council of higher education NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+tvm capital NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk medicines and healthcare regulatory agency NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk public health rapid support team NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk research integrity office NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+un convention on biodiversity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+un convention on biological diversity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+un intergovernmental panel NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+understanding animal research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+union of concerned scientists' center for science and democracy NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united chinese americans NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations intergovernmental panel NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations international maritime organization NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' intergovernmental panel NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' international civil aviation organization NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university college london's institute of child health NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university college london's institute of neurology NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university foreign interference taskforce NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of chicago's oriental institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of colorado school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of connecticut school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of florida college of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of ioannina NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of minnesota's center for infectious disease research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pennsylvania school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of strathclyde's centre for forensic science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of texas, austin" NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of the basque country in bilbao NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of the côte d'azur in nice NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of utah research foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of utah school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us advanced laser interferometer gravitational-wave observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us army corps of engineers' cold regions research and engineering laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us army medical research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us biomedical advanced research and development authority NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us centres for disease control and prevention NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us climate action network NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us court of appeals for the federal circuit NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of agriculture's agricultural research service NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of energy's oak ridge national laboratory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of energy's office of science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us laser interferometer gravitational-wave observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academy of engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of child health and human development NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national science advisory board for biosecurity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national snow and ice data center NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vanderbilt university school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vavilov institute of plant industry NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vera c. rubin observatory NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+virginia edgcomb NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+virgo collaboration NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vision sciences society NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vitalant research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+vsnu NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+waitlist zero NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wake forest university school of medicine NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome trust and cancer research uk NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome trust and gates foundation NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome trust centre for neuroimaging at university college london NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wicell NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wicell research institute NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wildlife conservation society vietnam NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+world academy of sciences NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+world climate research programme NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+world conference on research integrity NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+world mosquito program NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuxi pharmatech NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+wyss institute for biologically inspired engineering NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+xylella fastidiosa NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+yunnan key laboratory of primate biomedical research NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+zimbabwe young academy of science NONE NA NA FALSE 2 2021-02-03 NA NA NA NA NA NA NA FALSE
+fed no Europe Northern Europe FALSE 2 2021-02-03 53796092 node "Fed, Sirdal, Agder, Norge" place farm 0.3 Norge FALSE
+iccat no Europe Northern Europe FALSE 2 2021-02-03 85440166 way "Ingøya, Ingøy, Måsøy, Troms og Finnmark, Norge" place island 0.26358119422997 Norge FALSE
+institute of marine research no Europe Northern Europe FALSE 2 2021-02-03 134912435 way "Havforskningsinstituttet, Nordnesgaten, Nordnes, Skuteviken, Bergenhus, Bergen, Vestland, 5005, Norge" building office 0.324352223496241 Norge FALSE
+erasmus mc nl Europe Western Europe FALSE 2 2021-02-03 45362830 node "Erasmus MC, 230, 's-Gravendijkwal, Dijkzigt, Centrum, Rotterdam, Zuid-Holland, Nederland, 3015CE, Nederland" place house 0.553558714867367 Nederland FALSE
+erasmus university nl Europe Western Europe FALSE 2 2021-02-03 153576820 way "Erasmus University College, 1A, Nieuwemarkt, Stadsdriehoek, Centrum, Rotterdam, Zuid-Holland, Nederland, 3011HP, Nederland" building university 0.201 Nederland FALSE
+national institute for subatomic physics nl Europe Western Europe FALSE 2 2021-02-03 105695325 way "Nationaal instituut voor subatomaire fysica, 105, Science Park, Oost, Amsterdam, Noord-Holland, Nederland, 1098XG, Nederland" office research 0.242327847659036 Nederland FALSE
+radboud university in nijmegen nl Europe Western Europe FALSE 2 2021-02-03 85314411 way "Radboud Universiteit, Erasmuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525 EX, Nederland" amenity university 0.652553099500867 Nederland FALSE
+royal netherlands meteorological institute nl Europe Western Europe FALSE 2 2021-02-03 103104578 way "297, KNMI, De Bilt, Utrecht, Nederland, 3731GA, Nederland" landuse commercial 0.2 Nederland FALSE
+royal netherlands meteorological institute in de bilt nl Europe Western Europe FALSE 2 2021-02-03 103104578 way "297, KNMI, De Bilt, Utrecht, Nederland, 3731GA, Nederland" landuse commercial 0.4 Nederland FALSE
+state administration of traditional chinese medicine nl Europe Western Europe FALSE 2 2021-02-03 46941197 node "Traditional Chinese Medicine, Bos en Lommerweg, Landlust, West, Amsterdam, Noord-Holland, Nederland, 1055DL, Nederland" amenity pharmacy 0.301 Nederland FALSE
+university medical center groningen nl Europe Western Europe FALSE 2 2021-02-03 183063420 way "Universitair Medisch Centrum Groningen, 1, Hanzeplein, UMCG, Centrum, Groningen, Nederland, 9713GZ, Nederland" amenity hospital 0.4277684953714 Nederland FALSE
+university medical center utrecht nl Europe Western Europe FALSE 2 2021-02-03 237959191 way "Universitair Medisch Centrum Utrecht, Lundlaan, Utrecht, Nederland, 3584EA, Nederland" amenity hospital 0.413179143195807 Nederland FALSE
+united nations food and agriculture organization ni Americas Central America FALSE 2 2021-02-03 147031638 way "FAO Representation, Via al Mirador, Mirador Norte, Mirador Norte Santo Domingo, Distrito I, Managua (Municipio), Departamento de Managua, 14236, Nicaragua" office yes 0.001 Nicaragua FALSE
+audi ng Africa Western Africa FALSE 2 2021-02-03 4112614 node "Audi, Arak, Sanga, Kaduna, Nigeria" place village 0.375 Nigeria FALSE
+ipsp ne Africa Western Africa FALSE 2 2021-02-03 84198776 node "IPSP KONNI, N 1, Birni N'Konni, Tahoua, Niger" amenity school 0.101 Niger FALSE
+europa NA Africa Southern Africa FALSE 2 2021-02-03 299876346 node أوروبا place continent 0.820706719188318 NA FALSE
+mcmurdo station NA Africa Southern Africa FALSE 2 2021-02-03 4327209 node McMurdo Station place town 0.673603329846918 NA FALSE
+neutrino observatory NA Africa Southern Africa FALSE 2 2021-02-03 59696254 node IceCube Neutrino Observatory office research 0.603758799530623 NA FALSE
+aap na NA NA FALSE 2 2021-02-03 166056493 way "Aap, Kunene Region, Namibia" waterway river 0.375 Namibia FALSE
+national institute of health my Asia South-Eastern Asia FALSE 2 2021-02-03 195112165 way "Institut Pengurusan Kesihatan, Jalan Abdullah, Bukit Bangsar, Brickfields, Kuala Lumpur, 59000, Malaysia" amenity research_institute 0.001 Malaysia FALSE
+national science centre my Asia South-Eastern Asia FALSE 2 2021-02-03 126784027 way "Pusat Sains Negara, Lebuhraya Sprint, Bukit Kiara, Kuala Lumpur, 6000, Malaysia" tourism museum 0.301403950541443 Malaysia FALSE
+nipah my Asia South-Eastern Asia FALSE 2 2021-02-03 181411960 way "Nipah, Sabah, Malaysia" landuse forest 0.3 Malaysia FALSE
+conacyt mx Americas Central America FALSE 2 2021-02-03 58576053 node "CONACYT, Avenida Insurgentes Sur, Crédito constructor, Benito Juárez, Ciudad de México, 03940, México" office government 0.101 México FALSE
+institute of america mx Americas Central America FALSE 2 2021-02-03 257995273 way "Great Union Institute, 74, Calle Kramer, Atlántida, Coyoacán, Ciudad de México, 04370, México" amenity school 0.101 México FALSE
+me mx Americas Central America FALSE 2 2021-02-03 257065613 relation México boundary administrative 0.839923932441765 México FALSE
+salk mx Americas Central America FALSE 2 2021-02-03 82814111 node "SALK, San Luis PotosÃ, Municipio de San Luis PotosÃ, San Luis PotosÃ, 78385, México" place neighbourhood 0.35 México FALSE
+john church mw Africa Eastern Africa FALSE 2 2021-02-03 70627801 node "John, Mulanje, Southern Region, Malawi" place village 0.375 Malawi FALSE
+maldives mv Asia Southern Asia FALSE 2 2021-02-03 258047730 relation Þ‹Þ¨ÞˆÞ¬Þ€Þ¨ÞƒÞ§Þ‡Þ°Þ–Þ¬ boundary administrative 0.650520652391712 Þ‹Þ¨ÞˆÞ¬Þ€Þ¨ÞƒÞ§Þ‡Þ°Þ–Þ¬ FALSE
+mauritania mr Africa Western Africa FALSE 2 2021-02-03 257903579 relation موريتانيا boundary administrative 0.667049491176254 موريتانيا FALSE
+center for strategic and international studies mm Asia South-Eastern Asia FALSE 2 2021-02-03 59087016 node "Center for Strategic and International Studies (CSIS Myanmar), ပြည်လမ်း, လှá€á€¯á€„်, Northern District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 1001, မြန်မာ" amenity college 0.601 မြန်မာ FALSE
+marshall islands mh Oceania Micronesia FALSE 2 2021-02-03 2735253 node "Marshall Islands, Ṃajeḷ" place archipelago 0.826224991072023 Ṃajeḷ FALSE
+amyris ma Africa Northern Africa FALSE 2 2021-02-03 44222289 node "Amyris, Rue Anissone, Riad ⵔⵉⵢⴰⴷ الرياض, Agdal Riyad أكدال الرياض, Rabat ⵔⴱⴰⵟ الرباط, Préfecture de Rabat عمالة الرباط, Rabat-Salé-Kénitra ⵔⴱⴰⵟ-âµ™âµ<8d>â´°-ⵇâµ<8f>ⵉⵟⵔⴰ الرباط-سلا-القنيطرة, 1100, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" amenity pharmacy 0.101 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+ecole polytechnique ma Africa Northern Africa FALSE 2 2021-02-03 172816013 way "Ecole Polytechnique, Boulevard de Bouskoura, Anfa Préfecture, Casablanca ⵜⵉⴳⵎⵉ ⵜⵓⵎâµ<8d>ⵉâµ<8d>ⵜ الدار البيضاء, arrondissement de Hay Hassani مقاطعة الØÙŠ الØسني, Pachalik de Casablanca, Préfecture de Casablanca عمالة الدار البيضاء, Casablanca-Settat ⵜⵉⴳⵎⵉ ⵜⵓⵎâµ<8d>ⵉâµ<8d>ⵜ-ⵙⵟⵟⴰⵜ الدار البيضاء-سطات, 20200, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" building university 0.201 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+school of oriental ma Africa Northern Africa FALSE 2 2021-02-03 78918893 node "مجموع مدارس ابن الخطيب, RN2, Hajrat el Halouf ⵃⵊⵕⵜ âµ<8d>ⵃâµ<8d>âµ<8d>ⵓⴼ Øجرة الØلوÙ<81>, Aïchoun ⵄⵉⵛⵓâµ<8f> عيشون, Aghbal أغبال, caïdat d'Aghbal قيادة أغبال, Cercle d'Ahfir دائرة Ø£ØÙ<81>ير, Province de Berkane إقليم بركان, Oriental ⵜⴰâµ<8f>ⴳⵎⵓⴹⵜ الشرقية, 63202, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" amenity school 0.101 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+ministry of economy lv Europe Northern Europe FALSE 2 2021-02-03 17156350 node "Latvijas Republikas Ekonomikas ministrija, 55, Brīvības iela, Centrs, Rīga, Vidzeme, LV-1010, Latvija" office government 0.24352463088163 Latvija FALSE
+vilnius university lt Europe Northern Europe FALSE 2 2021-02-03 259014111 relation "Vilniaus universitetas, Simono Daukanto aikÅ¡tÄ—, Senamiestis, SenamiesÄ<8d>io seniÅ«nija, Vilnius, Vilniaus miesto savivaldybÄ—, Vilniaus apskritis, Lietuva" amenity university 0.657377358917248 Lietuva FALSE
+lesotho ls Africa Southern Africa FALSE 2 2021-02-03 258275126 relation Lesotho boundary administrative 0.743099528975159 Lesotho FALSE
+national institute of infectious diseases lk Asia Southern Asia FALSE 2 2021-02-03 205249633 way "National Institute of Infectious Diseases, Andihena Road, IDH (Gothatuwa), Atalgoda, Kotikawaththa, බස්නà·<8f>හිර පළà·<8f>à¶, 10600, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity hospital 0.501 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+justice department la Asia South-Eastern Asia FALSE 2 2021-02-03 26715485 node "Justice Department, 16, ເພàº<8d>ໃຫມ່, ເມືàºàº‡àº¥àº°àº¡àº²àº¡, ເຊàº<81>àºàº‡, 151, ປະເທດລາວ" amenity public_building 0.201 ປະເທດລາວ FALSE
+iit kz Asia Central Asia FALSE 2 2021-02-03 112248819 way "Ð<90>Ñ<8f>Ñ‚Ñ<81>кое, ДениÑ<81>овÑ<81>кий район, КоÑ<81>танайÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, ҚазақÑ<81>тан" place village 0.292975169111391 ҚазақÑ<81>тан FALSE
+kuwait kw Asia Western Asia FALSE 2 2021-02-03 257947174 relation الكويت boundary administrative 0.695601802153665 الكويت FALSE
+us national institute kw Asia Western Asia FALSE 2 2021-02-03 193165956 way "The National Institute, 3, شارع 15, قطعة 10, الÙ<81>ØÙŠØيل, الأØمدي, الاØمدي, 53302, الكويت" office yes 0.201 الكويت FALSE
+busan kr Asia Eastern Asia FALSE 2 2021-02-03 258387761 relation "부산, 대한민êµ" boundary administrative 0.621986409641008 ëŒ€í•œë¯¼êµ FALSE
+dgist kr Asia Eastern Asia FALSE 2 2021-02-03 54759661 node "êµì œê´€, 현í’<8d>ë¡œ47길, ìœ ê°€ì<9d><8d>, 달성군, 대구, 43015, 대한민êµ" tourism hotel 0.001 ëŒ€í•œë¯¼êµ FALSE
+gcf kr Asia Eastern Asia FALSE 2 2021-02-03 52465250 node "Green Climate Fund, 175, 아트센터대로, 송ë<8f>„2ë<8f>™, 송ë<8f>„ë<8f>™, 연수구, ì<9d>¸ì²œ, 22004, 대한민êµ" office government 0.257277503353622 ëŒ€í•œë¯¼êµ FALSE
+green climate fund kr Asia Eastern Asia FALSE 2 2021-02-03 52465250 node "Green Climate Fund, 175, 아트센터대로, 송ë<8f>„2ë<8f>™, 송ë<8f>„ë<8f>™, 연수구, ì<9d>¸ì²œ, 22004, 대한민êµ" office government 0.557277503353622 ëŒ€í•œë¯¼êµ FALSE
+hallym university kr Asia Eastern Asia FALSE 2 2021-02-03 163203242 way "한림대학êµ<90>, 성심로, 춘천시, ê°•ì›<90>ë<8f>„, 24294, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+korea institute of geoscience kr Asia Eastern Asia FALSE 2 2021-02-03 224621385 way "Korea Institute of Geoscience and Mineral Resources, 과학로, 온천2ë<8f>™, ì‹ ì„±ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 34141, 대한민êµ" amenity research_institute 0.401 ëŒ€í•œë¯¼êµ FALSE
+snu kr Asia Eastern Asia FALSE 2 2021-02-03 259528448 relation "서울대학êµ<90> ê´€ì•…ìº í<8d>¼ìŠ¤, 1, 관악로, ê±´ì˜<81>아파트, ì²ë£¡ë<8f>™, 관악구, 서울, 08826, 대한민êµ" amenity university 0.549669564596858 ëŒ€í•œë¯¼êµ FALSE
+us-korea institute kr Asia Eastern Asia FALSE 2 2021-02-03 221159658 way "í•œêµí•´ì–‘수산연수ì›<90>, 367, í•´ì–‘ë¡œ, ë<8f>™ì‚¼2ë<8f>™, ë<8f>™ì‚¼ë<8f>™, ì˜<81>ë<8f>„구, 부산, 49111, 대한민êµ" office government 0.328369791841981 ëŒ€í•œë¯¼êµ FALSE
+yonsei university kr Asia Eastern Asia FALSE 2 2021-02-03 302696400 node "ìº í<8d>¼ìŠ¤íƒ€ìš´, 지하66, 송ë<8f>„êµì œëŒ€ë¡œ, 송ë<8f>„1ë<8f>™, 송ë<8f>„ë<8f>™, 연수구, ì<9d>¸ì²œ, 21990, 대한민êµ" railway station 0.317964956585921 ëŒ€í•œë¯¼êµ FALSE
+democratic people's republic of korea kp Asia Eastern Asia FALSE 2 2021-02-03 257555920 relation ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ boundary administrative 0.712625561293871 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ FALSE
+marine le pen kh Asia South-Eastern Asia FALSE 2 2021-02-03 16734904 node "Marine, ផ្លូវ ១០៤, សង្កាáž<8f>់វáž<8f>្áž<8f>ភ្នំ, áž<81>ណ្ឌដូនពáŸ<81>ញ, រាជធានីភ្នំពáŸ<81>ញ, 120211, ព្រះរាជាណាចក្រ​កម្ពុជា" amenity bar 0.101 ព្រះរាជាណាចក្រ​កម្ពុជា FALSE
+jomo kenyatta university of agriculture and technology ke Africa Eastern Africa FALSE 2 2021-02-03 168715829 way "Jomo Kenyatta University of Agriculture and Technology, Lavington, Nairobi, Kenya" landuse residential 0.9 Kenya FALSE
+pomc ke Africa Eastern Africa FALSE 2 2021-02-03 144576177 way "POMC Compassion International, Kajiado, Kenya" landuse commercial 0.3 Kenya FALSE
+food safety jp Asia Eastern Asia FALSE 2 2021-02-03 13545663 node "夢庵, 3, 新横浜元石å·<9d>ç·š, è<8d><8f>田西二ä¸<81>ç›®, é<9d>’葉区, 横浜市, 神奈å·<9d>県, 231-0017, 日本" amenity restaurant 0.001 日本 FALSE
+hitachi jp Asia Eastern Asia FALSE 2 2021-02-03 258516604 relation "日立市, 茨城県, 日本" boundary administrative 0.474027116064219 日本 FALSE
+iie jp Asia Eastern Asia FALSE 2 2021-02-03 258639558 relation "伊江æ<9d>‘, 国é 郡, 沖縄県, 日本" boundary administrative 0.393638696954819 日本 FALSE
+isi jp Asia Eastern Asia FALSE 2 2021-02-03 259196818 relation "伊勢国, 三é‡<8d>県, 日本" boundary historic 0.525743277351004 日本 FALSE
+kitasato university jp Asia Eastern Asia FALSE 2 2021-02-03 77251155 node "åŒ—é‡Œå¤§å¦ ç<8d>£åŒ»å¦éƒ¨, 大å¦é€šã‚Š, 稲生町, å<8d><81>和田市, é<9d>’森県, 034-0031, 日本" amenity college 0.001 日本 FALSE
+komatsu jp Asia Eastern Asia FALSE 2 2021-02-03 258757265 relation "å°<8f>æ<9d>¾å¸‚, 石å·<9d>県, 日本" boundary administrative 0.462070869758741 日本 FALSE
+kyoto university hospital jp Asia Eastern Asia FALSE 2 2021-02-03 1318672 node "京都大å¦, æ<9d>±å¤§è·¯é€š;京都市é<81>“181å<8f>·äº¬éƒ½ç’°çŠ¶ç·š, è<81>–è·é™¢å±±çŽ‹ç”º, 左京区, 京都市, 京都府, 606-8391, 日本" amenity university 0.57959701929309 日本 FALSE
+kyushu university jp Asia Eastern Asia FALSE 2 2021-02-03 147876936 way "ä¹<9d>州看è·ç¦<8f>祉大å¦ï¼ˆçœ‹è·ç¦<8f>祉å¦éƒ¨ï¼‰, 玉å<90><8d>ãƒ<90>イパス, 玉å<90><8d>市, 熊本県, 865-0005, 日本" amenity university 0.417582068811379 日本 FALSE
+liberal democratic party jp Asia Eastern Asia FALSE 2 2021-02-03 122578456 way "自由民主会館, 23, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8910, 日本" office political_party 0.001 日本 FALSE
+nagoya university jp Asia Eastern Asia FALSE 2 2021-02-03 124098830 way "å<90><8d>å<8f>¤å±‹å¤§å¦, 四谷通 (山手グリーンãƒãƒ¼ãƒ‰ï¼‰, 四谷通, å<8d>ƒç¨®åŒº, å<90><8d>å<8f>¤å±‹å¸‚, 愛知県, 464-8601, 日本" amenity university 0.519298300330669 日本 FALSE
+national institute for fusion science jp Asia Eastern Asia FALSE 2 2021-02-03 40010535 node "National Institute for Fusion Science, 肥田下石線, 土å²<90>市, å²<90>阜県, 507-0021, 日本" amenity research_centre 0.501 日本 FALSE
+oist jp Asia Eastern Asia FALSE 2 2021-02-03 169799491 way "沖縄科å¦æŠ€è¡“大å¦é™¢å¤§å¦, 国é<81>“58å<8f>·, 谷茶, æ<81>©ç´<8d>æ<9d>‘, 国é 郡, 沖縄県, 904-0495, 日本" amenity college 0.422968236493861 日本 FALSE
+okinawa institute of science and technology jp Asia Eastern Asia FALSE 2 2021-02-03 169799491 way "沖縄科å¦æŠ€è¡“大å¦é™¢å¤§å¦, 国é<81>“58å<8f>·, 谷茶, æ<81>©ç´<8d>æ<9d>‘, 国é 郡, 沖縄県, 904-0495, 日本" amenity college 0.422968236493861 日本 FALSE
+policy exchange jp Asia Eastern Asia FALSE 2 2021-02-03 75361678 node "POLICY, 柴å<8f>ˆè¡—é<81>“, 江戸å·<9d>区, æ<9d>±äº¬éƒ½, 133-0051, 日本" office company 0.101 日本 FALSE
+times jp Asia Eastern Asia FALSE 2 2021-02-03 135747411 way "タイムズ, 御æˆ<90>町, å°<8f>町1, 鎌倉市, 神奈å·<9d>県, 日本" landuse construction 0.343190432299382 日本 FALSE
+us house of representatives jp Asia Eastern Asia FALSE 2 2021-02-03 60617052 node "衆è°é™¢, 1, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0014, 日本" office government 0.570873380707553 日本 FALSE
+cagliari it Europe Southern Europe FALSE 2 2021-02-03 258069296 relation "Cagliari - Casteddu, Cagliari, Sardegna, Italia" boundary administrative 0.702776535106675 Italia FALSE
+cosce it Europe Southern Europe FALSE 2 2021-02-03 136820 node "Monte Cosce, Configni, Rieti, Lazio, Italia" natural peak 0.4 Italia FALSE
+epica it Europe Southern Europe FALSE 2 2021-02-03 188500501 way "Epica, SP146/bis, Pianomonaci, Sinagra, Messina, Sicilia, 98069, Italia" craft brewery 0.101 Italia FALSE
+foscari university of venice it Europe Southern Europe FALSE 2 2021-02-03 27324924 node "Università Ca' Foscari, Calle Giustinian, Dorsoduro, Venezia-Murano-Burano, Mestre, Venezia, Veneto, 30170, Italia" amenity university 0.548258147549701 Italia FALSE
+jrc it Europe Southern Europe FALSE 2 2021-02-03 233423450 way "Joint Research Centre, Barza, Ispra, Varese, Lombardia, Italia" landuse industrial 0.363793454953531 Italia FALSE
+nasu it Europe Southern Europe FALSE 2 2021-02-03 257688452 relation "Naso, Messina, Sicilia, 98074, Italia" boundary administrative 0.477768525385992 Italia FALSE
+national research council of italy it Europe Southern Europe FALSE 2 2021-02-03 258812264 relation "Consiglio Nazionale delle Ricerche, Via degli Irpini, San Lorenzo, Municipio Roma II, Roma, Roma Capitale, Lazio, 00185, Italia" amenity research_centre 0.001 Italia FALSE
+nus it Europe Southern Europe FALSE 2 2021-02-03 258085241 relation "Nus, Valle d'Aosta/Vallée d'Aoste, Italia" boundary administrative 0.581645085983748 Italia FALSE
+ri it Europe Southern Europe FALSE 2 2021-02-03 258315439 relation "Rieti, Lazio, Italia" boundary administrative 0.722134276481888 Italia FALSE
+sachs it Europe Southern Europe FALSE 2 2021-02-03 63324331 node "Sachs, Rio, Paularo, UTI della Carnia, Friuli Venezia Giulia, 33027, Italia" place isolated_dwelling 0.3 Italia FALSE
+sanaria it Europe Southern Europe FALSE 2 2021-02-03 72287577 node "Sanaria, Via Armando Diaz, Centro Storico, Borgo San Giuseppe, Cuneo, Piemonte, 12100, Italia" shop chemist 0.101 Italia FALSE
+sti it Europe Southern Europe FALSE 2 2021-02-03 258286912 relation "Cittiglio, Unione dei comuni del Medio Verbano, Varese, Lombardia, 21033, Italia" boundary administrative 0.491063953249507 Italia FALSE
+university of padova it Europe Southern Europe FALSE 2 2021-02-03 5420036 node "Aula studio ""Jappelli"", Via Giuseppe Jappelli, Forcellini, Padova, Veneto, 35121, Italia" amenity university 0.101 Italia FALSE
+university of perugia it Europe Southern Europe FALSE 2 2021-02-03 26169643 node "Università per Stranieri di Perugia, Piazza Braccio Fortebraccio, Elce, Ponte Rio, Perugia, Umbria, 06122, Italia" amenity university 0.508664926536407 Italia FALSE
+university of udine it Europe Southern Europe FALSE 2 2021-02-03 46572117 node "University Residences Udine, 14, Via della Vigna, Borgo Grazzano, Udine, UTI del Friuli Centrale, Friuli Venezia Giulia, 33100, Italia" building dormitory 0.201 Italia FALSE
+niid ir Asia Southern Asia FALSE 2 2021-02-03 61915448 node "ناهید, سه راه امین, بازار, لک لر, شهر تبریز, بخش مرکزی شهرستان تبریز, شهرستان تبریز, استان آذربایجان شرقی, 5133837777, ایران" highway bus_stop 0.001 ایران FALSE
+tarbiat modares university ir Asia Southern Asia FALSE 2 2021-02-03 188950452 way "tarbiat modares university, آل اØمد - شریعتی, آل اØمد, منطقه Û¶ شهر تهران, شهرداری تهران منطقه شش ساختمان انبار مرکزی, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1439634564, ایران" highway service 0.375 ایران FALSE
+aclu in Asia Southern Asia FALSE 2 2021-02-03 72757132 node "Achalu, Kanakapura taluk, Ramanagara district, Karnataka, 562126, India" place village 0.275 India FALSE
+all india institute of medical sciences in Asia Southern Asia FALSE 2 2021-02-03 75775290 node "All India Institute of Medical Sciences, Aurobindo Marg, Yusuf Sarai Market, Defence Colony Teshil, South East Delhi, Delhi, 110029, India" railway station 0.944585942469205 India FALSE
+andhra university in Asia Southern Asia FALSE 2 2021-02-03 220469423 way "Andhra University, Sivajipalem Road, Sector 4, Pedda Waltair, Visakhapatnam, Visakhapatnam (Urban), Visakhapatnam, Andhra Pradesh, 530001, India" amenity university 0.201 India FALSE
+bharatiya janata party in Asia Southern Asia FALSE 2 2021-02-03 172374753 way "Bharatiya Janata Party Office, 21st Cross Road, Ejipura, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, 560047, India" office political_party 0.301 India FALSE
+bjp in Asia Southern Asia FALSE 2 2021-02-03 5712332 node "Vijayapura, Station Road, Yogapur, Vijayapura, Vijayapura taluk, Bijapur district, Karnataka, 586101, India" railway station 0.284440950846107 India FALSE
+bpa in Asia Southern Asia FALSE 2 2021-02-03 47709681 node "Begampur, Durgapur Expressway, Chanditala - II, Hugli, West Bengal, 712310, India" railway station 0.323710213530857 India FALSE
+crp in Asia Southern Asia FALSE 2 2021-02-03 6778817 node "Chandrapura Junction, Chandrapura, Bokaro, Jharkhand, 828404, India" railway station 0.328369791841981 India FALSE
+delhi university in Asia Southern Asia FALSE 2 2021-02-03 84119222 node "Delhi University, Bawana-Narela Road, Narela Tehsil, North Delhi, Delhi, 110039, India" amenity restaurant 0.201 India FALSE
+environmental science and technology in Asia Southern Asia FALSE 2 2021-02-03 177481386 way "Department of Environmental Studies, Cochin University of Science and Technology, Pathadipalam, Kalamassery, Kanayannur, Ernakulam district, Kerala, 682022, India" building university 0.401 India FALSE
+hpp in Asia Southern Asia FALSE 2 2021-02-03 6455070 node "Harpalpur, NH76, Harpalpur, Nowgong Tahsil, Chhatarpur, Madhya Pradesh, India" railway station 0.135420222661424 India FALSE
+indian institute of technology kanpur in Asia Southern Asia FALSE 2 2021-02-03 258826308 relation "Indian Institute of Technology Kanpur, Hall 9 Hall 10 Road, Kanpur, Kanpur Nagar, Uttar Pradesh, 208016, India" amenity university 0.911291365481044 India FALSE
+iucaa in Asia Southern Asia FALSE 2 2021-02-03 156683919 way "IUCAA Quarters, Khadki, Pune City, Pune District, Maharashtra, India" landuse residential 0.3 India FALSE
+jawaharlal nehru centre for advanced scientific research in Asia Southern Asia FALSE 2 2021-02-03 95864986 way "Jawaharlal Nehru Centre for Advanced Scientific Research, Kempegowda Road, Coffee Board Layout, Byatarayanapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560064, India" amenity university 0.977334066701962 India FALSE
+mahatma gandhi institute of medical sciences in Asia Southern Asia FALSE 2 2021-02-03 153697233 way "Mahatma Gandhi Institute of Medical Sciences, SH258, Wardha, Sevagram, Wardha, Maharashtra, 442102, India" amenity hospital 0.601 India FALSE
+medical council of india in Asia Southern Asia FALSE 2 2021-02-03 176721424 way "Indian Council of Medical Research, Sadahalli, Devanahalli taluk, Bangalore Rural, Karnataka, India" landuse commercial 0.6 India FALSE
+moon express in Asia Southern Asia FALSE 2 2021-02-03 83029856 node "Gaub Tree, Eastern Express Highway, Neelam Nagar, T Ward, Zone 6, Thane, Maharashtra, 400081, India" natural tree 0.101 India FALSE
+panel in Asia Southern Asia FALSE 2 2021-02-03 83972940 node "Panel, Tutu, Nankhari, Shimla, Himachal Pradesh, 172001, India" place hamlet 0.35 India FALSE
+phr in Asia Southern Asia FALSE 2 2021-02-03 20501950 node "Phillaur Junction, NH44, Phillaur, Phillaur Tahsil, Jalandhar, Punjab, 144410, India" railway station 0.0677101113307119 India FALSE
+physical society in Asia Southern Asia FALSE 2 2021-02-03 296019075 node "Shree Prabhurajendra College of Physical Education, Cotton Sales Society Road, Gadag, Gadag taluk, Gadag district, Karnataka, 582101, India" amenity college 0.201 India FALSE
+pslv in Asia Southern Asia FALSE 2 2021-02-03 230786339 way "PSLV Rocket Model, Veli- Perumathura road, Veli, Thiruvananthapuram, Kerala, 695001, India" tourism attraction 0.101 India FALSE
+raman research institute in Asia Southern Asia FALSE 2 2021-02-03 100698195 way "Raman Research Institute, 5th Cross Road, Sadhashivanagar, Aramane Nagara Ward, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560080"", India" amenity college 0.301 India FALSE
+stem cell research in Asia Southern Asia FALSE 2 2021-02-03 83776381 node "Plexus Neuro & Stem Cell Research Centre, B Channasandra Main Road, Banaswadi, Banasavadi, East Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, 560102, India" amenity hospital 0.301 India FALSE
+teri in Asia Southern Asia FALSE 2 2021-02-03 259447258 relation "Tehri, Tehri Garhwal, India" boundary administrative 0.45 India FALSE
+yenepoya university in Asia Southern Asia FALSE 2 2021-02-03 296017516 node "Yenepoya Pre University College, Mangalore-Kasaragodu Road, Kankanady, Jeppinamogaru, Mangaluru taluk, Dakshina Kannada, Karnataka, 575009, India" amenity college 0.201 India FALSE
+bar-ilan university in ramat gan il Asia Western Asia FALSE 2 2021-02-03 103805843 way "×<90>×•× ×™×‘×¨×¡×™×˜×ª בר ×<90>ילן, השקד, רמת ×<90>ילן, גבעת שמו×<90>ל, × ×¤×ª פתח תקווה, מחוז המרכז, no, ישר×<90>ל" amenity university 0.517808168627706 ישר×<90>ל FALSE
+ben-gurion university of the negev il Asia Western Asia FALSE 2 2021-02-03 121961822 way "×<90>×•× ×™×‘×¨×¡×™×˜×ª בן גוריון ×‘× ×’×‘, פרופסור ×—×™×™×<9d> ×—× × ×™, Be'er Sheva Innovation District, ×©×›×•× ×” ד, ב×<90>ר שבע, × ×¤×ª ב×<90>ר שבע, מחוז הדרו×<9d>, no, ישר×<90>ל" amenity university 0.487026464500426 ישר×<90>ל FALSE
+israel academy of sciences and humanities il Asia Western Asia FALSE 2 2021-02-03 115598477 way "×”×<90>קדמיה הל×<90>ומית הישר×<90>לית למדעי×<9d>, ×–'×‘×•×˜×™× ×¡×§×™, טלביה, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" amenity public_building 0.450401733787336 ישר×<90>ל FALSE
+israel aerospace industries il Asia Western Asia FALSE 2 2021-02-03 17972127 node "צומת תעשייה ×<90>ווירית, 40, מועצה ×<90>זורית חבל מודיעין, × ×¤×ª רמלה, מחוז המרכז, no, ישר×<90>ל" highway bus_stop 0.001 ישר×<90>ל FALSE
+israel space agency il Asia Western Asia FALSE 2 2021-02-03 298829047 node "×¡×•×›× ×•×ª החלל הישר×<90>לית, דוד חכמי, תל ×<90>ביב - יפו, ×ž×•× ×˜×™×¤×™×•×¨×™, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל" office government 0.001 ישר×<90>ל FALSE
+knesset il Asia Western Asia FALSE 2 2021-02-03 208123192 way "משכן ×”×›× ×¡×ª, קפלן, קרית הממשלה, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" office government 0.341762590849456 ישר×<90>ל FALSE
+rambam health care campus il Asia Western Asia FALSE 2 2021-02-03 109452047 way "רמב""×<9d> - הקריה הרפו×<90>ית לברי×<90>ות ×”×<90>ד×<9d>, עפרון, בת גלי×<9d>, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity hospital 0.36529067188378 ישר×<90>ל FALSE
+technion-israel institute of technology il Asia Western Asia FALSE 2 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+tel-aviv university il Asia Western Asia FALSE 2 2021-02-03 37018800 node "תל ×<90>ביב ×<90>×•× ×™×‘×¨×¡×™×˜×”, ×<90>יילון דרו×<9d>, תל ×<90>ביב - יפו, ×<90>×•× ×™×‘×¨×¡×™×˜×ª ת""×<90>, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל" railway station 0.339805842395375 ישר×<90>ל FALSE
+university of haifa il Asia Western Asia FALSE 2 2021-02-03 103080369 way "×<90>×•× ×™×‘×¨×¡×™×˜×ª חיפה, ×<90>ב×<90> חושי, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.520356220829959 ישר×<90>ל FALSE
+broad ie Europe Northern Europe FALSE 2 2021-02-03 258639397 relation "Broad, Trim Rural, The Municipal District of Trim, County Meath, Leinster, Éire / Ireland" boundary administrative 0.35 Éire / Ireland FALSE
+bull ie Europe Northern Europe FALSE 2 2021-02-03 50108022 node "The Bull, Kenmare Municipal District, County Kerry, Munster, Éire / Ireland" natural peak 0.4 Éire / Ireland FALSE
+esri ie Europe Northern Europe FALSE 2 2021-02-03 144706611 way "The Economic and Social Research Institute, Hanover Street East, Dublin, Dublin 2, Leinster, D02 WY65, Éire / Ireland" building office 0.269299555080491 Éire / Ireland FALSE
+royal irish academy ie Europe Northern Europe FALSE 2 2021-02-03 156774738 way "Royal Irish Academy, 19, Dawson Street, Dublin, Dublin 2, Leinster, 2, Éire / Ireland" tourism attraction 0.758662567556056 Éire / Ireland FALSE
+dprk id Asia South-Eastern Asia FALSE 2 2021-02-03 198672978 way "DPRK, Jalan Panglateh, Banda Sakti, Lhokseumawe, Aceh, 24351, Indonesia" building commercial 0.101 Indonesia FALSE
+nia id Asia South-Eastern Asia FALSE 2 2021-02-03 259533884 relation "Nias, Sumatera Utara, Indonesia" place island 0.553227551541546 Indonesia FALSE
+pcb id Asia South-Eastern Asia FALSE 2 2021-02-03 181632598 way "Bandar Udara Pondok Cabe, Jalan Kayu Manis, Pondok Cabe Udik, Pamulang, Tangerang Selatan, Banten, 15418, Indonesia" aeroway aerodrome 0.412601922414653 Indonesia FALSE
+tempel id Asia South-Eastern Asia FALSE 2 2021-02-03 258758871 relation "Tempel, Sleman, Daerah Istimewa Yogyakarta, 55552, Indonesia" boundary administrative 0.5 Indonesia FALSE
+undp id Asia South-Eastern Asia FALSE 2 2021-02-03 68184861 node "UNDP, Jalan Kampung Bali 16, RW 10, Kampung Bali, Tanah Abang, Jakarta Pusat, Daerah Khusus Ibukota Jakarta, 10250, Indonesia" office ngo 0.101 Indonesia FALSE
+european institute of innovation and technology hu Europe Eastern Europe FALSE 2 2021-02-03 79975212 node "EIT, Neumann János utca, Infopark, XI. kerület, Budapest, Közép-Magyarország, 1117, Magyarország" office government 0.001 Magyarország FALSE
+stm ht Americas Caribbean FALSE 2 2021-02-03 258431782 relation "Commune de Saint Michel de l'Attalaye, Arrondissement de Marmelade, Département de l'Artibonite, Ayiti" boundary administrative 0.35 Ayiti FALSE
+nustar hr Europe Southern Europe FALSE 2 2021-02-03 3942294 node "Nuštar, Općina Nuštar, Vukovarsko-srijemska županija, 32221, Hrvatska" place village 0.379599826756761 Hrvatska FALSE
+stap hr Europe Southern Europe FALSE 2 2021-02-03 182269951 way "Stap, Općina Starigrad, Zadarska županija, Hrvatska" landuse meadow 0.3 Hrvatska FALSE
+university of zagreb hr Europe Southern Europe FALSE 2 2021-02-03 107714436 way "Klinika za psihijatriju VrapÄ<8d>e, 32, BolniÄ<8d>ka cesta, Stenjevec, Gradska Ä<8d>etvrt Podsused - VrapÄ<8d>e, Zagreb, Grad Zagreb, 10090, Hrvatska" amenity hospital 0.101 Hrvatska FALSE
+gw gw Africa Western Africa FALSE 2 2021-02-03 257557052 relation Guiné-Bissau boundary administrative 0.647675005742315 Guiné-Bissau FALSE
+interior laboratory gr Europe Southern Europe FALSE 2 2021-02-03 103979613 way "laboratory, Γιάννη ΚοÏ<81>νάÏ<81>ου, ΗÏ<81>άκλειο, Δημοτική Κοινότητα ἩÏ<81>ακλείου, Δήμος ΗÏ<81>ακλείου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΗÏ<81>ακλείου, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 714 10, Ελλάδα" building yes 0.111 Ελλάδα FALSE
+orthodox academy of crete gr Europe Southern Europe FALSE 2 2021-02-03 109202482 way "Orthodox Academy of Crete, ΚολυμβάÏ<81>ι - Δελιανά, Λιμάνι του ΚολυμβαÏ<81>ίου, Δήμος Πλατανιά, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Χανίων, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 73006, Ελλάδα" building yes 0.401 Ελλάδα FALSE
+phobos gr Europe Southern Europe FALSE 2 2021-02-03 220395190 way "Phobos, κ. Λεωνιδίου, Δημοτική Ενότητα Λεωνιδίου, Δήμος Î<9d>ότιας ΚυνουÏ<81>ίας, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΑÏ<81>καδίας, ΠεÏ<81>ιφÎÏ<81>εια Πελοποννήσου, ΑποκεντÏ<81>ωμÎνη Διοίκηση Πελοποννήσου, Δυτικής Ελλάδας και Ιονίου, 223 00, Ελλάδα" natural cliff 0.3 Ελλάδα FALSE
+central food research institute gh Africa Western Africa FALSE 2 2021-02-03 74854109 node "Food Research Institute, Josif Broz Tito Avenue, Ringway Estates, Kokomlemle, Accra Metropolitan, Greater Accra Region, 9505, Ghana" office research 0.301 Ghana FALSE
+macmillan gd Americas Caribbean FALSE 2 2021-02-03 56703064 node "MacMillan, Mallfoot, GRENADA, Grenada" natural peak 0.4 Grenada FALSE
+st george gd Americas Caribbean FALSE 2 2021-02-03 633094 node "St. George's, 1473, Grenada" place town 0.691680176132246 Grenada FALSE
+babraham institute gb Europe Northern Europe FALSE 2 2021-02-03 128767 node "Babraham Institute, Babraham Institute Cycleway, Babraham, South Cambridgeshire, Cambridgeshire, East of England, England, CB22 3AQ, United Kingdom" landuse commercial 0.201 United Kingdom FALSE
+bank of england gb Europe Northern Europe FALSE 2 2021-02-03 257920631 relation "Bank of England, 8AH, Threadneedle Street, Bishopsgate, City of London, Greater London, England, EC2R 8AH, United Kingdom" tourism attraction 0.849471203478208 United Kingdom FALSE
+biosciences gb Europe Northern Europe FALSE 2 2021-02-03 258876052 relation "Biosciences, West Gate, Bournbrook, Metchley, Birmingham, West Midlands Combined Authority, West Midlands, England, B15 2TT, United Kingdom" building university 0.101 United Kingdom FALSE
+bristol university gb Europe Northern Europe FALSE 2 2021-02-03 170738703 way "Bristol City Museum & Art Gallery, University Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS8 1RL, United Kingdom" tourism museum 0.547065093488253 United Kingdom FALSE
+british academy gb Europe Northern Europe FALSE 2 2021-02-03 58085213 node "British Academy, The Mall, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1, United Kingdom" office ngo 0.201 United Kingdom FALSE
+british antarctic survey gb Europe Northern Europe FALSE 2 2021-02-03 258339816 relation "British Antarctic Survey, High Cross, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0ET, United Kingdom" office research 0.301 United Kingdom FALSE
+british geological survey gb Europe Northern Europe FALSE 2 2021-02-03 99309132 way "British Geological Survey, Keyworth, Stanton on the Wolds, Rushcliffe, Nottinghamshire, East Midlands, England, NG12 5GG, United Kingdom" landuse commercial 0.70784642314719 United Kingdom FALSE
+brunel university london gb Europe Northern Europe FALSE 2 2021-02-03 85590905 way "Brunel University London, Kingston Lane, Hillingdon, London Borough of Hillingdon, London, Greater London, England, UB8 3PN, United Kingdom" amenity university 0.743225044527799 United Kingdom FALSE
+celgene gb Europe Northern Europe FALSE 2 2021-02-03 302516654 way "Celgene, 1, Longwalk Road, Stockley Park, West Drayton, London Borough of Hillingdon, London, Greater London, England, UB11 1AS, United Kingdom" building yes 0.101 United Kingdom FALSE
+centre for ecology & hydrology gb Europe Northern Europe FALSE 2 2021-02-03 101917409 way "Centre for Ecology and Hydrology, Benson Lane, Preston Crowmarsh, Benson, Crowmarsh Gifford, South Oxfordshire, Oxfordshire, South East, England, OX10 8BB, United Kingdom" amenity research_institute 0.654365194683011 United Kingdom FALSE
+chatham house gb Europe Northern Europe FALSE 2 2021-02-03 185683088 way "Chatham House (The Royal Institute of International Affairs), 10, St James's Square, St. James's, Mayfair, City of Westminster, London, Greater London, England, SW1Y 4LE, United Kingdom" office ngo 0.585200970199076 United Kingdom FALSE
+coalition gb Europe Northern Europe FALSE 2 2021-02-03 15861155 node "Coalition, King's Road, Queen's Park, Brighton, Brighton and Hove, South East, England, BN1 1NB, United Kingdom" amenity nightclub 0.101 United Kingdom FALSE
+conservatives gb Europe Northern Europe FALSE 2 2021-02-03 85341767 node "Conservatives, The Strand, Lower Walmer, Walmer, Deal, Dover, Kent, South East, England, CT14 7DX, United Kingdom" office political_party 0.101 United Kingdom FALSE
+covington & burling gb Europe Northern Europe FALSE 2 2021-02-03 164356944 way "Covington & Burling, 265, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 1BH, United Kingdom" office lawyer 0.201 United Kingdom FALSE
+credit suisse gb Europe Northern Europe FALSE 2 2021-02-03 137065671 way "Credit Suisse, 1, Cabot Square, Canary Wharf, Isle of Dogs, London Borough of Tower Hamlets, London, Greater London, England, E14 4QJ, United Kingdom" office financial 0.460058384040688 United Kingdom FALSE
+cruk gb Europe Northern Europe FALSE 2 2021-02-03 76715823 node "Cancer Research UK, 2, Redman Place, Stratford Marsh, London Borough of Newham, London, Greater London, England, E20 1JQ, United Kingdom" office charity 0.001 United Kingdom FALSE
+department for international trade gb Europe Northern Europe FALSE 2 2021-02-03 98032514 way "Department for International Trade, 3, Whitehall Place, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2AW, United Kingdom" office government 0.401 United Kingdom FALSE
+hefce gb Europe Northern Europe FALSE 2 2021-02-03 259588926 relation "hefce, Carroll Court, Stoke Park, Stoke Gifford, Filton, South Gloucestershire, South West England, England, BS34, United Kingdom" building yes 0.111 United Kingdom FALSE
+heriot-watt university gb Europe Northern Europe FALSE 2 2021-02-03 84948594 way "Heriot-Watt University, A71, Currie, City of Edinburgh, Scotland, EH14 4AS, United Kingdom" amenity university 0.769075118742827 United Kingdom FALSE
+jodrell bank gb Europe Northern Europe FALSE 2 2021-02-03 72862378 node "Jodrell Bank, Lower Withington, Cheshire East, North West England, England, SK11 9DW, United Kingdom" place hamlet 0.45 United Kingdom FALSE
+kavli institute gb Europe Northern Europe FALSE 2 2021-02-03 108662646 way "Kavli Institute for Cosmology, IoA Path, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0HA, United Kingdom" building university 0.201 United Kingdom FALSE
+king's college hospital gb Europe Northern Europe FALSE 2 2021-02-03 156162088 way "King's College Hospital, Denmark Hill, Camberwell, London Borough of Southwark, London, Greater London, England, SE5 9RS, United Kingdom" amenity hospital 0.765781769297865 United Kingdom FALSE
+kings college london gb Europe Northern Europe FALSE 2 2021-02-03 258760701 relation "King's College London, Strand Campus, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 2LS, United Kingdom" amenity university 0.767778517860205 United Kingdom FALSE
+leakeys gb Europe Northern Europe FALSE 2 2021-02-03 105503596 way "Leakey's, Church Street, Haugh, Inverness, Highland, Scotland, IV1 1EY, United Kingdom" shop books 0.001 United Kingdom FALSE
+liberal democrats gb Europe Northern Europe FALSE 2 2021-02-03 23277141 node "Liberal Democrats, 8–10, Great George Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3AE, United Kingdom" office political_party 0.597946206068361 United Kingdom FALSE
+lincolnshire gb Europe Northern Europe FALSE 2 2021-02-03 258300503 relation "Lincolnshire, England, United Kingdom" boundary ceremonial 0.712373747600004 United Kingdom FALSE
+lsst gb Europe Northern Europe FALSE 2 2021-02-03 110398638 way "LSST, Arncott, Cherwell, Oxfordshire, South East, England, United Kingdom" landuse military 0.3 United Kingdom FALSE
+manchester gb Europe Northern Europe FALSE 2 2021-02-03 258159411 relation "Manchester, Greater Manchester, North West England, England, United Kingdom" boundary administrative 0.781718719589409 United Kingdom FALSE
+marine biological association gb Europe Northern Europe FALSE 2 2021-02-03 118003644 way "Marine Biological Association, Madeira Road, Barbican, Plymouth, South West England, England, PL1 2JU, United Kingdom" building yes 0.301 United Kingdom FALSE
+marine stewardship council gb Europe Northern Europe FALSE 2 2021-02-03 111557662 way "Marine Stewardship Council, Snow Hill Court, Smithfield, City of London, Greater London, England, EC1A 2DQ, United Kingdom" office ngo 0.677478932777613 United Kingdom FALSE
+medicines and healthcare products regulatory agency gb Europe Northern Europe FALSE 2 2021-02-03 17808193 node "Medicines and Healthcare Products Regulatory Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.929555066820797 United Kingdom FALSE
+national farmers union gb Europe Northern Europe FALSE 2 2021-02-03 179034227 way "National Farmers' Union, Haw Street, Wotton-under-Edge, Kingswood, Stroud, Gloucestershire, South West England, England, GL12 7AQ, United Kingdom" building yes 0.301 United Kingdom FALSE
+national graphene institute gb Europe Northern Europe FALSE 2 2021-02-03 301795627 way "National Graphene Institute, Booth Street East, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M13 9EP, United Kingdom" amenity research_institute 0.652151062176819 United Kingdom FALSE
+national institute for biological standards and control gb Europe Northern Europe FALSE 2 2021-02-03 117169035 way "The National Institute for Biological Standards and Control, South Mimms, Ridge, Hertsmere, Hertfordshire, East of England, England, EN6 3QG, United Kingdom" landuse industrial 0.9 United Kingdom FALSE
+national review gb Europe Northern Europe FALSE 2 2021-02-03 107634947 way "Review, 131, Bellenden Road, Bellenden, London Borough of Southwark, London, Greater London, England, SE15 4QY, United Kingdom" shop books 0.101 United Kingdom FALSE
+nature medicine gb Europe Northern Europe FALSE 2 2021-02-03 123758464 way "Nature Chinese Medicine Centre, 7, Wellington Terrace, Notting Hill, Royal Borough of Kensington and Chelsea, London, Greater London, England, W2 4LW, United Kingdom" building yes 0.201 United Kingdom FALSE
+ncs gb Europe Northern Europe FALSE 2 2021-02-03 52089143 node "NCS, Carlton Court, Team Valley Trading Estate, Lobley Hill, Gateshead, Tyne and Wear, North East England, England, NE11 0AZ, United Kingdom" office yes 0.101 United Kingdom FALSE
+npl gb Europe Northern Europe FALSE 2 2021-02-03 253462143 way "NPL, Pavilion Road, National Physical Laboratory, Hampton Hill, London Borough of Richmond upon Thames, London, Greater London, England, TW11 0NL, United Kingdom" leisure pitch 0.101 United Kingdom FALSE
+oxford brookes university gb Europe Northern Europe FALSE 2 2021-02-03 87046127 way "Oxford Brookes University Gipsy Lane Site, Headington Road, Highfield, Headington, Oxford, Oxfordshire, South East, England, OX3 0BL, United Kingdom" amenity university 0.754593314283165 United Kingdom FALSE
+oxitec gb Europe Northern Europe FALSE 2 2021-02-03 59520743 node "Oxitec, 65 - 71, Jubilee Avenue, Milton Park, Milton, Vale of White Horse, Oxfordshire, South East, England, OX14 4RW, United Kingdom" office company 0.101 United Kingdom FALSE
+panasonic gb Europe Northern Europe FALSE 2 2021-02-03 95424837 way "Panasonic, Wokingham, South East, England, RG40 2AT, United Kingdom" landuse commercial 0.3 United Kingdom FALSE
+plymouth gb Europe Northern Europe FALSE 2 2021-02-03 257865169 relation "Plymouth, South West England, England, United Kingdom" boundary administrative 0.697098637251215 United Kingdom FALSE
+polar research institute gb Europe Northern Europe FALSE 2 2021-02-03 86946864 way "Scott Polar Research Institute (SPRI), Lensfield Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 1ER, United Kingdom" building university 0.709070137722353 United Kingdom FALSE
+regenerative medicine institute gb Europe Northern Europe FALSE 2 2021-02-03 302291462 way "Institute of Developmental and Regenerative Medicine (IDRM), Roosevelt Drive, Highfield, Lye Valley, Oxford, Oxfordshire, South East, England, OX3 7NB, United Kingdom" building construction 0.301 United Kingdom FALSE
+research environment gb Europe Northern Europe FALSE 2 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.472343749103071 United Kingdom FALSE
+research uk gb Europe Northern Europe FALSE 2 2021-02-03 175592054 way "Institute of Cancer Research, 237, Fulham Road, The Boltons, Brompton, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW3 6HS, United Kingdom" building hospital 0.510743518323823 United Kingdom FALSE
+rolls-royce gb Europe Northern Europe FALSE 2 2021-02-03 105617306 way "Rolls-Royce, Raynesway, Alvaston, Derby, East Midlands, England, DE21 7BF, United Kingdom" man_made works 0.424193162948078 United Kingdom FALSE
+sheffield hallam university gb Europe Northern Europe FALSE 2 2021-02-03 209297729 way "Sheffield Hallam University, Pond Street, City Centre, Sheffield, Yorkshire and the Humber, England, S1 1AA, United Kingdom" amenity university 0.301 United Kingdom FALSE
+uk department for international development gb Europe Northern Europe FALSE 2 2021-02-03 98247145 way "Department for International Development, 22-24, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2WH, United Kingdom" office government 0.401 United Kingdom FALSE
+uk intellectual property office gb Europe Northern Europe FALSE 2 2021-02-03 258434943 relation "Intellectual Property Office, Cardiff Road, Maesglas, Gaer, Newport, Cymru / Wales, NP10 8QQ, United Kingdom" office government 0.301 United Kingdom FALSE
+uk ministry of defence gb Europe Northern Europe FALSE 2 2021-02-03 98588582 way "Ministry of Defence, Horse Guards Avenue, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2HB, United Kingdom" military office 0.831875732226719 United Kingdom FALSE
+uk research councils gb Europe Northern Europe FALSE 2 2021-02-03 258509732 relation "UK Research Councils, North Star Avenue, Gorse Hill, Central Swindon North, Swindon, South West England, England, SN2 1ET, United Kingdom" building office 0.301 United Kingdom FALSE
+universities scotland gb Europe Northern Europe FALSE 2 2021-02-03 187787432 way "Universities of Glasgow and Strathclyde Air Squadron, 12, Park Circus Lane, Park District, Glasgow, Glasgow City, Scotland, G3 6AX, United Kingdom" building yes 0.201 United Kingdom FALSE
+university college hospital gb Europe Northern Europe FALSE 2 2021-02-03 189976437 way "University College Hospital, 235, Euston Road, Somers Town, London Borough of Camden, London, Greater London, England, NW1 2BU, United Kingdom" amenity hospital 0.691955796512831 United Kingdom FALSE
+university of brighton gb Europe Northern Europe FALSE 2 2021-02-03 189946524 way "St Peter's House Library, 16-18, Richmond Place, Round Hill, Brighton, Brighton and Hove, South East, England, BN2 9NA, United Kingdom" building university 0.101 United Kingdom FALSE
+university of durham gb Europe Northern Europe FALSE 2 2021-02-03 53254670 node "University, New Durham Road, Ashbrooke, Sunderland, North East England, England, SR2 7PD, United Kingdom" railway station 0.433228686818865 United Kingdom FALSE
+university of essex gb Europe Northern Europe FALSE 2 2021-02-03 62209739 node "University of Essex, Wivenhoe, Colchester, Essex, East of England, England, CO4 3WA, United Kingdom" place suburb 0.575 United Kingdom FALSE
+university of hertfordshire gb Europe Northern Europe FALSE 2 2021-02-03 199549944 way "University of Hertfordshire, de Havilland Campus, St. Albans Road West, Nast Hyde, Hatfield, Welwyn Hatfield, Hertfordshire, East of England, England, AL10 9SQ, United Kingdom" amenity university 0.301 United Kingdom FALSE
+university of wolverhampton gb Europe Northern Europe FALSE 2 2021-02-03 110328726 way "University of Wolverhampton, Stafford Street, Heath Town, Wolverhampton, West Midlands Combined Authority, West Midlands, England, WV1 1LY, United Kingdom" building university 0.301 United Kingdom FALSE
+wellcome open research gb Europe Northern Europe FALSE 2 2021-02-03 131091915 way "The Wellcome Trust Clinical Research Facility, Grafton Street, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M13 9WU, United Kingdom" building yes 0.201 United Kingdom FALSE
+women's hospital gb Europe Northern Europe FALSE 2 2021-02-03 4341641 node "THE WOMEN'S HOSPITAL, Crown Street, Edge Hill, Liverpool, North West England, England, L7, United Kingdom" highway bus_stop 0.301 United Kingdom FALSE
+ansm fr Europe Western Europe FALSE 2 2021-02-03 242417770 way "Agence nationale de sécurité du médicament et des produits de santé, Boulevard Anatole France, Saint-Denis, Seine-Saint-Denis, Île-de-France, France métropolitaine, 93200, France" office government 0.001 France FALSE
+asco fr Europe Western Europe FALSE 2 2021-02-03 258756793 relation "Asco, Corte, Haute-Corse, Corse, France métropolitaine, 20276, France" boundary administrative 0.601020559978481 France FALSE
+barda fr Europe Western Europe FALSE 2 2021-02-03 257924811 relation "Labarde, Lesparre-Médoc, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33460, France" boundary administrative 0.535852707779254 France FALSE
+charles river laboratories fr Europe Western Europe FALSE 2 2021-02-03 296730571 way "Charles River Laboratories, Rue de Pacy, Miserey, Évreux, Eure, Normandie, France métropolitaine, 27930, France" man_made works 0.301 France FALSE
+clia fr Europe Western Europe FALSE 2 2021-02-03 148195673 way "Rue des Clia-Cliats, La Vieille-Loye, Dole, Jura, Bourgogne-Franche-Comté, France métropolitaine, 39380, France" highway unclassified 0.2 France FALSE
+council of europe fr Europe Western Europe FALSE 2 2021-02-03 68954423 node "Conseil de l'Europe, Avenue de l'Europe, Quartier des XV, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67075, France" office government 0.707253284652268 France FALSE
+cox fr Europe Western Europe FALSE 2 2021-02-03 258439836 relation "Cox, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31480, France" boundary administrative 0.646520829297697 France FALSE
+eic fr Europe Western Europe FALSE 2 2021-02-03 116223112 way "École d'Ingénieurs de Cherbourg (ESIX Normandie), Chemin des Roquettes, Octeville, Cherbourg-Octeville, Cherbourg-en-Cotentin, Cherbourg, Manche, Normandie, France métropolitaine, 50100, France" building university 0.225794094499978 France FALSE
+farc fr Europe Western Europe FALSE 2 2021-02-03 18479658 node "Le Farc, Dommartin, Villefranche-sur-Saône, Rhône, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69380, France" place locality 0.225 France FALSE
+front national fr Europe Western Europe FALSE 2 2021-02-03 48309027 node "Front National, 2, Rue Alexis Mossa, Le Piol, Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, 06000, France" office political_party 0.201 France FALSE
+gsi fr Europe Western Europe FALSE 2 2021-02-03 209973060 way "Aéroport de Grand-Santi, Avenue Dada René, Grand-Santi, Le Bourg, Grand-Santi, Saint-Laurent-du-Maroni, Guyane, 97340, France" aeroway aerodrome 0.245850657848318 France FALSE
+helicos fr Europe Western Europe FALSE 2 2021-02-03 187487532 way "Club de Modélisme Les Hélicos de Benost, Beynost, Bourg-en-Bresse, Ain, Auvergne-Rhône-Alpes, France métropolitaine, 01700, France" highway path 0.075 France FALSE
+horizon europe fr Europe Western Europe FALSE 2 2021-02-03 236372777 way "Horizon Nature, Jeanne d'Arc, Europe, Reims, Marne, Grand Est, France métropolitaine, 51100, France" place city_block 0.325 France FALSE
+iap fr Europe Western Europe FALSE 2 2021-02-03 109006815 way "Institut d'Astrophysique de Paris, 98bis, Boulevard Arago, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" amenity research_institute 0.346621693019181 France FALSE
+ifremer fr Europe Western Europe FALSE 2 2021-02-03 258272648 relation "Ifremer, Avenue Jean Monnet, Sète, Montpellier, Hérault, Occitanie, France métropolitaine, 34200, France" building yes 0.490553774215852 France FALSE
+information justice fr Europe Western Europe FALSE 2 2021-02-03 65896782 node "Maison du tourisme, 17, Rue de la Justice, Onzain, Veuzain-sur-Loire, Blois, Loir-et-Cher, Centre-Val de Loire, France métropolitaine, 41150, France" tourism information 0.101 France FALSE
+ion fr Europe Western Europe FALSE 2 2021-02-03 257669218 relation "Yonne, Bourgogne-Franche-Comté, France métropolitaine, France" boundary administrative 0.616370240837996 France FALSE
+jax fr Europe Western Europe FALSE 2 2021-02-03 258821254 relation "Jax, Brioude, Haute-Loire, Auvergne-Rhône-Alpes, France métropolitaine, 43230, France" boundary administrative 0.600013023210469 France FALSE
+le figaro fr Europe Western Europe FALSE 2 2021-02-03 107312918 way "Le Figaro, Rue Laffitte, Quartier de la Chaussée-d'Antin, Paris 9e Arrondissement, Paris, Île-de-France, France métropolitaine, 75009, France" office newspaper 0.817211661327878 France FALSE
+le grand k fr Europe Western Europe FALSE 2 2021-02-03 214537761 way "Le grand K, Rue des Carrières, Kingersheim, Mulhouse, Haut-Rhin, Grand Est, France métropolitaine, 68260, France" leisure playground 0.301 France FALSE
+lgbt fr Europe Western Europe FALSE 2 2021-02-03 56766164 node "LGBT, Rue Bourgneuf, Petit Bayonne, Bayonne, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64100, France" tourism artwork 0.101 France FALSE
+nice fr Europe Western Europe FALSE 2 2021-02-03 298761441 relation "Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, France" boundary administrative 0.762676330560633 France FALSE
+ooi fr Europe Western Europe FALSE 2 2021-02-03 258357071 relation "Oye-Plage, Calais, Pas-de-Calais, Hauts-de-France, France métropolitaine, 62215, France" boundary administrative 0.570855829119973 France FALSE
+paris-saclay fr Europe Western Europe FALSE 2 2021-02-03 115502194 way "HEC Paris, Rue Curie, Val d'Albian, Saclay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91400, France" amenity college 0.681992451472996 France FALSE
+university of grenoble alpes fr Europe Western Europe FALSE 2 2021-02-03 22506396 node "Gières Gare Univ, Gières - Gare - Universités, Chamandier, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38610, France" amenity bicycle_rental 0.201 France FALSE
+university of poitiers fr Europe Western Europe FALSE 2 2021-02-03 14312417 node "École Des Beaux-Arts, Rue Jean Alexandre, Hôtel de Ville, Poitiers, Vienne, Nouvelle-Aquitaine, France métropolitaine, 86000, France" amenity university 0.101 France FALSE
+university paris-sud fr Europe Western Europe FALSE 2 2021-02-03 125512473 way "Université Paris 1 Panthéon-Sorbonne Centre Pierre Mendès-France, 90, Rue de Tolbiac, Cité Florale, Quartier de la Maison-Blanche, Paris 13e Arrondissement, Paris, Île-de-France, France métropolitaine, 75013, France" amenity university 0.320860870373788 France FALSE
+usap fr Europe Western Europe FALSE 2 2021-02-03 58901930 node "Boutique USAP, Quai Sébastien Vauban, Saint-Jean, Perpignan, Pyrénées-Orientales, Occitanie, France métropolitaine, 66000, France" shop gift 0.101 France FALSE
+world organisation for animal health fr Europe Western Europe FALSE 2 2021-02-03 59448672 node "Organisation Mondiale de la Santé Animale, 12, Rue de Prony, Quartier de la Plaine-de-Monceau, Paris 17e Arrondissement, Paris, Île-de-France, France métropolitaine, 75017, France" office government 0.201 France FALSE
+yök fr Europe Western Europe FALSE 2 2021-02-03 68978666 node "Yok, Boulevard Jean Jaurès, Les Princes-Marmottan, Boulogne-Billancourt, Hauts-de-Seine, ÃŽle-de-France, France métropolitaine, 92100, France" shop variety_store 0.001 France FALSE
+fiji fj Oceania Melanesia FALSE 2 2021-02-03 258486203 relation Viti boundary administrative 0.681878300158849 Viti FALSE
+ngi fj Oceania Melanesia FALSE 2 2021-02-03 150974640 way "Ngau Airport, Lovo, Eastern, Viti" aeroway aerodrome 0.233228686818865 Viti FALSE
+academy of finland fi Europe Northern Europe FALSE 2 2021-02-03 103783048 way "Sibelius-Akatemia, 9, Pohjoinen Rautatiekatu, Etu-Töölö, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00100, Suomi / Finland" amenity university 0.556866432376015 Suomi / Finland FALSE
+nokia fi Europe Northern Europe FALSE 2 2021-02-03 258022880 relation "Nokia, Tampereen seutukunta, Pirkanmaa, Länsi- ja Sisä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" boundary administrative 0.568523457581497 Suomi / Finland FALSE
+ministry of water resources et Africa Eastern Africa FALSE 2 2021-02-03 137652527 way "Ministry of Water Resources, Mike Leyland Street, ኡራኤáˆ<8d> Urael, Addis Ababa / አዲስ አበባ, Bole, አዲስ አበባ / Addis Ababa, 17293, ኢትዮጵያ" office government 0.401 ኢትዮጵያ FALSE
+canfranc underground laboratory es Europe Southern Europe FALSE 2 2021-02-03 233408959 way "Laboratorio Subterráneo de Canfranc, Camino de Secras, Canfranc-Estación, Canfranc, La Jacetania, Huesca, Aragón, 22880, España" amenity research_institute 0.346981559290857 España FALSE
+casp es Europe Southern Europe FALSE 2 2021-02-03 258252256 relation "Caspe, Bajo Aragón-Caspe / Baix Aragó-Casp, Zaragoza, Aragón, 50700, España" boundary administrative 0.610219396647417 España FALSE
+cellex es Europe Southern Europe FALSE 2 2021-02-03 217797958 way "Centre Cellex (Institut d'Oncologia), 115-117, Carrer de Natzaret, Montbau, Horta-Guinardó, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España" office research 0.101 España FALSE
+court es Europe Southern Europe FALSE 2 2021-02-03 258422517 relation "Catalunya, España" boundary administrative 0.720173737746207 España FALSE
+el niños es Europe Southern Europe FALSE 2 2021-02-03 56090016 node "Ninos, Carrer de Garcilaso, els Indians, el Congrés i els Indians, Sant Andreu, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España" amenity kindergarten 0.101 España FALSE
+fusion for energy es Europe Southern Europe FALSE 2 2021-02-03 81668426 node "F4E, 2, Carrer de Josep Pla, Diagonal Mar i el Front MarÃtim del Poblenou, Sant MartÃ, Barcelona, Barcelonès, Barcelona, Catalunya, 08019, España" office government 0.001 España FALSE
+intellectual property es Europe Southern Europe FALSE 2 2021-02-03 259401275 relation "EUIPO, 4, Avenida de Europa, Alacant / Alicante, l'AlacantÃ, Alacant / Alicante, Comunitat Valenciana, 03008, España" office government 0.383512305679517 España FALSE
+pompeu fabra university in barcelona es Europe Southern Europe FALSE 2 2021-02-03 258659729 relation "Campus UManresa, Avinguda de les Bases de Manresa, Manresa (Trama Urbana Consolidada), Mion - Puigberenguer - Miralpeix, Manresa, Bages, Barcelona, Catalunya, 08240, España" amenity university 0.201 España FALSE
+university of alicante es Europe Southern Europe FALSE 2 2021-02-03 108586240 way "Golf Practice Ground Miguel Hernández University of Elche, Acceso Aparcamiento, les Cases de Ferrà ndez, Elx / Elche, el Baix Vinalopó, Alacant / Alicante, Comunitat Valenciana, 03207, España" leisure pitch 0.301 España FALSE
+university of valladolid es Europe Southern Europe FALSE 2 2021-02-03 97754226 way "Facultad de Medicina, Avenida de Ramón y Cajal, Hospital, Valladolid, Castilla y León, 47005, España" amenity university 0.278140546517606 España FALSE
+aalborg university dk Europe Northern Europe FALSE 2 2021-02-03 103460471 way "Aalborg Universitet, Fredrik Bajers Vej, Sønder Tranders, Aalborg, Aalborg Kommune, Region Nordjylland, 9220, Danmark" amenity university 0.539098689594578 Danmark FALSE
+roskilde university dk Europe Northern Europe FALSE 2 2021-02-03 99948291 way "Roskilde Universitet, Trekroner Parkvej, Trekroner, Roskilde, Roskilde Kommune, Region Sjælland, Danmark" amenity university 0.504892902573089 Danmark FALSE
+unep dk Europe Northern Europe FALSE 2 2021-02-03 60420076 node "UNEP, Marmorvej, Marmormolen, Østerbro, København, Københavns Kommune, Region Hovedstaden, 2150, Danmark" office international_organization 0.101 Danmark FALSE
+university of southern denmark dk Europe Northern Europe FALSE 2 2021-02-03 95058307 way "Syddansk Universitet, Fioniavej, Cortex Park, Odense, Odense Kommune, Region Syddanmark, 5230, Danmark" amenity university 0.349660525371521 Danmark FALSE
+airbus defence de Europe Western Europe FALSE 2 2021-02-03 109486291 way "Werkfeuerwehr Airbus, Claude-Dornier-Straße, Airbus Defence & Space, Immenstaad am Bodensee, Verwaltungsgemeinschaft Friedrichshafen, Bodenseekreis, Baden-Württemberg, 88090, Deutschland" amenity fire_station 0.201 Deutschland FALSE
+angewandte chemie de Europe Western Europe FALSE 2 2021-02-03 131574943 way "Angewandte Chemie und Elektrotechnik (Gebäude 14), Schillerstraße, Thamm, Senftenberg, Oberspreewald-Lausitz, Brandenburg, 01968, Deutschland" building school 0.201 Deutschland FALSE
+bausch de Europe Western Europe FALSE 2 2021-02-03 15525429 node "Bausch, Schützenstraße, Sankt Lorenz Süd, Lübeck, Schleswig-Holstein, 23558, Deutschland" shop car_repair 0.101 Deutschland FALSE
+bernstein center for computational neuroscience de Europe Western Europe FALSE 2 2021-02-03 36991996 node "Bernstein Center for Computational Neuroscience, 6, Von-Siebold-Straße, Humboldtallee, Nordstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37075, Deutschland" place house 0.501 Deutschland FALSE
+bielefeld university de Europe Western Europe FALSE 2 2021-02-03 213139009 way "Universität Bielefeld, 25, Universitätsstraße, Schildesche, Bielefeld, Nordrhein-Westfalen, 33615, Deutschland" amenity university 0.579570236211385 Deutschland FALSE
+dusel de Europe Western Europe FALSE 2 2021-02-03 21160565 node "Dusel, Eppenbrunn, Pirmasens-Land, Südwestpfalz, Rheinland-Pfalz, Deutschland" natural peak 0.4 Deutschland FALSE
+ess de Europe Western Europe FALSE 2 2021-02-03 93094803 way "Flughafen Essen-Mülheim, Zeppelinstraße, Raadt, Menden-Holthausen, Rechtsruhr-Süd, Mülheim an der Ruhr, Nordrhein-Westfalen, 45470, Deutschland" aeroway aerodrome 0.451332014915526 Deutschland FALSE
+european research universities de Europe Western Europe FALSE 2 2021-02-03 232582752 way "Zentrum für Entwicklungsforschung / Zentrum für europäische Integrationsforschung, Genscherallee, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.222549534893346 Deutschland FALSE
+friedrich loeffler institute de Europe Western Europe FALSE 2 2021-02-03 652533 node "Institut für Nutztiergenetik, Friedrich Loeffler Institut, 10, Höltystraße, Mariensee, Neustadt am Rübenberge, Region Hannover, Niedersachsen, 31535, Deutschland" tourism attraction 0.201 Deutschland FALSE
+german aerospace centre de Europe Western Europe FALSE 2 2021-02-03 258165325 relation "Deutsches Zentrum für Luft- und Raumfahrt, Grengel, Porz, Köln, Nordrhein-Westfalen, 51147, Deutschland" landuse industrial 0.419657429852984 Deutschland FALSE
+german electron synchrotron de Europe Western Europe FALSE 2 2021-02-03 96698255 way "Deutsches Elektronen-Synchrotron DESY, 6, Platanenallee, Hankelsablage, Zeuthen, Dahme-Spreewald, Brandenburg, 15738, Deutschland" amenity research_institute 0.101 Deutschland FALSE
+german primate center de Europe Western Europe FALSE 2 2021-02-03 101999477 way "Deutsches Primatenzentrum GmbH, 7, Hans-Adolf-Krebs-Weg, Weende, Weende / Deppoldshausen, Göttingen, Landkreis Göttingen, Niedersachsen, 37077, Deutschland" building yes 0.101 Deutschland FALSE
+global climate change de Europe Western Europe FALSE 2 2021-02-03 34620690 node "Mercator Research Institute on Global Commons and Climate Change, Torgauer Straße, Rote Insel, Schöneberg, Tempelhof-Schöneberg, Berlin, 10829, Deutschland" amenity research_institute 0.301 Deutschland FALSE
+gran sasso de Europe Western Europe FALSE 2 2021-02-03 4210065 node "Gran Sasso, Ebenauer Straße, Bezirksteil Dom Pedro, Neuhausen-Nymphenburg, München, Bayern, 80637, Deutschland" amenity restaurant 0.201 Deutschland FALSE
+hannover medical school de Europe Western Europe FALSE 2 2021-02-03 65488332 node "Nikolai-Fuchs-Str. 34, 30625 Hannover, Nikolai-Fuchs-Straße, Medical Park, Groß-Buchholz, Buchholz-Kleefeld, Hannover, Region Hannover, Niedersachsen, 30625, Deutschland" amenity post_box 0.201 Deutschland FALSE
+helmholtz centre for infection research de Europe Western Europe FALSE 2 2021-02-03 161865420 way "Helmholtz-Zentrum für Infektionsforschung Bibliothek, 7, Inhoffenstraße, Stöckheim, Stöckheim- Leiferde, Braunschweig, Niedersachsen, 38124, Deutschland" amenity library 0.201 Deutschland FALSE
+huawei de Europe Western Europe FALSE 2 2021-02-03 301442980 node "Huawei Customer Service Center, 92a, Königsallee, Stadtmitte, Stadtbezirk 1, Düsseldorf, Nordrhein-Westfalen, 40212, Deutschland" office company 0.637513180260927 Deutschland FALSE
+idf de Europe Western Europe FALSE 2 2021-02-03 155620333 way "Institut der Feuerwehr, 237, Wolbecker Straße, Mauritz-Ost, Münster-Ost, Münster, Nordrhein-Westfalen, 48155, Deutschland" amenity college 0.228876356713622 Deutschland FALSE
+institute of optics de Europe Western Europe FALSE 2 2021-02-03 150324329 way "Max-Planck-Institut für Quantenoptik, 1, Hans-Kopfermann-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.333532730730458 Deutschland FALSE
+isf de Europe Western Europe FALSE 2 2021-02-03 189869599 way "International School Frankfurt Rhein-Main, 33, Straße zur Internationalen Schule, Sindlingen, West, Frankfurt am Main, Hessen, 65931, Deutschland" amenity school 0.272343749103071 Deutschland FALSE
+laboratory of molecular biology de Europe Western Europe FALSE 2 2021-02-03 97458858 way "Europäisches Laboratorium für Molekularbiologie, 1, Meyerhofstraße, Rohrbach, Heidelberg, Baden-Württemberg, 69117, Deutschland" amenity research_institute 0.453558714867367 Deutschland FALSE
+max delbrück center for molecular medicine de Europe Western Europe FALSE 2 2021-02-03 204659384 way "Max-Delbrück-Centrum für Molekulare Medizin, 28, Hannoversche Straße, Mitte, Berlin, 10115, Deutschland" office research 0.201 Deutschland FALSE
+max planck institute for chemical ecology de Europe Western Europe FALSE 2 2021-02-03 258183717 relation "Max-Planck-Institut für Chemische Ökologie, 8, Hans-Knöll-Straße, Süd, Jena-Süd, Jena, Thüringen, 07745, Deutschland" office research 0.517609725634953 Deutschland FALSE
+max planck institute for demographic research de Europe Western Europe FALSE 2 2021-02-03 82958469 node "Max Planck-Institut für demografische Forschung, 1, Konrad-Zuse-Straße, Hafen City Rostock, Kröpeliner-Tor-Vorstadt, Ortsbeirat 11 : Kröpeliner-Tor-Vorstadt, Rostock, Mecklenburg-Vorpommern, 18057, Deutschland" office research 0.630717976780999 Deutschland FALSE
+max planck institute for molecular genetics de Europe Western Europe FALSE 2 2021-02-03 96978816 way "Max-Planck-Institut für Molekulare Genetik, 63-73, Ihnestraße, Dahlem, Steglitz-Zehlendorf, Berlin, 14195, Deutschland" amenity research_institute 0.451308416199056 Deutschland FALSE
+merck kgaa de Europe Western Europe FALSE 2 2021-02-03 258400816 relation "Merck KGaA, Darmstadt-Nord, Darmstadt, Hessen, 64293, Deutschland" landuse industrial 0.4 Deutschland FALSE
+ministry of research de Europe Western Europe FALSE 2 2021-02-03 259033442 relation "Bundesministerium für Bildung und Forschung, 1, Kapelle-Ufer, Mitte, Berlin, 10117, Deutschland" office government 0.468523457581497 Deutschland FALSE
+modis de Europe Western Europe FALSE 2 2021-02-03 301357766 node "Modis, Parsevalstraße, Bindersleben, Erfurt, Thüringen, 99092, Deutschland" office company 0.101 Deutschland FALSE
+naturwissenschaften de Europe Western Europe FALSE 2 2021-02-03 297176250 way "Naturwissenschaften, Am Schwanhof, Südviertel, Marburg, Landkreis Marburg-Biedenkopf, Hessen, 35037, Deutschland" building school 0.101 Deutschland FALSE
+oie de Europe Western Europe FALSE 2 2021-02-03 84439830 way "Oie, Zingst, Vorpommern-Rügen, Mecklenburg-Vorpommern, Deutschland" place islet 0.410838391011185 Deutschland FALSE
+polarstern de Europe Western Europe FALSE 2 2021-02-03 3976082 node "Polarstern, 8, Herzog-Georg-Straße, Bad Liebenstein, Wartburgkreis, Thüringen, 36448, Deutschland" amenity cafe 0.101 Deutschland FALSE
+researchgate de Europe Western Europe FALSE 2 2021-02-03 72908266 node "Research Gate, 20, Chausseestraße, Mitte, Berlin, 10115, Deutschland" office company 0.001 Deutschland FALSE
+rwth aachen university de Europe Western Europe FALSE 2 2021-02-03 302467785 relation "RWTH Aachen, Sandkaulstraße, Kaiserplatz, Frankenberger Viertel, Aachen-Mitte, Aachen, Städteregion Aachen, Nordrhein-Westfalen, 52062, Deutschland" amenity university 0.776424465208321 Deutschland FALSE
+sanger institute de Europe Western Europe FALSE 2 2021-02-03 106208569 way "Professor-Sänger-Straße, DLR Lampoldshausen, Hardthausen am Kocher, Verwaltungsgemeinschaft Neuenstadt am Kocher, Landkreis Heilbronn, Baden-Württemberg, 74239, Deutschland" highway unclassified 0.1 Deutschland FALSE
+unfccc de Europe Western Europe FALSE 2 2021-02-03 259281371 relation "Klimarahmenkonvention der Vereinten Nationen, Platz der Vereinten Nationen, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" office international_organization 0.312019878936673 Deutschland FALSE
+university of aachen de Europe Western Europe FALSE 2 2021-02-03 302467785 relation "RWTH Aachen, Sandkaulstraße, Kaiserplatz, Frankenberger Viertel, Aachen-Mitte, Aachen, Städteregion Aachen, Nordrhein-Westfalen, 52062, Deutschland" amenity university 0.67642446520832 Deutschland FALSE
+university of giessen de Europe Western Europe FALSE 2 2021-02-03 6864299 node "Oberer Hardthof, Gießen, Landkreis Gießen, Hessen, 35398, Deutschland" amenity university 0.101 Deutschland FALSE
+university of hamburg de Europe Western Europe FALSE 2 2021-02-03 101158067 way "Universität Hamburg, 177, Mittelweg, Rotherbaum, Eimsbüttel, Hamburg, 20148, Deutschland" building yes 0.101 Deutschland FALSE
+university of kiel de Europe Western Europe FALSE 2 2021-02-03 95613087 way "Fachhochschule Kiel, Grenzstraße, Neumühlen-Dietrichsdorf, Kiel, Schleswig-Holstein, 24149, Deutschland" amenity university 0.414691670621569 Deutschland FALSE
+university of konstanz de Europe Western Europe FALSE 2 2021-02-03 96173591 way "Universität Konstanz, 10, Universitätsstraße, Konstanz-Egg, Konstanz, Verwaltungsgemeinschaft Konstanz, Landkreis Konstanz, Baden-Württemberg, 78464, Deutschland" amenity university 0.577529588367216 Deutschland FALSE
+university of leipzig de Europe Western Europe FALSE 2 2021-02-03 134933365 way "Hochschule für Technik, Wirtschaft und Kultur Leipzig, Richard-Lehmann-Straße, Connewitz, Süd, Leipzig, Sachsen, Deutschland" amenity university 0.426239076957718 Deutschland FALSE
+university of lübeck de Europe Western Europe FALSE 2 2021-02-03 10423017 node "Musikhochschule Lübeck, Große Petersgrube, Innenstadt, Lübeck, Schleswig-Holstein, 23552, Deutschland" amenity university 0.450710506461892 Deutschland FALSE
+university of mainz de Europe Western Europe FALSE 2 2021-02-03 79998910 node "Praxis Dipl.-Psych. Univ. Thilo Rommel, 13, Emmeransstraße, Altstadt, Mainz, Rheinland-Pfalz, 55116, Deutschland" amenity doctors 0.101 Deutschland FALSE
+university of ulm de Europe Western Europe FALSE 2 2021-02-03 136528376 way "Hochschule Neu-Ulm, John-F.-Kennedy-Straße, Wiley-Mitte, Neu-Ulm, Landkreis Neu-Ulm, Bayern, 89231, Deutschland" amenity university 0.36691348680426 Deutschland FALSE
+university of wuppertal de Europe Western Europe FALSE 2 2021-02-03 96382279 way "Bergische Universität Wuppertal - Campus Grifflenberg, Gaußstraße, Grifflenberg, Gemarkung Elberfeld, Wuppertal, Nordrhein-Westfalen, 42119, Deutschland" amenity university 0.538650451987068 Deutschland FALSE
+czech technical university cz Europe Eastern Europe FALSE 2 2021-02-03 96182197 way "ÄŒeské vysoké uÄ<8d>enà technické v Praze, Na Zderaze, Nové MÄ›sto, Hlavnà mÄ›sto Praha, Praha, 11121, ÄŒesko" amenity university 0.001 ÄŒesko FALSE
+gsa cz Europe Eastern Europe FALSE 2 2021-02-03 179764032 way "Agentura pro evropský GNSS, Strossmayerovo námÄ›stÃ, HoleÅ¡ovice, Hlavnà mÄ›sto Praha, Praha, 170 00, ÄŒesko" office government 0.372568181723457 ÄŒesko FALSE
+lipi cz Europe Eastern Europe FALSE 2 2021-02-03 258043507 relation "LipÃ, okres ÄŒeské BudÄ›jovice, JihoÄ<8d>eský kraj, Jihozápad, ÄŒesko" boundary administrative 0.445458181651172 ÄŒesko FALSE
+lyra cz Europe Eastern Europe FALSE 2 2021-02-03 49441191 node "Lyra, LudvÃkov, okres Bruntál, Moravskoslezský kraj, Moravskoslezsko, 79324, ÄŒesko" natural peak 0.4 ÄŒesko FALSE
+pr cz Europe Eastern Europe FALSE 2 2021-02-03 257910432 relation "Hlavnà město Praha, Praha, Česko" boundary administrative 0.843491463278747 Česko FALSE
+public interest cz Europe Eastern Europe FALSE 2 2021-02-03 13912826 node "Public interest, U Milosrdných, Staré Město, Hlavnà město Praha, Praha, 110000, Česko" amenity bar 0.201 Česko FALSE
+vivus cz Europe Eastern Europe FALSE 2 2021-02-03 142158070 way "Vivus, Kurta Konráda, Libeň, Hlavnà město Praha, Praha, 19093, Česko" building residential 0.101 Česko FALSE
+icmr cy Asia Western Asia FALSE 2 2021-02-03 59592822 node "ICMR, 100, Leoforos Amathountos, Κοινότητα Αγίου ΤÏ<8d>χωνα, Λεμεσός, ΚÏ<8d>Ï€Ï<81>ος, 4532, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs" amenity clinic 0.101 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+cape verde cv Africa Western Africa FALSE 2 2021-02-03 258324792 relation Cabo Verde boundary administrative 0.757468696317777 Cabo Verde FALSE
+coca cola cr Americas Central America FALSE 2 2021-02-03 258704001 relation "Coca Cola, Merced, Cantón San José, Provincia San José, 10102, Costa Rica" boundary administrative 0.45 Costa Rica FALSE
+centre of genomics co Americas South America FALSE 2 2021-02-03 12402461 node "GENOMICS, Carrera 42, Tequendama, Comuna 19, PerÃmetro Urbano Santiago de Cali, Cali, Sur, Valle del Cauca, PacÃfica, 76000, Colombia" amenity hospital 0.101 Colombia FALSE
+concordia co Americas South America FALSE 2 2021-02-03 258583302 relation "Concordia, Suroeste, Antioquia, Región Andina, Colombia" boundary administrative 0.55 Colombia FALSE
+gpi co Americas South America FALSE 2 2021-02-03 250290459 way "Guapi Airport, Carrera 9B, OlÃmpico, Olimpico, Guapi, PacÃfico, Cauca, PacÃfica, Colombia" aeroway aerodrome 0.305003945962319 Colombia FALSE
+interfax co Americas South America FALSE 2 2021-02-03 26601120 node "Interfax, Carrera 3, San Pedro, Casco urbano ChÃa, ChÃa, Sabana Centro, Cundinamarca, Región Andina, 25001, Colombia" shop computer 0.101 Colombia FALSE
+national university of colombia co Americas South America FALSE 2 2021-02-03 259285997 relation "Universidad Nacional de Colombia, 26-85, Carrera 45, Rafael Nuñez, UPZ La Esmeralda, Localidad Teusaquillo, Bogotá, Bogotá Distrito Capital, Región Andina, 111321, Colombia" amenity university 0.381311730611622 Colombia FALSE
+chinese academy of engineering cn Asia Eastern Asia FALSE 2 2021-02-03 218888890 way "ä¸å›½ç§‘å¦é™¢è¿‡ç¨‹å·¥ç¨‹ç ”究所(东区), ä¸å…³æ<9d>‘北二æ<9d>¡, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" amenity research_institute 0.119931111449547 ä¸å›½ FALSE
+chinese academy of sciences institute of vertebrate paleontology cn Asia Eastern Asia FALSE 2 2021-02-03 154175740 way "Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½" amenity public_building 0.801 ä¸å›½ FALSE
+chinese academy of sciences' institute of vertebrate paleontology cn Asia Eastern Asia FALSE 2 2021-02-03 154175740 way "Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½" amenity public_building 0.801 ä¸å›½ FALSE
+chongqing university cn Asia Eastern Asia FALSE 2 2021-02-03 69380859 node "é‡<8d>庆大å¦, æ²™å<9d>ªå<9d><9d>北街, æ²™å<9d>ªå<9d><9d>è¡—é<81>“, æ²™å<9d>ªå<9d><9d>区, é‡<8d>庆ä¸å¿ƒåŸŽåŒº, é‡<8d>庆市, 400030, ä¸å›½" railway station 0.001 ä¸å›½ FALSE
+fujian cn Asia Eastern Asia FALSE 2 2021-02-03 258464335 relation "ç¦<8f>建çœ<81>, ä¸å›½" boundary administrative 0.661825005937183 ä¸å›½ FALSE
+guangzhou medical university cn Asia Eastern Asia FALSE 2 2021-02-03 299916891 node "广医大(ç•ªç¦ºæ ¡åŒº)ç«™, S296, æ–°é€ é•‡, 番禺区, 广州市, 广东çœ<81>, 511434, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+harbin institute of technology cn Asia Eastern Asia FALSE 2 2021-02-03 258684322 relation "哈尔滨工业大å¦, 教化街, 花å›è¡—é<81>“办事处, å<8d>—岗区, 哈尔滨市, 黑龙江çœ<81>, 150000, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+institute of vertebrate paleontology and paleoanthropology cn Asia Eastern Asia FALSE 2 2021-02-03 154175740 way "Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½" amenity public_building 0.601 ä¸å›½ FALSE
+ipm cn Asia Eastern Asia FALSE 2 2021-02-03 135424854 way "澳門ç<90>†å·¥å¸é™¢ Instituto Politecnico de Macau, 高美士街 Rua de LuÃs Gonzaga Gomes, æ–°å<8f>£å²¸å¡«æµ·å<8d>€ Zona de Aterros do Porto Exterior, æ–°å<8f>£å²¸æ–°å¡«æµ·å<8d>€(皇æœ<9d>å<8d>€) Zona Nova de Aterros do Porto Exterior, å¤§å ‚å<8d>€ Sé, 澳門 Macau, 853, ä¸å›½" amenity college 0.359793334348642 ä¸å›½ FALSE
+jiuquan satellite launch center cn Asia Eastern Asia FALSE 2 2021-02-03 146193628 way "酒泉å<8d>«æ˜Ÿå<8f>‘å°„ä¸å¿ƒ, S315, 东风镇, é¢<9d>济纳旗, 阿拉善盟, 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½" aeroway spaceport 0.46012624965149 ä¸å›½ FALSE
+lmc cn Asia Eastern Asia FALSE 2 2021-02-03 120334390 way "è<90>½é¦¬æ´² Lok Ma Chau, è<90>½é¦¬æ´²æ”¯ç·šç®¡åˆ¶ç«™ Lok Ma Chau Spur Line, ç¦<8f>田区, 深圳市, 元朗å<8d>€ Yuen Long District, æ–°ç•Œ New Territories, 广东çœ<81>, 香港 Hong Kong, 518048, ä¸å›½" building train_station 0.402513658204824 ä¸å›½ FALSE
+nankai university cn Asia Eastern Asia FALSE 2 2021-02-03 101663669 way "å<8d>—开大å¦, å¤<8d>康路辅路, å<8d>—开区 (Nankai), 天津市, 300381, ä¸å›½" amenity university 0.579467215043441 ä¸å›½ FALSE
+nyu shanghai cn Asia Eastern Asia FALSE 2 2021-02-03 164692824 way "NYU Shanghai, 1555, 世纪大é<81>“, å¼ å®¶æ¥¼, 花木镇, 浦东新区, 200120, ä¸å›½" amenity university 0.201 ä¸å›½ FALSE
+science and economic development cn Asia Eastern Asia FALSE 2 2021-02-03 149149294 way "国盛科技å›, 北京ç»<8f>济技术开å<8f>‘区, è<8d>£å<8d>Žè¡—é<81>“, 大兴区, 北京市, ä¸å›½" landuse industrial 0.2 ä¸å›½ FALSE
+shanghai ocean university cn Asia Eastern Asia FALSE 2 2021-02-03 205461712 way "上海海洋大å¦ï¼ˆä¸´æ¸¯æ ¡åŒºï¼‰, 东海大桥, 浦东新区, 201306, ä¸å›½" amenity university 0.370639694209592 ä¸å›½ FALSE
+shanghaitech university cn Asia Eastern Asia FALSE 2 2021-02-03 258792021 relation "上海科技大å¦, 393å<8f>·, å<8d>Žå¤<8f>ä¸è·¯, 康桥镇, 浦东新区, 101201, ä¸å›½" amenity university 0.377613648458292 ä¸å›½ FALSE
+shenzhen stock exchange cn Asia Eastern Asia FALSE 2 2021-02-03 244033990 way "2012å<8f>·, 深圳è¯<81>券交易所, ç¦<8f>田区, 深圳市, 广东çœ<81>, 518038, ä¸å›½" landuse commercial 0.444601849346538 ä¸å›½ FALSE
+sichuan university cn Asia Eastern Asia FALSE 2 2021-02-03 162743780 way "å››å·<9d>大å¦ï¼ˆæœ›æ±Ÿæ ¡åŒºï¼‰, å¼ æ¾œè·¯, æ¦ä¾¯åŒº, æˆ<90>都市, å››å·<9d>çœ<81>, 610021, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+times higher education cn Asia Eastern Asia FALSE 2 2021-02-03 83556554 node "时代è<81>”å<8d>Žè¶…市, å¦æž—è¡—, 白æ<9d>¨è¡—é<81>“, 钱塘新区, æ<9d>州市, 浙江çœ<81>, 310018, ä¸å›½" shop yes 0.001 ä¸å›½ FALSE
+university of siena cn Asia Eastern Asia FALSE 2 2021-02-03 58928209 node "å¤§å¸ University, 沙田å<8d>€å–®è»Šä¸»å¹¹ç¶« Major Cycle Track of Sha Tin District, 馬料水 Ma Liu Shui, ä¹<9d>è‚š Kau To, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" railway station 0.582526166251558 ä¸å›½ FALSE
+xi'an jiaotong university cn Asia Eastern Asia FALSE 2 2021-02-03 156097263 way "西安交通大å¦å…´åº†æ ¡åŒº, å<8f>‹è°Šä¸œè·¯, 碑林区 (Beilin), 西安市, 陕西çœ<81>, 710048, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+yunnan university cn Asia Eastern Asia FALSE 2 2021-02-03 50461251 node "云å<8d>—大å¦, é<9d>’云街, å<8d>Žå±±è¡—é<81>“, 五å<8d>ŽåŒº, 昆明市, 云å<8d>—çœ<81>, 650031, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+cerro tololo cl Americas South America FALSE 2 2021-02-03 23589264 node "Cerro Tololo, Vicuña, Provincia de Elqui, Región de Coquimbo, Chile" place locality 0.325 Chile FALSE
+conicyt cl Americas South America FALSE 2 2021-02-03 18074608 node "CONICYT, Bernarda MorÃn, Providencia, Provincia de Santiago, Región Metropolitana de Santiago, 7501091, Chile" amenity bicycle_parking 0.101 Chile FALSE
+giant magellan telescope cl Americas South America FALSE 2 2021-02-03 5515191 node "Giant Magellan Telescope, Las Campanas, La Higuera, Provincia de Elqui, Región de Coquimbo, Chile" man_made telescope 0.301 Chile FALSE
+la silla observatory cl Americas South America FALSE 2 2021-02-03 122581340 way "La Silla Observatory, La Silla internal road, La Higuera, Provincia de Elqui, Región de Coquimbo, Chile" amenity research_institute 0.301 Chile FALSE
+las campanas observatory cl Americas South America FALSE 2 2021-02-03 102955757 way "Las Campanas Observatory, Vallenar, Provincia de Huasco, Región de Atacama, Chile" landuse observatory 0.5 Chile FALSE
+punta arenas cl Americas South America FALSE 2 2021-02-03 258446317 relation "Punta Arenas, Provincia de Magallanes, Región de Magallanes y de la Antártica Chilena, Chile" boundary administrative 0.702705295739513 Chile FALSE
+aspi ch Europe Western Europe FALSE 2 2021-02-03 22396364 node "Aspi, Lützelflüh, Verwaltungskreis Emmental, Verwaltungsregion Emmental-Oberaargau, Bern/Berne, 3434, Schweiz/Suisse/Svizzera/Svizra" place hamlet 0.35 Schweiz/Suisse/Svizzera/Svizra FALSE
+international olympic committee ch Europe Western Europe FALSE 2 2021-02-03 213449037 way "Comité International Olympique, Route de Vidy, Lausanne, District de Lausanne, Vaud, 1020, Schweiz/Suisse/Svizzera/Svizra" office ngo 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+ofac ch Europe Western Europe FALSE 2 2021-02-03 43854237 node "OFAC, 7, Rue Pedro-Meylan, Champel, Genève, 1208, Schweiz/Suisse/Svizzera/Svizra" place house 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+snsf ch Europe Western Europe FALSE 2 2021-02-03 23413803 node "Schweizerischer Nationalfonds (SNF), Wildhainweg, Stadtbach, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra" office government 0.001 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of berne ch Europe Western Europe FALSE 2 2021-02-03 258566275 relation "Universität Bern, Falkenplatz, Länggasse, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.626372678886767 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of fribourg ch Europe Western Europe FALSE 2 2021-02-03 79253283 node "Department of Geosciences at the University of Fribourg, Chemin du Musée, Pérolles, Fribourg - Freiburg, District de la Sarine, Fribourg/Freiburg, 1705, Schweiz/Suisse/Svizzera/Svizra" office educational_institution 0.301 Schweiz/Suisse/Svizzera/Svizra FALSE
+wipo ch Europe Western Europe FALSE 2 2021-02-03 134711656 way "Organisation Mondiale de la Propriété Intellectuelle, 34, Chemin des Colombettes, Moillebeau, Petit-Saconnex et Servette, Genève, 1209, Schweiz/Suisse/Svizzera/Svizra" building yes 0.361912708763218 Schweiz/Suisse/Svizzera/Svizra FALSE
+world trade organization ch Europe Western Europe FALSE 2 2021-02-03 211703140 way "Organisation Mondiale du Commerce, Rue de Lausanne, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" office government 0.613282888246145 Schweiz/Suisse/Svizzera/Svizra FALSE
+republic of the congo cg Africa Middle Africa FALSE 2 2021-02-03 257866268 relation Congo boundary administrative 0.767415764799089 Congo FALSE
+inrb cd Africa Middle Africa FALSE 2 2021-02-03 196637632 way "INRB, Avenue des Huileries, Golf, Gombe, Kinshasa, 012, République démocratique du Congo" building yes 0.101 République démocratique du Congo FALSE
+alpha centauri ca Americas Northern America FALSE 2 2021-02-03 45319061 node "Mount Alpha Centauri, Area G (Forster Creek/Mount Assiniboine), Regional District of East Kootenay, British Columbia, Canada" natural peak 0.5 Canada FALSE
+canadian association of university teachers ca Americas Northern America FALSE 2 2021-02-03 64284898 node "Canadian Association of University Teachers, 2705, Queensview Drive, Britannia Heights, Bay, Ottawa, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K2B 6B7, Canada" office association 0.501 Canada FALSE
+canadian museum of nature ca Americas Northern America FALSE 2 2021-02-03 144159501 way "Canadian Museum of Nature, Argyle Avenue, Golden Triangle, Centretown, Somerset, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K2P 1Z4, Canada" tourism museum 0.794667642378454 Canada FALSE
+institute of ecology ca Americas Northern America FALSE 2 2021-02-03 50878159 node "Canadian Institute of Forestry, The Canadian Ecology Centre Road, Mattawa, Nipissing District, Northeastern Ontario, Ontario, P0H 1V0, Canada" amenity college 0.301 Canada FALSE
+institute of ocean sciences ca Americas Northern America FALSE 2 2021-02-03 259251964 relation "Institute of Ocean Sciences, 9860, West Saanich Road, Sidney, Capital Regional District, British Columbia, V8L 4B2, Canada" building yes 0.401 Canada FALSE
+lakehead university ca Americas Northern America FALSE 2 2021-02-03 138297326 way "Lakehead University, North Spirit Road, Thunder Bay, Thunder Bay District, Northwestern Ontario, Ontario, P7B 5E1, Canada" amenity university 0.201 Canada FALSE
+mcgill ca Americas Northern America FALSE 2 2021-02-03 295834059 node "McGill, Boulevard De Maisonneuve Ouest, Quartier des Spectacles, René-Lévesque, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3A 3J2, Canada" railway station 0.472714057293031 Canada FALSE
+memorial university of newfoundland ca Americas Northern America FALSE 2 2021-02-03 47197396 node "Queen's College Sign, Long Pond Trail, Memorial University of Newfoundland main campus, St. John's, Newfoundland, Newfoundland and Labrador, A1B 3P7, Canada" tourism information 0.401 Canada FALSE
+newfoundland ca Americas Northern America FALSE 2 2021-02-03 259208749 relation "Newfoundland, Newfoundland and Labrador, Canada" boundary administrative 0.6 Canada FALSE
+northwest passage ca Americas Northern America FALSE 2 2021-02-03 1180737 node "Northwest Passage, á•¿á‘á–…á‘–á“—á’ƒ Qikiqtaaluk Region, ᓄᓇᕗᑦ Nunavut, Canada" place locality 0.721993908833439 Canada FALSE
+ocean networks canada ca Americas Northern America FALSE 2 2021-02-03 214362677 way "NEPTUNE Ocean Observatory Shore Station - Ocean Networks Canada, 2180, Mallory Drive, Cameron Heights, Port Alberni, Alberni-Clayoquot Regional District, British Columbia, V9Y 2A8, Canada" office research 0.301 Canada FALSE
+oceans canada ca Americas Northern America FALSE 2 2021-02-03 3422315 node "Oceans, 4557, Hurontario Street, Mississauga, Peel Region, Golden Horseshoe, Ontario, L5R 3E7, Canada" shop supermarket 0.201 Canada FALSE
+parks canada ca Americas Northern America FALSE 2 2021-02-03 157069631 way "Jasper Park Information Centre, 500, Connaught Drive, Municipality of Jasper, Alberta, T0E 1E0, Canada" tourism information 0.508746182183473 Canada FALSE
+perimeter institute ca Americas Northern America FALSE 2 2021-02-03 150705575 way "Perimeter Institute for Theoretical Physics, 31, Caroline Street North, Uptown, Waterloo, Region of Waterloo, Southwestern Ontario, Ontario, N2L 2Y5, Canada" building university 0.545725205949526 Canada FALSE
+public health agency of canada ca Americas Northern America FALSE 2 2021-02-03 194692555 way "Public Health Agency of Canada, 130, Colonnade Road South, Fisher Glen, Knoxdale-Merivale, Nepean, Ottawa, Eastern Ontario, Ontario, K2E 7Y1, Canada" office government 0.501 Canada FALSE
+puma ca Americas Northern America FALSE 2 2021-02-03 41765486 node "Puma, Area C (Pemberton Valley/Mount Currie/D'Arcy), Squamish-Lillooet Regional District, British Columbia, Canada" natural peak 0.4 Canada FALSE
+royal tyrrell museum ca Americas Northern America FALSE 2 2021-02-03 117591275 way "Royal Tyrrell Museum, 1500, North Dinosaur Trail, Nacmine, Drumheller, Alberta, T0J 0Y1, Canada" tourism museum 0.692168689295747 Canada FALSE
+saskatchewan ca Americas Northern America FALSE 2 2021-02-03 258121188 relation "Saskatchewan, Canada" boundary administrative 0.748590173341754 Canada FALSE
+university of new brunswick ca Americas Northern America FALSE 2 2021-02-03 93050151 way "University of New Brunswick, Rue Winslow, Town Platt, Downtown, Fredericton, York County, New Brunswick / Nouveau-Brunswick, E3B 4C9, Canada" amenity university 0.864942671117145 Canada FALSE
+university of ottawa heart institute ca Americas Northern America FALSE 2 2021-02-03 107373367 way "University of Ottawa Heart Institute, 40, Ruskin Street, Civic Hospital, Hintonburg, Kitchissippi, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1Y 4W7, Canada" building hospital 0.752344279227432 Canada FALSE
+university of sherbrooke ca Americas Northern America FALSE 2 2021-02-03 120967475 way "Bishop's University, Rue Winder, Lennoxville, Sherbrooke, Estrie, Québec, J1M 1H9, Canada" amenity university 0.201 Canada FALSE
+susy by Europe Eastern Europe FALSE 2 2021-02-03 259261467 relation "Суши, ПершайÑ<81>кий Ñ<81>ельÑ<81>кий Совет, ВоложинÑ<81>кий район, МинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, БеларуÑ<81>ÑŒ" boundary administrative 0.25 БеларуÑ<81>ÑŒ FALSE
+cdu br Americas South America FALSE 2 2021-02-03 92204695 way "Carandiru, 2487, Avenida Cruzeiro do Sul, Santana, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 02031-000, Brasil" railway station 0.343659122005759 Brasil FALSE
+cosan br Americas South America FALSE 2 2021-02-03 185049204 way "COSAN, Vila Triagem, Bauru, Região Imediata de Bauru, Região Geográfica Intermediária de Bauru, São Paulo, Região Sudeste, Brasil" landuse industrial 0.3 Brasil FALSE
+eht br Americas South America FALSE 2 2021-02-03 169009776 way "EHT, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70297400, Brasil" highway unclassified 0.2 Brasil FALSE
+embrapa br Americas South America FALSE 2 2021-02-03 259507924 relation "Embrapa, Teresina, Região Geográfica Imediata de Teresina, Região Integrada de Desenvolvimento da Grande Teresina, Região Geográfica Intermediária de Teresina, PiauÃ, Região Nordeste, Brasil" boundary administrative 0.35 Brasil FALSE
+fapesp br Americas South America FALSE 2 2021-02-03 190947973 way "Fundação de Amparo à Pesquisa do Estado de São Paulo, 1500, Rua Pio XI, Vila Ida, Alto de Pinheiros, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05060-001, Brasil" office government 0.001 Brasil FALSE
+federal university of espírito santo br Americas South America FALSE 2 2021-02-03 190158758 way "Universidade Federal do EspÃrito Santo, 514, Avenida Fernando Ferrari, Mata da Praia, Goiabeiras, Vitória, Região Geográfica Imediata de Vitória, Região Metropolitana da Grande Vitória, Região Geográfica Intermediária de Vitória, EspÃrito Santo, Região Sudeste, 29075-910, Brasil" amenity university 0.696675389924706 Brasil FALSE
+general electric br Americas South America FALSE 2 2021-02-03 259288604 relation "General Electric, Campinas, Região Imediata de Campinas, Região Metropolitana de Campinas, Região Geográfica Intermediária de Campinas, São Paulo, Região Sudeste, Brasil" landuse industrial 0.4 Brasil FALSE
+ilsi br Americas South America FALSE 2 2021-02-03 114074052 way "Rua Ilsi Ragadalli, Alvorada, Videira, Região Geográfica Imediata de Videira, Região Geográfica Intermediária de Caçador, Santa Catarina, Região Sul, 89560-000, Brasil" highway residential 0.2 Brasil FALSE
+ministry of science and innovation br Americas South America FALSE 2 2021-02-03 65507092 node "Ministry of Science, Technology & Innovation, or Ministry of National Integration, S1, Setor de Autarquias Sul, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70058-900, Brasil" office government 0.401 Brasil FALSE
+natal br Americas South America FALSE 2 2021-02-03 296675227 relation "Natal, Região Geográfica Imediata de Natal, Região Geográfica Intermediária de Natal, Rio Grande do Norte, Região Nordeste, Brasil" boundary administrative 0.650113556587143 Brasil FALSE
+national museum of natural sciences br Americas South America FALSE 2 2021-02-03 139974775 way "Museu de Ciências Naturais, 1427, Rua Doutor Salvador França, Jardim Botânico, Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 90690-000, Brasil" tourism museum 0.256321943137092 Brasil FALSE
+novo nordisk br Americas South America FALSE 2 2021-02-03 184059049 way "Novo Nordisk, Araucária, Região Geográfica Imediata de Curitiba, Região Metropolitana de Curitiba, Região Geográfica Intermediária de Curitiba, Paraná, Região Sul, Brasil" landuse industrial 0.4 Brasil FALSE
+pepsico br Americas South America FALSE 2 2021-02-03 160482058 way "Pepsico, Parque Cecap, Guarulhos, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, Brasil" landuse industrial 0.3 Brasil FALSE
+saao br Americas South America FALSE 2 2021-02-03 258424944 relation "São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, Brasil" boundary administrative 0.686174911942028 Brasil FALSE
+ssa br Americas South America FALSE 2 2021-02-03 257989248 relation "Salvador, Região Geográfica Imediata de Salvador, Região Metropolitana de Salvador, Região Geográfica Intermediária de Salvador, Bahia, Região Nordeste, Brasil" boundary administrative 0.581639551877681 Brasil FALSE
+transocean br Americas South America FALSE 2 2021-02-03 158079760 way "Transocean, Macaé, Região Geográfica Imediata de Macaé-Rio das Ostras, Região Geográfica Intermediária de Macaé-Rio das Ostras-Cabo Frio, Rio de Janeiro, Região Sudeste, 27925-290, Brasil" landuse industrial 0.3 Brasil FALSE
+ufmg br Americas South America FALSE 2 2021-02-03 258485573 relation "Campus UFMG, Pampulha, Belo Horizonte, Microrregião Belo Horizonte, Região Metropolitana de Belo Horizonte, Minas Gerais, Região Sudeste, 31270-901, Brasil" boundary administrative 0.35 Brasil FALSE
+fish department bo Americas South America FALSE 2 2021-02-03 259568738 relation "Isla del Pescado, Canton Caquena, Municipio Tahua, Provincia Daniel Campos, PotosÃ, Bolivia" place island 0.220860870373788 Bolivia FALSE
+ocean sciences bm Americas Northern America FALSE 2 2021-02-03 134000033 way "Bermuda Institute of Ocean Sciences, Biological Station, Saint George's, GE03, Bermuda" amenity university 0.487418940697571 Bermuda FALSE
+burundi bi Africa Eastern Africa FALSE 2 2021-02-03 257886094 relation Burundi boundary administrative 0.759633388730087 Burundi FALSE
+deloitte bi Africa Eastern Africa FALSE 2 2021-02-03 168988264 way "DELOITTE, Kabondo, Mukaza, Bujumbura Mairie, Burundi" landuse commercial 0.3 Burundi FALSE
+bulgarian academy of sciences bg Europe Eastern Europe FALSE 2 2021-02-03 259375000 relation "БългарÑ<81>ка академиÑ<8f> на науките (БÐ<90>Ð<9d>), 1, 15-ти Ð<9d>оември, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1040, БългaриÑ<8f>" amenity research_institute 0.482632410251413 БългaриÑ<8f> FALSE
+council of ministers bg Europe Eastern Europe FALSE 2 2021-02-03 126237485 way "МиниÑ<81>терÑ<81>ки Ñ<81>ъвет, 1, бул. КнÑ<8f>з Ð<90>лекÑ<81>андър Дондуков, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1000, БългaриÑ<8f>" office government 0.001 БългaриÑ<8f> FALSE
+council of the european union be Europe Western Europe FALSE 2 2021-02-03 75256623 node "Council of the European Union, 175, Rue de la Loi - Wetstraat, Quartier européen - Europese Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1048, België / Belgique / Belgien" office government 1.04458004666179 België / Belgique / Belgien FALSE
+erasmus medical center be Europe Western Europe FALSE 2 2021-02-03 314840 node "Erasme - Erasmus, Route de Lennik - Lennikse Baan, Anderlecht, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1070, België / Belgique / Belgien" railway station 0.444585942469205 België / Belgique / Belgien FALSE
+nsac be Europe Western Europe FALSE 2 2021-02-03 101563927 way "NSAC, Nieuwpoortsesteenweg, Raversijde, Oostende, West-Vlaanderen, Vlaanderen, 8400, België / Belgique / Belgien" building yes 0.101 België / Belgique / Belgien FALSE
+royal belgian institute of natural sciences be Europe Western Europe FALSE 2 2021-02-03 109874865 way "Institut royal des Sciences naturelles de Belgique - Koninklijk Belgisch Instituut voor Natuurwetenschappen, 29, Rue Vautier - Vautierstraat, Espace Léopold - Leopoldruimte, Bruxelles / Brussel, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1000, België / Belgique / Belgien" amenity research_institute 0.53461374284578 België / Belgique / Belgien FALSE
+spd bd Asia Southern Asia FALSE 2 2021-02-03 183078064 way "সৈয়দপà§<81>র বিমানবনà§<8d>দর, Saidpur - Parbotipur Road, সৈয়দপà§<81>র উপজেলা, নীলফামারী জেলা, 5310, বাংলাদেশ" aeroway aerodrome 0.297085518539193 বাংলাদেশ FALSE
+barbados bb Americas Caribbean FALSE 2 2021-02-03 258050720 relation Barbados boundary administrative 0.759547412593721 Barbados FALSE
+society bb Americas Caribbean FALSE 2 2021-02-03 82341924 node "Society, Massiah Street, Saint John, BB18003, Barbados" place hamlet 0.35 Barbados FALSE
+abc au Oceania Australia and New Zealand FALSE 2 2021-02-03 154556170 way "Australian Broadcasting Corporation, 114, Grey Street, South Bank, South Brisbane, Brisbane City, Queensland, 4101, Australia" building yes 0.589492484386201 Australia FALSE
+advisory council au Oceania Australia and New Zealand FALSE 2 2021-02-03 82359808 node "Weekes Accounting & Advisory, 211, George Street, Bathurst, Bathurst Regional Council, New South Wales, 2795, Australia" office accountant 0.201 Australia FALSE
+australian antarctic division au Oceania Australia and New Zealand FALSE 2 2021-02-03 101676576 way "Australian Antarctic Division, Kingston, Hobart, Kingborough, Tasmania, Australia" landuse commercial 0.5 Australia FALSE
+australian bureau of meteorology au Oceania Australia and New Zealand FALSE 2 2021-02-03 96874627 way "The Australian Bureau of Meteorology Building, 700, Collins Street, Batman's Hill, Docklands, South Wharf, City of Melbourne, Victoria, 3008, Australia" building yes 0.401 Australia FALSE
+australian institute of marine science au Oceania Australia and New Zealand FALSE 2 2021-02-03 174039789 way "Australian Institute of Marine Science, Cape Cleveland Road, Cape Cleveland, Townsville City, Queensland, Australia" office research 0.501 Australia FALSE
+charles sturt university in wagga wagga au Oceania Australia and New Zealand FALSE 2 2021-02-03 258986170 relation "Charles Sturt University, Wagga Wagga City Council, New South Wales, 2678, Australia" boundary administrative 0.75 Australia FALSE
+cjd au Oceania Australia and New Zealand FALSE 2 2021-02-03 78556896 node "CJD, 210, Northbourne Road, Campbellfield, City of Hume, Victoria, 3062, Australia" building yes 0.101 Australia FALSE
+department of science and innovation au Oceania Australia and New Zealand FALSE 2 2021-02-03 66634213 node "Department of Industry, Innovation and Science, 10, Binara Street, City, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia" office government 0.501 Australia FALSE
+global alliance au Oceania Australia and New Zealand FALSE 2 2021-02-03 146534335 way "OneSchool Global (Perth Campus), Alliance Loop, Willetton, City Of Canning, Western Australia, 6155, Australia" amenity school 0.201 Australia FALSE
+global change institute au Oceania Australia and New Zealand FALSE 2 2021-02-03 149247325 way "Global Change Institute, Campbell Place, St Lucia, Brisbane City, Queensland, Australia" building university 0.301 Australia FALSE
+isa au Oceania Australia and New Zealand FALSE 2 2021-02-03 872993 node "Mount Isa Airport, Barkly Highway, Kalkadoon, Mount Isa, Mount Isa City, Queensland, 4825, Australia" aeroway aerodrome 0.496970989529109 Australia FALSE
+james cook university in cairns au Oceania Australia and New Zealand FALSE 2 2021-02-03 137903302 way "James Cook University, 14-88, McGregor Road, Smithfield, Cairns Regional, Queensland, 4878, Australia" amenity university 0.82561814389347 Australia FALSE
+nra au Oceania Australia and New Zealand FALSE 2 2021-02-03 1301653 node "Narrandera-Leeton Airport, Irrigation Way, Cudgel, Narrandera, Narrandera Shire Council, New South Wales, 2703, Australia" aeroway aerodrome 0.391635072114972 Australia FALSE
+queensland brain institute au Oceania Australia and New Zealand FALSE 2 2021-02-03 103375921 way "Queensland Brain Institute, Research Road, St Lucia, Brisbane City, Queensland, 4072, Australia" building university 0.301 Australia FALSE
+red cross au Oceania Australia and New Zealand FALSE 2 2021-02-03 200522594 way "Australian Red Cross Blood Bank, 100-154, Batman Street, West Melbourne, Melbourne, City of Melbourne, Victoria, 3003, Australia" office ngo 0.577343921991154 Australia FALSE
+sea grant au Oceania Australia and New Zealand FALSE 2 2021-02-03 38783636 node "Sea Coast Hill, The District Council of Grant, South Australia, Australia" natural peak 0.5 Australia FALSE
+university of canberra au Oceania Australia and New Zealand FALSE 2 2021-02-03 95127906 way "University of Canberra, University Drive, Bruce, District of Belconnen, Australian Capital Territory, 2617, Australia" amenity university 0.731727684347105 Australia FALSE
+university of central america au Oceania Australia and New Zealand FALSE 2 2021-02-03 702491 node "Southern Cross University Coffs Harbour Campus, Doug Knight Drive, Coffs Harbour, Coffs Harbour City Council, New South Wales, 2450, Australia" amenity university 0.201 Australia FALSE
+university of southern queensland au Oceania Australia and New Zealand FALSE 2 2021-02-03 102275969 way "University of Southern Queensland, West Street, Kearneys Spring, Toowoomba, Toowoomba Regional, Queensland, 4350, Australia" amenity university 0.401 Australia FALSE
+university of technology sydney au Oceania Australia and New Zealand FALSE 2 2021-02-03 259286837 relation "University of Technology Sydney, Goold Street, Chippendale, Sydney, Council of the City of Sydney, New South Wales, 2008, Australia" amenity university 0.822968236493861 Australia FALSE
+austrian academy of sciences at Europe Western Europe FALSE 2 2021-02-03 119966043 way "Österreichische Akademie der Wissenschaften, Institut für Weltraumforschung, 6, Schmiedlstraße, Messendorfberg, Sankt Peter, Graz, Steiermark, 8042, Österreich" amenity public_building 0.001 Österreich FALSE
+eib at Europe Western Europe FALSE 2 2021-02-03 97328818 way "Umspannwerk Eibesbrunn, Eibesbrunn, Gemeinde Großebersdorf, Bezirk Mistelbach, Niederösterreich, 2203, Österreich" landuse industrial 0.3 Österreich FALSE
+institute of molecular pathology at Europe Western Europe FALSE 2 2021-02-03 172663383 way "Research Institute of Molecular Pathology (IMP), 1, Campus-Vienna-Biocenter, Neu Marx, KG Landstraße, Landstraße, Wien, 1030, Österreich" amenity research_institute 0.689701883147039 Österreich FALSE
+institute of science and technology austria at Europe Western Europe FALSE 2 2021-02-03 3201906 node "Institute of Science and Technology (IST Austria), Am Campus, Maria Gugging, Gemeinde Klosterneuburg, Bezirk Tulln, Niederösterreich, 3400, Österreich" amenity university 0.601 Österreich FALSE
+medical university of vienna at Europe Western Europe FALSE 2 2021-02-03 258409826 relation "Ehemalige I. Med. Univ. Klink, 18-20, Michelbeuern, KG Alsergrund, Alsergrund, Wien, 1090, Österreich" landuse brownfield 0.2 Österreich FALSE
+university of graz at Europe Western Europe FALSE 2 2021-02-03 111433427 way "Institut für Amerikanistik, Karl-Franzens-Universität Graz, 25, Attemsgasse, Univiertel, Geidorf, Graz, Steiermark, 8010, Österreich" building university 0.101 Österreich FALSE
+giudice ar Americas South America FALSE 2 2021-02-03 108561010 way "Giudice, Paraná, Municipio de Paraná, Distrito Sauce, Departamento Paraná, Entre RÃos, E3104HMA, Argentina" highway residential 0.2 Argentina FALSE
+cnn ao Africa Middle Africa FALSE 2 2021-02-03 257882605 relation "Cunene, Angola" boundary administrative 0.473432996069115 Angola FALSE
+svp ao Africa Middle Africa FALSE 2 2021-02-03 214275822 way "Aeroporto de CuÃto, EN250;EN140, CuÃto, Bié, Angola" aeroway aerodrome 0.329555066820797 Angola FALSE
+albania al Europe Southern Europe FALSE 2 2021-02-03 258008970 relation Shqipëria boundary administrative 0.727911798893737 Shqipëria FALSE
+ias ae Asia Western Asia FALSE 2 2021-02-03 258381607 relation "جزيرة ياس, أبوظبي, أبو ظبي, الإمارات العربية المتØدة" place island 0.392592281336849 الإمارات العربية المتØدة FALSE
+rochester institute of technology ae Asia Western Asia FALSE 2 2021-02-03 46292016 node "Rochester Institute of Technology, شارع الشيخ Ù…Øمد بن زايد, المدينة الدولية, دبي, 341296, الإمارات العربية المتØدة" building public 0.633228686818865 الإمارات العربية المتØدة FALSE
+national university of science and technology zw Africa Eastern Africa FALSE 1 2021-02-03 182853582 way "National University of Science & Technology, Cecil Avenue, Bulawayo, Bulawayo Province, Zimbabwe" amenity university 0.748092083018094 Zimbabwe FALSE
+vfa zw Africa Eastern Africa FALSE 1 2021-02-03 156186847 way "Victoria Falls International Airport, A8, Hwange, Matabeleland North, Zimbabwe" aeroway aerodrome 0.322405775434826 Zimbabwe FALSE
+front national party zm Africa Eastern Africa FALSE 1 2021-02-03 60650639 node "Patrotic Front Party Office, D79, Mwense, Mwense District, Luapula Province, P.O BOX 760001 MWENSE, Zambia" office political_party 0.201 Zambia FALSE
+university of zambia zm Africa Eastern Africa FALSE 1 2021-02-03 259195591 relation "University of Zambia (UNZA), 32379, Great East Road, Handsworth Park, Lusaka, Lusaka District, Lusaka Province, 10101, Zambia" amenity university 0.649871957480668 Zambia FALSE
+africa health research institute za Africa Southern Africa FALSE 1 2021-02-03 54489356 node "Africa Health Research Institute, 719, Umbilo Road, Carrington Heights, eThekwini Ward 33, Durban, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4001, South Africa" amenity school 0.401 South Africa FALSE
+association za Africa Southern Africa FALSE 1 2021-02-03 98557179 way "Association, Homevale, Sol Plaatje Ward 3, Kimberley, Frances Baard District Municipality, Northern Cape, South Africa" highway residential 0.2 South Africa FALSE
+cape peninsula university of technology za Africa Southern Africa FALSE 1 2021-02-03 203129734 way "Navarre, Cummings Street, Berg en Dal, Drakenstein Ward 2, Berg en Dal, Drakenstein Local Municipality, Cape Winelands District Municipality, Western Cape, 7655, South Africa" tourism hostel 0.101 South Africa FALSE
+council for scientific and industrial research za Africa Southern Africa FALSE 1 2021-02-03 180353667 way "CSIR Building 33;Council for Scientific and Industrial Research, Yellowwood Street, Scientia, Tshwane Ward 46, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0040, South Africa" amenity university 0.601 South Africa FALSE
+council of higher education za Africa Southern Africa FALSE 1 2021-02-03 7467290 node "Council on higher education, 1, Quentin Brand Street, Persequor Technopark, Tshwane Ward 46, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0020, South Africa" office yes 0.401 South Africa FALSE
+council of scientific and industrial za Africa Southern Africa FALSE 1 2021-02-03 180353667 way "CSIR Building 33;Council for Scientific and Industrial Research, Yellowwood Street, Scientia, Tshwane Ward 46, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0040, South Africa" amenity university 0.501 South Africa FALSE
+cpt za Africa Southern Africa FALSE 1 2021-02-03 106046279 way "Cape Town International Airport, New Eisleben Road, Crossroads, Cape Town Ward 36, City of Cape Town, Western Cape, 7490, South Africa" aeroway aerodrome 0.434462489654698 South Africa FALSE
+de vries za Africa Southern Africa FALSE 1 2021-02-03 101129802 way "De Vries, Newton-Wes, Newtown-Wes, Drakenstein Local Municipality, Cape Winelands District Municipality, Western Cape, 7654, South Africa" highway residential 0.3 South Africa FALSE
+defence department za Africa Southern Africa FALSE 1 2021-02-03 182271634 way "Department of Defence, Rigel Avenue South, Erasmuskloof, Tshwane Ward 83, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0048, South Africa" office government 0.600038865094841 South Africa FALSE
+dell za Africa Southern Africa FALSE 1 2021-02-03 721242 node "The Dell, Tokai, City of Cape Town, Western Cape, 7945, South Africa" place suburb 0.375 South Africa FALSE
+department of defence za Africa Southern Africa FALSE 1 2021-02-03 182271634 way "Department of Defence, Rigel Avenue South, Erasmuskloof, Tshwane Ward 83, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0048, South Africa" office government 0.700038865094841 South Africa FALSE
+durban university of technology za Africa Southern Africa FALSE 1 2021-02-03 136500786 way "Durban University of Technology Indumiso Campus, Mthombothi Road, Slangspruit, Msunduzi Ward 19, Pietermaritzburg, Msunduzi Local Municipality, uMgungundlovu District Municipality, KwaZulu-Natal, 3200, South Africa" amenity university 0.401 South Africa FALSE
+eskom za Africa Southern Africa FALSE 1 2021-02-03 119951369 way "Eskom, Sol Plaatje Ward 28, Kimberley, Frances Baard District Municipality, Northern Cape, South Africa" landuse industrial 0.3 South Africa FALSE
+fish hoek za Africa Southern Africa FALSE 1 2021-02-03 258440959 relation "Fish Hoek, City of Cape Town, Western Cape, South Africa" place town 0.5 South Africa FALSE
+gfz za Africa Southern Africa FALSE 1 2021-02-03 123536145 way "GFZ, R356, Karoo Hoogland Ward 3, Karoo Hoogland Local Municipality, Namakwa District Municipality, Northern Cape, South Africa" building yes 0.101 South Africa FALSE
+higher education south africa za Africa Southern Africa FALSE 1 2021-02-03 241460340 way "Embury Institute for Higher Education, Silverton Road, Musgrave, eThekwini Ward 31, Durban, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4001, South Africa" amenity university 0.401 South Africa FALSE
+jacobs za Africa Southern Africa FALSE 1 2021-02-03 704227 node "Jacobs, eThekwini Ward 75, Durban, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4052, South Africa" place suburb 0.375 South Africa FALSE
+klaas post za Africa Southern Africa FALSE 1 2021-02-03 132193285 way "Klaas, Zolani, Langeberg Ward 10, Langeberg Local Municipality, Cape Winelands District Municipality, Western Cape, South Africa" highway residential 0.2 South Africa FALSE
+kwazulu-natal sharks board za Africa Southern Africa FALSE 1 2021-02-03 54691458 node "Kwazulu-Natal Sharks Board, Herrwood Drive, Westridge, eThekwini Ward 35, Umhlanga Rocks, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4319, South Africa" tourism attraction 0.401 South Africa FALSE
+mangosuthu university of technology za Africa Southern Africa FALSE 1 2021-02-03 205967123 way "Mangosuthu University of Technology, 1706 Street, Isipingo, eThekwini Ward 89, Umlazi, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4066, South Africa" amenity university 0.697580560553068 South Africa FALSE
+metropolitan municipality za Africa Southern Africa FALSE 1 2021-02-03 107180662 way "The Metropolitan, Johannesburg Ward 64, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" landuse residential 0.4 South Africa FALSE
+nelson mandela university za Africa Southern Africa FALSE 1 2021-02-03 83078177 node "Nelson Mandela University, Bushbuck Road, Nelson Mandela Bay Ward 1, Port Elizabeth, Nelson Mandela Bay Metropolitan Municipality, Eastern Cape, 6001, South Africa" office company 0.301 South Africa FALSE
+nisar za Africa Southern Africa FALSE 1 2021-02-03 1162528 node "Nisar, Stegmann Street, East Lynne, Tshwane Ward 87, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0159, South Africa" shop supermarket 0.101 South Africa FALSE
+olympus za Africa Southern Africa FALSE 1 2021-02-03 726108 node "Olympus, Aganang Local Municipality, Capricorn District Municipality, Limpopo, South Africa" place town 0.4 South Africa FALSE
+pluto & ceres za Africa Southern Africa FALSE 1 2021-02-03 111213055 way "Pluto Street, Witzenberg Ward 3, Ceres, Witzenberg Local Municipality, Cape Winelands District Municipality, Western Cape, 6835, South Africa" highway residential 0.3 South Africa FALSE
+public library of sciences za Africa Southern Africa FALSE 1 2021-02-03 258298973 relation "Sciences, Constitution Street, Cape Town Ward 77, Cape Town, City of Cape Town, Western Cape, 7925, South Africa" building university 0.201 South Africa FALSE
+rhodes university za Africa Southern Africa FALSE 1 2021-02-03 116210497 way "Rhodes University, Allen Street, Makana Ward 8, Makhanda (Grahamstown), Makana Local Municipality, Sarah Baartman District Municipality, Eastern Cape, 6139, South Africa" amenity university 0.621665177399236 South Africa FALSE
+rooibos ltd za Africa Southern Africa FALSE 1 2021-02-03 50076730 node "Rooibos Ltd, Rooitee Avenue, Cederberg Ward 3, Clanwilliam, Cederberg Local Municipality, West Coast District Municipality, Western Cape, 8135, South Africa" shop tea 0.201 South Africa FALSE
+rsa za Africa Southern Africa FALSE 1 2021-02-03 258310948 relation South Africa boundary administrative 0.782907627703066 South Africa FALSE
+school of the coast za Africa Southern Africa FALSE 1 2021-02-03 119488567 way "School, Main, Laaiplek, Bergrivier Ward 6, Dwarskersbos, Bergrivier Local Municipality, West Coast District Municipality, Western Cape, 7365, South Africa" amenity school 0.201 South Africa FALSE
+south african national space agency za Africa Southern Africa FALSE 1 2021-02-03 48876053 node "South African National Space Agency, Mark Shuttleworth, Innovation Hub, Tshwane Ward 82, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0087, South Africa" office government 0.887075864564083 South Africa FALSE
+university of venda za Africa Southern Africa FALSE 1 2021-02-03 193237675 way "University of Venda, Agric, Thulamela Ward 36, Thohoyandou, Thulamela Local Municipality, Vhembe District Municipality, Limpopo, 0950, South Africa" amenity university 0.60799018260571 South Africa FALSE
+us ivy league za Africa Southern Africa FALSE 1 2021-02-03 220001773 way "Ivy League, 6, Cluver Road, Simonswyk, Stellenbosch Ward 7, Bo-Dalsig, Stellenbosch, Cape Winelands District Municipality, Western Cape, 7599, South Africa" building dormitory 0.201 South Africa FALSE
+wits university za Africa Southern Africa FALSE 1 2021-02-03 218343116 way "WITS University South Court, 40, Jorissen Street, Braamfontein, Johannesburg Ward 60, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa" building residential 0.201 South Africa FALSE
+ais ye Asia Western Asia FALSE 1 2021-02-03 12332501 node "العيص, مديرية المسيلة, Ù…ØاÙ<81>ظة المهرة, اليمن" place town 0.3 اليمن FALSE
+al-qaeda ye Asia Western Asia FALSE 1 2021-02-03 75395984 node "القضاء, المسالم, مديرية المدان, Ù…ØاÙ<81>ظة عمران, اليمن" place suburb 0.275 اليمن FALSE
+asim ye Asia Western Asia FALSE 1 2021-02-03 12526109 node "عاصم, مديرية خب والشعÙ<81>, Ù…ØاÙ<81>ظة الجوÙ<81>, اليمن" natural peak 0.3 اليمن FALSE
+assaf ye Asia Western Asia FALSE 1 2021-02-03 75461355 node "عسـاÙ<81>, ميلات, مديرية جبل Øبشي, Ù…ØاÙ<81>ظة تعز, اليمن" place hamlet 0.25 اليمن FALSE
+dhl ye Asia Western Asia FALSE 1 2021-02-03 12533753 node "دØÙ„, مديرية خب والشعÙ<81>, Ù…ØاÙ<81>ظة الجوÙ<81>, اليمن" place village 0.275 اليمن FALSE
+dmh ye Asia Western Asia FALSE 1 2021-02-03 74835575 node "ضمØ, مديرية مناخة, Ù…ØاÙ<81>ظة صنعاء, اليمن" place hamlet 0.25 اليمن FALSE
+faah ye Asia Western Asia FALSE 1 2021-02-03 74355990 node "Ù<81>اعة السÙ<81>لى, النائÙ<81>, مديرية قضاء خمر, Ù…ØاÙ<81>ظة عمران, اليمن" place hamlet 0.25 اليمن FALSE
+nabr ye Asia Western Asia FALSE 1 2021-02-03 12269571 node "Øبر, مديرية ساقين, Ù…ØاÙ<81>ظة صعدة, اليمن" place village 0.275 اليمن FALSE
+office of health ye Asia Western Asia FALSE 1 2021-02-03 57114512 node "مكتب الصØØ©, شارع رداع, ذمار, مجمع المØاÙ<81>ظة, ذمار, مديرية مدينة ذمار, Ù…ØاÙ<81>ظة ذمار, اليمن" amenity doctors 0.001 اليمن FALSE
+kosovo xk NA NA FALSE 1 2021-02-03 258483176 relation Kosova / Kosovo boundary administrative 0.780306211882666 Kosova / Kosovo FALSE
+prn xk NA NA FALSE 1 2021-02-03 160024167 way "Aeroporti Ndërkombëtar i Prishtinës ""Adem Jashari"", Aeroporti, Vrellë e Goleshit, Komuna e Lipjanit / Opština Lipljan, 12050, Kosova / Kosovo" aeroway aerodrome 0.410428262396698 Kosova / Kosovo FALSE
+university of priština xk NA NA FALSE 1 2021-02-03 179041192 way "University for Business and Technology, Rexhep Krasniqi, Arbëri, Kalabria, Prishtinë, Komuna e Prishtinës / OpÅ¡tina PriÅ¡tina, 10000, Kosova / Kosovo" amenity university 0.201 Kosova / Kosovo FALSE
+japan international cooperation agency ws Oceania Polynesia FALSE 1 2021-02-03 301319209 way "Japan International Cooperation Agency, Main Beach Road, Apia, SÄ<81>moa" office foreign_national_agency 0.401 SÄ<81>moa FALSE
+barrick vu Oceania Melanesia FALSE 1 2021-02-03 68461868 node "Barrick, Sanma, Vanuatu" place village 0.375 Vanuatu FALSE
+pepsi vu Oceania Melanesia FALSE 1 2021-02-03 67666711 node "Pepsi, Luganville, Sanma, Vanuatu" place neighbourhood 0.35 Vanuatu FALSE
+cuc tran vn Asia South-Eastern Asia FALSE 1 2021-02-03 199887384 way "Chi cục Hải quan Móng Cái, Trần Phú, Thà nh phố Móng Cái, Việt Nam" landuse commercial 0.2 Việt Nam FALSE
+institute of plant protection vn Asia South-Eastern Asia FALSE 1 2021-02-03 230206488 way "Viện Bảo vệ Thá»±c váºt, Ngõ 68 Nông Lâm, PhÆ°á»<9d>ng Ä<90>ức Thắng, Quáºn Bắc Từ Liêm, Hà Ná»™i, 04, Việt Nam" amenity research_centre 0.001 Việt Nam FALSE
+neo vn Asia South-Eastern Asia FALSE 1 2021-02-03 3168841 node "Neo, Yên Dũng, Tỉnh Bắc Giang, Việt Nam" place town 0.4 Việt Nam FALSE
+oceanographic institute vn Asia South-Eastern Asia FALSE 1 2021-02-03 4007088 node "Oceanographic Institute of Nha Trang, Trần Phú, VÄ©nh TrÆ°á»<9d>ng, Nha Trang, Tỉnh Khánh Hòa, 652510, Việt Nam" tourism museum 0.201 Việt Nam FALSE
+oxford university clinical research unit vn Asia South-Eastern Asia FALSE 1 2021-02-03 234394315 way "Oxford University Clinical Research Unit, Ä<90>Æ°á»<9d>ng Huỳnh Mẫn Ä<90>ạt, PhÆ°á»<9d>ng 1, Quáºn 5, Thà nh phố Hồ Chà Minh, 72000, Việt Nam" building yes 0.501 Việt Nam FALSE
+politburo vn Asia South-Eastern Asia FALSE 1 2021-02-03 138890529 way "Nhà Há»<8d>p bá»™ ChÃnh trị, Phố Ông Ã<8d>ch Khiêm, Ä<90>iện Biên, PhÆ°á»<9d>ng Ä<90>iện Biên, Quáºn Ba Ä<90>ình, Hà Ná»™i, 100901, Việt Nam" building yes 0.001 Việt Nam FALSE
+tb vn Asia South-Eastern Asia FALSE 1 2021-02-03 258596011 relation "Tỉnh Thái Bình, Việt Nam" boundary administrative 0.503635282684637 Việt Nam FALSE
+u.n. vn Asia South-Eastern Asia FALSE 1 2021-02-03 81631376 node "U Na, Huyện MÆ°á»<9d>ng Tè, Tỉnh Lai Châu, Việt Nam" place hamlet 0.45 Việt Nam FALSE
+vale vn Asia South-Eastern Asia FALSE 1 2021-02-03 258322044 relation Việt Nam boundary administrative 0.751194527333514 Việt Nam FALSE
+myc ve Americas South America FALSE 1 2021-02-03 244232769 way "Aeropuerto Nacional Los Tacariguas, Carretera: Maracay - Valencia, Alezurca, Maracay, Parroquia Aguas Calientes, Municipio Diego Ibarra, Aragua, 2103, Venezuela" aeroway aerodrome 0.328369791841981 Venezuela FALSE
+simón bolívar university ve Americas South America FALSE 1 2021-02-03 125491265 way "Universidad Simón BolÃvar, Carretera: Hoyo de la Puerta - El Placer, Hoyo de La Puerta, Caracas, Parroquia Baruta, Municipio Baruta, Miranda, 1086, Venezuela" amenity university 0.201 Venezuela FALSE
+yanomami ve Americas South America FALSE 1 2021-02-03 256039598 way "Shabono Yanomami, Parroquia Alto Orinoco, Municipio Autònomo Alto Orinoco, Amazonas, Venezuela" place village 0.375 Venezuela FALSE
+food and agricultural organization uz Asia Central Asia FALSE 1 2021-02-03 51698085 node "ПродовольÑ<81>твеннаÑ<8f> и СельÑ<81>кохозÑ<8f>йÑ<81>твеннаÑ<8f> ОрганизациÑ<8f> ООÐ<9d> (ФÐ<90>О), 2, УниверÑ<81>итетÑ<81>каÑ<8f> улица, Yunusobod tumani, Salar, Qibray tumani, Toshkent Viloyati, 100140, OÊ»zbekiston" office government 0.001 OÊ»zbekiston FALSE
+food and agricultural organization of the united nations uz Asia Central Asia FALSE 1 2021-02-03 51698085 node "ПродовольÑ<81>твеннаÑ<8f> и СельÑ<81>кохозÑ<8f>йÑ<81>твеннаÑ<8f> ОрганизациÑ<8f> ООÐ<9d> (ФÐ<90>О), 2, УниверÑ<81>итетÑ<81>каÑ<8f> улица, Yunusobod tumani, Salar, Qibray tumani, Toshkent Viloyati, 100140, OÊ»zbekiston" office government 0.001 OÊ»zbekiston FALSE
+nuclear institute uz Asia Central Asia FALSE 1 2021-02-03 138409897 way "ИнÑ<81>титут Ñ<8f>дерной физики Ð<90>кадемии наук РеÑ<81>публики УзбекиÑ<81>тан, Xuroson ko'chasi, Mirzo Ulug‘bek tumani, Toshkent, Qibray tumani, Toshkent Viloyati, 100214, OÊ»zbekiston" office research 0.128160971568546 OÊ»zbekiston FALSE
+mpp uy Americas South America FALSE 1 2021-02-03 39550688 node "Movimiento de Participación Popular, 1368, Mercedes, Cordón, Montevideo, 11200, Uruguay" office political_party 0.280014158487789 Uruguay FALSE
+ocean doctor uy Americas South America FALSE 1 2021-02-03 146694002 way "Ocean Drive, Punta Del Este, Maldonado, 20100, Uruguay" landuse residential 0.3 Uruguay FALSE
+pti uy Americas South America FALSE 1 2021-02-03 166146214 way "Parque Tecnológico Industrial del Cerro, Tres Ombúes, Montevideo, Uruguay" landuse industrial 0.2 Uruguay FALSE
+'america first us Americas Northern America FALSE 1 2021-02-03 172127774 way "Bank of America Financial Center, 100, North Tryon Street, First Ward, 1st Ward, Charlotte, Mecklenburg County, North Carolina, 28202, United States" amenity bank 0.562086077089553 United States FALSE
+a123 systems us Americas Northern America FALSE 1 2021-02-03 149702337 way "A123 Systems, CBS Fox Drive, Livonia, Wayne County, Michigan, 48167-3958, United States" building yes 0.201 United States FALSE
+aaa us Americas Northern America FALSE 1 2021-02-03 159632298 way "AAA, 650, 2nd Street West, Sonoma, Sonoma County, California, 95476, United States" office insurance 0.5584454244094 United States FALSE
+abbott us Americas Northern America FALSE 1 2021-02-03 258779362 relation "Abbott, Hill County, Texas, 76621, United States" boundary administrative 0.53646269181841 United States FALSE
+abc news/ washington post us Americas Northern America FALSE 1 2021-02-03 169691814 way "Washington Boulevard, Newport News, Virginia, 23604, United States" highway secondary 0.3 United States FALSE
+abraxis us Americas Northern America FALSE 1 2021-02-03 205714967 way "Pharmacia & Pfizer & Abraxis, Carretera Militar, Florida Afuera, Barceloneta, Puerto Rico, 00617, United States" man_made works 0.101 United States FALSE
+academic board us Americas Northern America FALSE 1 2021-02-03 2617885 node "Middle School M256 Academic and Athletic Excellence, 154, West 93rd Street, Upper West Side, Manhattan Community Board 7, Manhattan, New York County, New York, 10025, United States" amenity school 0.201 United States FALSE
+academy of natural sciences us Americas Northern America FALSE 1 2021-02-03 171334462 way "Academy of Natural Sciences of Drexel University, 1900, Benjamin Franklin Parkway, Philadelphia, Philadelphia County, Pennsylvania, 19103, United States" tourism museum 0.786028263148971 United States FALSE
+acceleron us Americas Northern America FALSE 1 2021-02-03 169075485 way "24, Acceleron Pharma, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" landuse commercial 0.3 United States FALSE
+across mexico us Americas Northern America FALSE 1 2021-02-03 238602315 way "RMZ 1 Cut Across Road, San Juan County, New Mexico, United States" highway service 0.275 United States FALSE
+advanced bionics us Americas Northern America FALSE 1 2021-02-03 107738073 way "Advanced Bionics, Westinghouse Place, Santa Clarita, Los Angeles County, California, 91310, United States" building commercial 0.201 United States FALSE
+aerb us Americas Northern America FALSE 1 2021-02-03 259296849 relation "Nichols Arboretum, Ann Arbor, Washtenaw County, Michigan, United States" leisure park 0.316531580368862 United States FALSE
+aero-acoustic propulsion laboratory us Americas Northern America FALSE 1 2021-02-03 150820880 way "Aero-Acoustic Propulsion Laboratory, Road K, Brook Park, Cuyahoga County, Ohio, 44142, United States" building government 0.401 United States FALSE
+agency us Americas Northern America FALSE 1 2021-02-03 258146830 relation "Agency, Wapello County, Iowa, 52530, United States" boundary administrative 0.53283621062172 United States FALSE
+ai now institute us Americas Northern America FALSE 1 2021-02-03 73395982 node "AI Now Institute, West 12th Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10014, United States" office research 0.301 United States FALSE
+alaska department of natural resources us Americas Northern America FALSE 1 2021-02-03 29679173 node "Vitus Lake Cabin, Yakutat, Alaska, United States" tourism wilderness_hut 0.101 United States FALSE
+alaska fisheries science center us Americas Northern America FALSE 1 2021-02-03 300441187 way "University of Alaska Fairbanks School of Fisheries and Ocean Science, 17101, Point Lena Loop Road, NOAA Fisheries, Lena Beach, Juneau, Alaska, 99801, United States" building university 0.301 United States FALSE
+alexion pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 156694688 way "Alexion Pharmaceuticals, 100, South Frontage Road, Downtown, New Haven, New Haven County, Connecticut, 06519, United States" office company 0.201 United States FALSE
+allen brain institute us Americas Northern America FALSE 1 2021-02-03 176152346 way "Allen Institute for Brain Science, 615, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office research 0.301 United States FALSE
+alpert medical school us Americas Northern America FALSE 1 2021-02-03 259282365 relation "Warren Alpert Medical School, 222, Richmond Street, Jewelry District, Providence, Providence County, Rhode Island, 02903, United States" building office 0.301 United States FALSE
+alpha us Americas Northern America FALSE 1 2021-02-03 257837726 relation "Alpha, Warren County, New Jersey, United States" boundary administrative 0.458705675544455 United States FALSE
+alphastar us Americas Northern America FALSE 1 2021-02-03 64296768 node "AlphaStar, Pacific Coast Highway, Los Altos, Long Beach, Los Angeles County, California, 90804:90815, United States" office company 0.101 United States FALSE
+american academy of neurology us Americas Northern America FALSE 1 2021-02-03 127199908 way "American Academy of Neurology, Chicago Avenue South, Minneapolis, Hennepin County, Minnesota, 55415, United States" building yes 0.401 United States FALSE
+american association of science us Americas Northern America FALSE 1 2021-02-03 8123167 node "AAAS / Science, 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States" tourism attraction 0.201 United States FALSE
+american association of university women us Americas Northern America FALSE 1 2021-02-03 2978211 node "American Association of University Women, Connecticut Avenue Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States" building yes 0.501 United States FALSE
+american college of physicians us Americas Northern America FALSE 1 2021-02-03 2973429 node "American College of Physicians, 190, North Independence Mall West, Philadelphia, Philadelphia County, Pennsylvania, 19106, United States" amenity doctors 0.401 United States FALSE
+american diabetes association us Americas Northern America FALSE 1 2021-02-03 3050591 node "American Diabetes Association Building, Penn Center Boulevard, Penn Center East, Oak Hill, Wilkins Township, Allegheny County, Pennsylvania, 15145, United States" building yes 0.301 United States FALSE
+american institute of physics in college park us Americas Northern America FALSE 1 2021-02-03 210348591 way "American Institute of Physics, 500, Sunnyside Boulevard, Oyster Bay, Nassau County, New York, 11797, United States" building university 0.501 United States FALSE
+american meteorological society us Americas Northern America FALSE 1 2021-02-03 80718663 node "American Meteorological Society, 45, Beacon Street, Downtown Crossing, Beacon Hill, Boston, Suffolk County, Massachusetts, 02108, United States" office association 0.301 United States FALSE
+american southwest us Americas Northern America FALSE 1 2021-02-03 131418716 way "American, Bounce, Midland, Midland County, Texas, United States" highway service 0.175 United States FALSE
+american superconductor us Americas Northern America FALSE 1 2021-02-03 140147943 way "American Superconductor, 64, Jackson Road, Devens, Harvard, Worcester County, Massachusetts, 01434, United States" building industrial 0.201 United States FALSE
+american university washington college of law us Americas Northern America FALSE 1 2021-02-03 106829662 way "American University- Washington College of Law, Tenley Circle Northwest, Tenleytown, American University Park, Washington, District of Columbia, 20016-2137, United States" amenity university 0.601 United States FALSE
+amgen of thousand oaks us Americas Northern America FALSE 1 2021-02-03 178550546 way "Amgen, Thousand Oaks, Ventura County, California, United States" landuse industrial 0.5 United States FALSE
+ancestry.com us Americas Northern America FALSE 1 2021-02-03 183450633 way "Ancestry.com, Carterville Trail, Riverbottoms, Provo, Utah County, Utah, 84604, United States" building commercial 0.201 United States FALSE
+ann & robert h. lurie children's hospital of chicago us Americas Northern America FALSE 1 2021-02-03 102467870 way "Ann & Robert H. Lurie Children's Hospital, 225, East Chicago Avenue, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States" amenity hospital 1.04352463088163 United States FALSE
+another house us Americas Northern America FALSE 1 2021-02-03 42793507 node "Another, 9500, Gilman Drive, University Center, San Diego, San Diego County, California, 92092, United States" tourism artwork 0.101 United States FALSE
+antarctic marine geology research facility us Americas Northern America FALSE 1 2021-02-03 145738961 way "Antarctic Marine Geology Research Facility, Academic Way, Tallahassee, Leon County, Florida, 32306, United States" building university 0.501 United States FALSE
+apache point observatory us Americas Northern America FALSE 1 2021-02-03 100736830 way "Apache Point Observatory, Otero County, New Mexico, United States" landuse observatory 0.777953726983006 United States FALSE
+applied physics laboratory us Americas Northern America FALSE 1 2021-02-03 258543667 relation "Henderson Hall, 1013, Northeast Lincoln Way, University District, Seattle, King County, Washington, 98105-6286, United States" building yes 0.001 United States FALSE
+arch street us Americas Northern America FALSE 1 2021-02-03 87129318 way "Arch Street, Northwest Triangle, York, York County, Pennsylvania, 17403, United States" highway tertiary 0.3 United States FALSE
+archbold biological station us Americas Northern America FALSE 1 2021-02-03 259248207 relation "Archbold Biological Station, Highlands County, Florida, United States" boundary protected_area 0.425 United States FALSE
+arf us Americas Northern America FALSE 1 2021-02-03 246438766 way "ARF, Marian View Drive, Idyllwild, Riverside County, California, 92549, United States" amenity animal_shelter 0.101 United States FALSE
+argonne us Americas Northern America FALSE 1 2021-02-03 396960 node "Argonne, Town of Argonne, Forest County, Wisconsin, 54511, United States" place village 0.356321943137092 United States FALSE
+armstrong us Americas Northern America FALSE 1 2021-02-03 258347195 relation "Armstrong County, Texas, 79019, United States" boundary administrative 0.653833128209837 United States FALSE
+asia society us Americas Northern America FALSE 1 2021-02-03 156760684 way "Asia Society, Park Avenue, Carnegie Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10021, United States" tourism museum 0.600038865094841 United States FALSE
+astronomical observatory us Americas Northern America FALSE 1 2021-02-03 88928538 way "Astronomical Observatory, Caddo Parish, Louisiana, United States" highway residential 0.3 United States FALSE
+astronomical observatory of milan us Americas Northern America FALSE 1 2021-02-03 41593478 node "Astronomical Observatory, Cats Path, Academic Core, University of Kentucky, Lexington, Fayette County, Kentucky, 40506, United States" man_made tower 0.301 United States FALSE
+at&t us Americas Northern America FALSE 1 2021-02-03 146631567 way "AT&T, 1302, North Tustin Street, Orange, Orange County, California, 92867, United States" shop mobile_phone 0.780778860724176 United States FALSE
+audubon alaska us Americas Northern America FALSE 1 2021-02-03 86079238 way "Audubon Drive, Anchorage, Alaska, 99516, United States" highway residential 0.3 United States FALSE
+aurora flight sciences us Americas Northern America FALSE 1 2021-02-03 109389915 way "Orbital Sciences Corporation Launch Systems Group L-1011 Flight Operations, 17143, Avtel Street, Mojave, Kern County, California, 93501, United States" building yes 0.201 United States FALSE
+awm us Americas Northern America FALSE 1 2021-02-03 3175077 node "West Memphis Municipal Airport, South College Boulevard, West Memphis, Crittenden County, Arkansas, 72301, United States" aeroway aerodrome 0.233228686818865 United States FALSE
+axial us Americas Northern America FALSE 1 2021-02-03 378998 node "Axial, Moffat County, Colorado, United States" place hamlet 0.35 United States FALSE
+b612 foundation of mill valley us Americas Northern America FALSE 1 2021-02-03 80081794 node "B612 Foundation, 20, Sunnyside Avenue, Mill Valley, Marin County, California, 94941, United States" office foundation 0.401 United States FALSE
+babcock us Americas Northern America FALSE 1 2021-02-03 257473949 way "Babcock, Miller County, Georgia, United States" boundary administrative 0.45 United States FALSE
+balearics us Americas Northern America FALSE 1 2021-02-03 168510467 way "Balearics Drive, Saint Augustine Shores, St. Augustine Shores, St. Johns County, Florida, 32086, United States" highway residential 0.2 United States FALSE
+ball aerospace us Americas Northern America FALSE 1 2021-02-03 249881855 way "Ball Aerospace, 48th Street, Boulder, Boulder County, Colorado, 80303-1229, United States" office company 0.201 United States FALSE
+bantam us Americas Northern America FALSE 1 2021-02-03 259427115 relation "Bantam, Litchfield, Litchfield County, Connecticut, United States" boundary administrative 0.413940046679794 United States FALSE
+barnard college us Americas Northern America FALSE 1 2021-02-03 100812162 way "Barnard College, Reunion Plaza, Morningside Heights, Manhattan Community Board 9, Manhattan, New York County, New York, United States" amenity university 0.708762447831959 United States FALSE
+baruch college us Americas Northern America FALSE 1 2021-02-03 105392869 way "Baruch College, Kelly Drive, Suffolk County, New York, 11794, United States" building dormitory 0.201 United States FALSE
+bassett medical center us Americas Northern America FALSE 1 2021-02-03 209192057 way "Bassett Medical Center, 1, Atwell Road, Cooperstown, Town of Otsego, Otsego County, New York, 13326, United States" amenity hospital 0.507534521399027 United States FALSE
+battelle memorial institute us Americas Northern America FALSE 1 2021-02-03 194506873 way "Battelle Memorial Institute, 505, King Avenue, University District District 4, Columbus, Franklin, Ohio, 43201, United States" building office 0.66833684603196 United States FALSE
+baystate medical center us Americas Northern America FALSE 1 2021-02-03 198191111 way "Baystate Medical Center, 759, Chestnut Street, North End, Springfield, Hampden County, Massachusetts, 01199, United States" amenity hospital 0.528876356713622 United States FALSE
+beagle us Americas Northern America FALSE 1 2021-02-03 377197 node "Beagle, Miami County, Kansas, United States" place hamlet 0.35 United States FALSE
+beaumont health us Americas Northern America FALSE 1 2021-02-03 240362052 way "Beaumont Health, 26901, Beaumont Boulevard, Southfield, Oakland County, Michigan, 48033, United States" building commercial 0.201 United States FALSE
+bellatrix us Americas Northern America FALSE 1 2021-02-03 213865135 way "Bellatrix, Altair, Orange County Great Park, Irvine, Orange County, California, 92619, United States" highway residential 0.2 United States FALSE
+belle ii us Americas Northern America FALSE 1 2021-02-03 294506250 way "2, Belle, San Juan County, Washington, 98279, United States" place house 0.101 United States FALSE
+berkeley center us Americas Northern America FALSE 1 2021-02-03 118620616 way "Berkeley Center, 3000, North Lemon Street, Downtown Fullerton, Fullerton, Orange County, California, 92832, United States" building yes 0.201 United States FALSE
+berkley us Americas Northern America FALSE 1 2021-02-03 257341204 relation "Berkley, Boone County, Iowa, United States" boundary administrative 0.532062340731545 United States FALSE
+bidmc us Americas Northern America FALSE 1 2021-02-03 39717217 node "Blue Bikes - BIDMC - Brookline at Burlington St, Burlington Avenue, Audubon Square, Boston, Suffolk County, Massachusetts, 02215, United States" amenity bicycle_rental 0.101 United States FALSE
+big bear solar observatory us Americas Northern America FALSE 1 2021-02-03 124213771 way "Big Bear Solar Observatory, San Bernardino County, California, United States" landuse observatory 0.678015094618814 United States FALSE
+bigelow aerospace us Americas Northern America FALSE 1 2021-02-03 161499859 way "Bigelow Aerospace, LLC, 1899, West Brooks Avenue, North Las Vegas, Clark County, Nevada, 89032, United States" man_made works 0.60124284206117 United States FALSE
+bigelow aerospace of las vegas us Americas Northern America FALSE 1 2021-02-03 161499859 way "Bigelow Aerospace, LLC, 1899, West Brooks Avenue, North Las Vegas, Clark County, Nevada, 89032, United States" man_made works 0.80124284206117 United States FALSE
+biocurious us Americas Northern America FALSE 1 2021-02-03 20734454 node "BioCurious, Stewart Drive, Sunnyvale, Santa Clara County, California, 94088-3453, United States" leisure hackerspace 0.167710111330712 United States FALSE
+biogen idec us Americas Northern America FALSE 1 2021-02-03 249632722 way "Biogen Idec, 115, Broadway, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" building commercial 0.201 United States FALSE
+biohub us Americas Northern America FALSE 1 2021-02-03 297451046 relation "BioHub Boston, Waltham, Middlesex County, Massachusetts, United States" landuse commercial 0.3 United States FALSE
+black hills institute of geological research us Americas Northern America FALSE 1 2021-02-03 189013937 way "Black Hills Museum of Natural History, Main Street, Hill City, Pennington County, South Dakota, 57745, United States" tourism museum 0.490508362962683 United States FALSE
+bloom us Americas Northern America FALSE 1 2021-02-03 366194 node "Bloom, Ford County, Kansas, United States" place village 0.41356076917903 United States FALSE
+bloom energy us Americas Northern America FALSE 1 2021-02-03 301192108 node "Bloom Energy, 4353, North 1st Street, Alviso, San Jose, Santa Clara County, California, 95134, United States" office company 0.201 United States FALSE
+blue origin us Americas Northern America FALSE 1 2021-02-03 224462797 way "Blue Origin, Kent, King County, Washington, United States" landuse industrial 0.4 United States FALSE
+board us Americas Northern America FALSE 1 2021-02-03 435229 node "Board, Mason County, West Virginia, United States" place hamlet 0.35 United States FALSE
+board of regents us Americas Northern America FALSE 1 2021-02-03 213673109 way "Georgia Museum of Art, 90, Carlton Street, Athens-Clarke County Unified Government, Athens-Clarke County, Georgia, 30602, United States" tourism museum 0.380014158487789 United States FALSE
+boise state university us Americas Northern America FALSE 1 2021-02-03 187946735 way "Boise State University, South Broadway Avenue, Boise, Ada County, Idaho, 83735, United States" amenity university 0.744647217327514 United States FALSE
+border protection us Americas Northern America FALSE 1 2021-02-03 148436560 way "U.S. Customs and Border Protection, Ogdensburg, Saint Lawrence County, New York, United States" landuse commercial 0.4 United States FALSE
+boston common us Americas Northern America FALSE 1 2021-02-03 94132085 way "Boston Common, Beacon Hill, Boston, Suffolk County, Massachusetts, United States" leisure park 0.618142367209955 United States FALSE
+boston dynamics us Americas Northern America FALSE 1 2021-02-03 161862452 way "Boston Dynamics, 78, Fourth Avenue, Waltham, Middlesex County, Massachusetts, 02451, United States" office company 0.590005927058632 United States FALSE
+boston marathon us Americas Northern America FALSE 1 2021-02-03 80407008 node "Boston Marathon Memorial, Boylston Street, Newbury Street, Back Bay, Boston, Suffolk County, Massachusetts, 02116, United States" historic memorial 0.656343487668219 United States FALSE
+boston university school of law us Americas Northern America FALSE 1 2021-02-03 2695220 node "Boston University School of Law, Bay State Road, Audubon Square, Boston, Suffolk County, Massachusetts, 02215, United States" amenity school 0.501 United States FALSE
+bowling green state university us Americas Northern America FALSE 1 2021-02-03 258878654 relation "Bowling Green State University, 1001, East Wooster Street, Bentwood Estates, Bowling Green, Wood County, Ohio, 43403-0001, United States" amenity university 0.882362468990463 United States FALSE
+bradley university us Americas Northern America FALSE 1 2021-02-03 113901474 way "Bradley University, 1501, West Bradley Avenue, St. James Apartments, Peoria, Peoria County, Illinois, 61625, United States" amenity university 0.641769278273552 United States FALSE
+brain research institute us Americas Northern America FALSE 1 2021-02-03 133163876 way "Brain Research Institute, 670, Charles E Young Drive South, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity research_institute 0.301 United States FALSE
+brain science institute us Americas Northern America FALSE 1 2021-02-03 176152346 way "Allen Institute for Brain Science, 615, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office research 0.301 United States FALSE
+brenco us Americas Northern America FALSE 1 2021-02-03 82037986 node "Brenco, Walton Street, Pine Gardens, Petersburg, Virginia, 23805, United States" railway crossover 0.101 United States FALSE
+brent central us Americas Northern America FALSE 1 2021-02-03 259444301 relation "Brent, Bibb County, Alabama, 35034, United States" boundary administrative 0.522385266730329 United States FALSE
+brigham & women's hospital us Americas Northern America FALSE 1 2021-02-03 258770706 relation "Brigham and Women's Hospital, 75, Francis Street, Roxbury, Boston, Suffolk County, Massachusetts, 02115, United States" amenity hospital 0.77720861480317 United States FALSE
+broad and berkeley us Americas Northern America FALSE 1 2021-02-03 100963106 way "Broad Ax Branch, Berkeley County, South Carolina, United States" waterway stream 0.4 United States FALSE
+broad institute of m.i.t. us Americas Northern America FALSE 1 2021-02-03 97512477 way "Broad Institute, Charles Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02141, United States" building university 0.893012981942171 United States FALSE
+bronx zoo us Americas Northern America FALSE 1 2021-02-03 101896162 way "Bronx Zoo, Bronx River Parkway, The Bronx, Bronx County, New York, 10460, United States" tourism zoo 0.641531223132584 United States FALSE
+brookings us Americas Northern America FALSE 1 2021-02-03 258255410 relation "Brookings County, South Dakota, United States" boundary administrative 0.575721107070673 United States FALSE
+broomfield us Americas Northern America FALSE 1 2021-02-03 354302 node "Broomfield, City and County of Broomfield, Colorado, 80020, United States" place town 0.609273128324911 United States FALSE
+brothers us Americas Northern America FALSE 1 2021-02-03 2865253 node "The Brothers, Humboldt County, California, United States" place island 0.425 United States FALSE
+bryan cave us Americas Northern America FALSE 1 2021-02-03 54504450 node "Bryan Cave, 211 #3600, North Broadway, Downtown, City of Saint Louis, Missouri, 63102, United States" office lawyer 0.201 United States FALSE
+bryn mawr college us Americas Northern America FALSE 1 2021-02-03 116358987 way "Bryn Mawr College, Old Gulph Road, Lower Merion Township, Montgomery County, Pennsylvania, 19085, United States" amenity college 0.78287678963334 United States FALSE
+bti us Americas Northern America FALSE 1 2021-02-03 153377685 way "Barter Island Long Range Radar Site Airport, Pipsuk Avenue, Kaktovik, North Slope, Alaska, United States" aeroway aerodrome 0.242327847659036 United States FALSE
+bu us Americas Northern America FALSE 1 2021-02-03 258894158 relation "Boston University, Brighton Avenue, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134, United States" amenity university 0.582119069629869 United States FALSE
+bucknell university us Americas Northern America FALSE 1 2021-02-03 259556528 relation "Bucknell University, South 5th Street, Lewisburg, Union County, Pennsylvania, 17837, United States" amenity university 0.201 United States FALSE
+building opportunities for self-sufficiency us Americas Northern America FALSE 1 2021-02-03 68032222 node "BOSS, 1916;1918, University Avenue, Downtown Berkeley, Berkeley, Alameda County, California, 94704, United States" office ngo 0.101 United States FALSE
+butler hospital us Americas Northern America FALSE 1 2021-02-03 185761944 way "Butler Hospital, 345, Blackstone Boulevard, Blackstone, Providence, Providence County, Rhode Island, 02906-4800, United States" amenity hospital 0.453363019766637 United States FALSE
+calico us Americas Northern America FALSE 1 2021-02-03 330304 node "Calico, Kern County, California, 93250, United States" place locality 0.507681409931154 United States FALSE
+calif us Americas Northern America FALSE 1 2021-02-03 258350986 relation "California, United States" boundary administrative 0.912136384157707 United States FALSE
+california academy of science us Americas Northern America FALSE 1 2021-02-03 196077698 way "California Academy of Mathematics and Science, 1000, East Victoria Street, Carson, Los Angeles County, California, 90747, United States" amenity school 0.401 United States FALSE
+california department of forestry and fire protection us Americas Northern America FALSE 1 2021-02-03 102294799 way "Cal Fire (California Department of Forestry and Fire Protection) CZU Felton Headquarters, CA 9, Felton, Santa Cruz County, California, 95018-9704, United States" amenity fire_station 0.701 United States FALSE
+california department of public health us Americas Northern America FALSE 1 2021-02-03 178363904 way "California Department of Public Health, Capitol Avenue, Sacramento, Sacramento County, California, 95811, United States" building commercial 0.501 United States FALSE
+california medical facility us Americas Northern America FALSE 1 2021-02-03 213015691 way "California Medical Facility, 1600, California Drive, Vacaville, Solano County, California, 95696, United States" amenity prison 0.574532111506442 United States FALSE
+california polytechnic state university us Americas Northern America FALSE 1 2021-02-03 160705772 way "California Polytechnic State University, North Santa Rosa Street, San Luis Obispo, San Luis Obispo County, California, 93407-0283, United States" amenity university 0.877289721429052 United States FALSE
+california state university in chico us Americas Northern America FALSE 1 2021-02-03 96242249 way "California State University, Chico, 400, West 1st Street, Chico, Butte County, California, 95929, United States" amenity university 0.842852642190115 United States FALSE
+calvin college us Americas Northern America FALSE 1 2021-02-03 258188696 relation "Calvin, Cavalier County, North Dakota, United States" boundary administrative 0.48265030002841 United States FALSE
+canada-france-hawaii telescope us Americas Northern America FALSE 1 2021-02-03 102686691 way "Canada-France-Hawaii Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.773004776697036 United States FALSE
+canadian forest service us Americas Northern America FALSE 1 2021-02-03 259077830 relation "Canadian, Hemphill County, Texas, United States" boundary administrative 0.575446574770995 United States FALSE
+carnegie us Americas Northern America FALSE 1 2021-02-03 258387827 relation "Carnegie, Allegheny County, Pennsylvania, 15106, United States" boundary administrative 0.459613385609502 United States FALSE
+carnegie endowment for international peace us Americas Northern America FALSE 1 2021-02-03 2981835 node "The Carnegie Endowment for International Peace, Massachusetts Avenue Northwest, Dupont Circle and surrunding block, Dupont Circle, Washington, District of Columbia, 20036, United States" building yes 0.501 United States FALSE
+carnegie institution of washington dc us Americas Northern America FALSE 1 2021-02-03 106777669 way "Carnegie Institution Building, 1530, P Street Northwest, Logan Circle/Shaw, Dupont Circle, Washington, District of Columbia, 2005, United States" building yes 0.574617736328324 United States FALSE
+carnegie museum of natural history us Americas Northern America FALSE 1 2021-02-03 126423240 way "Carnegie Museum of Natural History, 4400, Forbes Avenue, North Oakland, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States" tourism museum 0.903846782985069 United States FALSE
+carnegies us Americas Northern America FALSE 1 2021-02-03 27489275 node "Carnegie's, 1600, Oregon Street, Redding, Shasta County, California, 96001, United States" amenity restaurant 0.001 United States FALSE
+carter center us Americas Northern America FALSE 1 2021-02-03 3094933 node "Carter Presidential Center, John Lewis Freedom Parkway Northeast, Linwood, Atlanta, Fulton County, Georgia, 30306 DASH4279, United States" tourism museum 0.201 United States FALSE
+carthage college us Americas Northern America FALSE 1 2021-02-03 181816840 way "Carthage College, 2001, Alford Park Drive, Kenosha, Kenosha County, Wisconsin, 53140, United States" amenity college 0.59394918828843 United States FALSE
+case western university us Americas Northern America FALSE 1 2021-02-03 115838150 way "Computing, Arts, Sciences and Education, University Drive, Miami-Dade County, Florida, 33199, United States" building university 0.101 United States FALSE
+cato institute us Americas Northern America FALSE 1 2021-02-03 159055081 way "Cato Center & Halsey Institute of Contemporary Art, Saint Phillip Street, Charleston, Charleston County, South Carolina, 29401, United States" building college 0.201 United States FALSE
+cca us Americas Northern America FALSE 1 2021-02-03 133975195 way "California College of the Arts, 8th Street, San Francisco, San Francisco City and County, California, 90103, United States" amenity university 0.417511672002615 United States FALSE
+ccdc us Americas Northern America FALSE 1 2021-02-03 103502726 way "Child Care Development Center, West Van Week Street, Edinburg, Hidalgo County, Texas, 78539, United States" building yes 0.001 United States FALSE
+ccri us Americas Northern America FALSE 1 2021-02-03 190410505 way "Community College of Rhode Island Liston Campus, 1, Hilton Street, Providence, Providence County, Rhode Island, 02905, United States" amenity college 0.001 United States FALSE
+cdb us Americas Northern America FALSE 1 2021-02-03 899163 node "Cold Bay Airport, North to South Apron Service Road, Cold Bay, Aleutians East, Alaska, 99571, United States" aeroway aerodrome 0.281311730611622 United States FALSE
+cdcr us Americas Northern America FALSE 1 2021-02-03 100211824 way "Prado Conservation Camp, 14467, Central Avenue, Chino, San Bernardino County, California, 91710, United States" amenity fire_station 0.001 United States FALSE
+cdw us Americas Northern America FALSE 1 2021-02-03 166168670 way "CDW, 200, North Milwaukee Avenue, Mellody Farm, Vernon Hills, Lake County, Illinois, 60061, United States" building commercial 0.430139264553753 United States FALSE
+center for astrophysics us Americas Northern America FALSE 1 2021-02-03 257732815 relation "Center for Astrophysics, 60, Observatory Access Road, Old Cambridge, Cambridge, Middlesex County, Massachusetts, 02138-2706, United States" building university 0.301 United States FALSE
+center for ethics us Americas Northern America FALSE 1 2021-02-03 78586365 node "Center for Applied Ethics, 221, 10th Avenue East, Menomonie, Dunn County, Wisconsin, 54751, United States" office research 0.301 United States FALSE
+center for genomics us Americas Northern America FALSE 1 2021-02-03 151793647 way "Center for Genomics and Systems Biology, 16, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States" building university 0.301 United States FALSE
+center for genomics and systems biology us Americas Northern America FALSE 1 2021-02-03 151793647 way "Center for Genomics and Systems Biology, 16, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States" building university 0.601 United States FALSE
+central laser facility us Americas Northern America FALSE 1 2021-02-03 228612591 way "Central Laser Facility, West 2500 South, Millard County, Utah, United States" man_made observatory 0.301 United States FALSE
+central washington university us Americas Northern America FALSE 1 2021-02-03 206740946 way "Central Washington University, East Vantage Highway, Ellensburg, Kittitas County, Washington, 98926, United States" amenity university 0.69394918828843 United States FALSE
+centre for northern studies us Americas Northern America FALSE 1 2021-02-03 2328806 node "Center for Northern Studies, Cross Road, Lamoille County, Vermont, United States" amenity school 0.301 United States FALSE
+cgs us Americas Northern America FALSE 1 2021-02-03 258450803 relation "College Park Airport, 1909, Corporal Frank Scott Drive, University of Maryland Research Park, Old Town, College Park, Prince George's County, Maryland, 20740, United States" aeroway aerodrome 0.290812406874276 United States FALSE
+chaco canyon us Americas Northern America FALSE 1 2021-02-03 90959436 way "Chaco Canyon, Cedar Park, Williamson County, Texas, 78613, United States" highway residential 0.3 United States FALSE
+chaffey college us Americas Northern America FALSE 1 2021-02-03 99601399 way "Chaffey College, Banyan Street, Rancho Cucamonga, San Bernardino County, California, 91737, United States" amenity college 0.549235472656649 United States FALSE
+channel islands us Americas Northern America FALSE 1 2021-02-03 259434584 relation "Channel Islands, Ventura County, California, 90704, United States" place archipelago 0.711550869264683 United States FALSE
+chapman university in orange us Americas Northern America FALSE 1 2021-02-03 258413846 relation "Chapman University, 1, University Drive, Orange, Orange County, California, 92866, United States" amenity university 0.732173490264596 United States FALSE
+charles stark draper laboratory us Americas Northern America FALSE 1 2021-02-03 98075251 way "The Charles Stark Draper Laboratory, Inc, 555, Technology Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" office research 0.401 United States FALSE
+chemosphere us Americas Northern America FALSE 1 2021-02-03 187794541 way "Chemosphere, 7776, Torreyson Drive, Hollywood Hills West, Los Angeles, Los Angeles County, California, 90046, United States" building house 0.354365194683011 United States FALSE
+chicago zoological society us Americas Northern America FALSE 1 2021-02-03 132582604 way "Brookfield Zoo, 8400, 31st Street, Brookfield, Proviso Township, Cook County, Illinois, 60513, United States" tourism zoo 0.319018527529768 United States FALSE
+children's cancer research institute us Americas Northern America FALSE 1 2021-02-03 157002637 way "Children's Cancer Research Institute, 8403, Floyd Curl Drive, South Texas Medical Center, San Antonio, Bexar County, Texas, 78229, United States" building yes 0.501 United States FALSE
+children's medical center us Americas Northern America FALSE 1 2021-02-03 96926132 way "Children's Medical Center of Dallas, 1935, Medical District Drive, Dallas, TX, Dallas, Dallas County, Texas, 75235, United States" amenity hospital 0.581472839091896 United States FALSE
+children's national medical center us Americas Northern America FALSE 1 2021-02-03 156002689 way "Children's National Medical Center, 111, Michigan Avenue Northwest, McMillan Filter Plant & Reservoir, Washington, District of Columbia, 20010, United States" amenity hospital 0.501 United States FALSE
+children's research institute us Americas Northern America FALSE 1 2021-02-03 134977531 way "Children's Research Institute (CRI), Mound Park Avenue South, Roser Park, St. Petersburg, Pinellas County, Florida, 33701, United States" building university 0.401 United States FALSE
+chrysler us Americas Northern America FALSE 1 2021-02-03 412742 node "Chrysler, Monroe County, Alabama, United States" place hamlet 0.35 United States FALSE
+cir us Americas Northern America FALSE 1 2021-02-03 99147609 way "Circle, Unorganized Borough, Alaska, United States" boundary administrative 0.472859588409935 United States FALSE
+circuit court us Americas Northern America FALSE 1 2021-02-03 20736035 node "Circuit Court, Maryland Avenue, Croydon Park, Rockville, Montgomery County, Maryland, 20850, United States" amenity courthouse 0.403130333992136 United States FALSE
+citadel us Americas Northern America FALSE 1 2021-02-03 195543970 way "The Citadel, 171, Moultrie Street, Charleston, Charleston County, South Carolina, 29409, United States" amenity university 0.531222267761364 United States FALSE
+clark university us Americas Northern America FALSE 1 2021-02-03 259488327 relation "Clark University, Rosslare Drive, Botany Bay, Columbus Park, Worcester, Worcester County, Massachusetts, 01602, United States" amenity university 0.660196767278603 United States FALSE
+cleveland biolabs us Americas Northern America FALSE 1 2021-02-03 192431632 way "Cleveland BioLabs, North Oak Street, Buffalo Niagara Medical Campus, Buffalo, Erie County, New York, 14209, United States" building yes 0.201 United States FALSE
+climate central us Americas Northern America FALSE 1 2021-02-03 78587650 node "Climate, 5282, Monahans Avenue, The Shops at Clearfork, Fort Worth, Tarrant County, Texas, 76109, United States" shop sports 0.101 United States FALSE
+climate home us Americas Northern America FALSE 1 2021-02-03 78587650 node "Climate, 5282, Monahans Avenue, The Shops at Clearfork, Fort Worth, Tarrant County, Texas, 76109, United States" shop sports 0.101 United States FALSE
+climate research us Americas Northern America FALSE 1 2021-02-03 137741682 way "NOAA Center for Weather and Climate Prediction, 5830, University Research Court, University of Maryland Research Park, College Park, Prince George's County, Maryland, 20740, United States" building office 0.201 United States FALSE
+clinical services us Americas Northern America FALSE 1 2021-02-03 258895288 relation "Clinical Services, East 18th Avenue, Eugene, Lane County, Oregon, 907403, United States" building university 0.201 United States FALSE
+clio us Americas Northern America FALSE 1 2021-02-03 257120514 relation "Clio, Wayne County, Iowa, 50052, United States" boundary administrative 0.531727684347105 United States FALSE
+clothing distribution center us Americas Northern America FALSE 1 2021-02-03 14884299 node "Beehive Clothing Distribution Center, Charmant Drive, La Jolla Colony, University City, San Diego, San Diego County, California, 92161, United States" shop clothes 0.301 United States FALSE
+cloud health us Americas Northern America FALSE 1 2021-02-03 192444442 way "Cloud County Health Center, 1100, Highland Drive, Concordia, Cloud County, Kansas, 66956, United States" amenity hospital 0.347788039106501 United States FALSE
+cmu us Americas Northern America FALSE 1 2021-02-03 258357673 relation "Carnegie Mellon University, Warwick Terrace, Squirrel Hill North, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States" amenity university 0.561734322664205 United States FALSE
+cobb institute us Americas Northern America FALSE 1 2021-02-03 153585197 way "Georgia Tech Research Institute Cobb County Research Facility South, 1941, Dixie Avenue Southeast, Smyrna, Cobb County, Georgia, 30080, United States" building yes 0.201 United States FALSE
+cohen commission us Americas Northern America FALSE 1 2021-02-03 103899851 way "Buffalo Building, 300; 302; 304; 306; 308; 310; 312, East Buffalo Street, Commission Row, Milwaukee, Milwaukee County, Wisconsin, 53202, United States" historic building 0.210430435186894 United States FALSE
+colgate university in hamilton us Americas Northern America FALSE 1 2021-02-03 172145457 way "Colgate University, Campus Footpaths, Hamilton, Town of Hamilton, Madison County, New York, 13346, United States" amenity university 0.777980138982284 United States FALSE
+collaborative research centre us Americas Northern America FALSE 1 2021-02-03 234889363 way "Biosciences Collaborative Laboratory, de France Avenue, Ames Research Center, Mountain View, Santa Clara County, California, 94035-0016, United States" building yes 0.201 United States FALSE
+college board us Americas Northern America FALSE 1 2021-02-03 184461788 way "College Board, Penn Street, Newtown Gate, Newtown Township, Bucks County, Pennsylvania, 189440, United States" building yes 0.201 United States FALSE
+college of american pathologists us Americas Northern America FALSE 1 2021-02-03 53752747 node "College Of American Pathologists, 325, Waukegan Road, Northfield, Northfield Township, Cook County, Illinois, 60093, United States" amenity college 0.401 United States FALSE
+college of public health us Americas Northern America FALSE 1 2021-02-03 102868021 way "College of Public Health, USF Banyan Circle, Tampa, Hillsborough County, Florida, 33612, United States" building yes 0.401 United States FALSE
+college of southern nevada us Americas Northern America FALSE 1 2021-02-03 112597747 way "College of Southern Nevada, Mosswood Drive, Henderson, Clark County, Nevada, 89015, United States" amenity college 0.401 United States FALSE
+college of william & mary us Americas Northern America FALSE 1 2021-02-03 259442397 relation "College of William and Mary, Compton Drive, Williamsburg, Williamsburg (city), Virginia, 23186, United States" amenity university 0.898687544181304 United States FALSE
+college of wooster us Americas Northern America FALSE 1 2021-02-03 162127042 way "College of Wooster, 1189, Beall Avenue, Wooster Public Square Historic District, Wooster, Wayne County, Ohio, 44691, United States" amenity college 0.72322557465216 United States FALSE
+colorado college us Americas Northern America FALSE 1 2021-02-03 258559117 relation "Colorado College, 14, East Cache la Poudre Street, Colorado Springs, El Paso County, Colorado, 80903, United States" amenity university 0.652672658024048 United States FALSE
+columbia hills us Americas Northern America FALSE 1 2021-02-03 246982992 way "Columbia Hills, Klickitat County, Washington, 98673, United States" natural mountain_range 0.5 United States FALSE
+columbia sportswear us Americas Northern America FALSE 1 2021-02-03 160437176 way "Columbia, 3, Monroe Parkway, Mountain Park, Lake Oswego, Metro, Oregon, 97035, United States" shop clothes 0.101 United States FALSE
+columbia university irving medical center us Americas Northern America FALSE 1 2021-02-03 121491710 way "Columbia University Irving Medical Center, 630, West 168th Street, Washington Heights, Manhattan Community Board 12, Manhattan, New York County, New York, 10031, United States" amenity hospital 0.855322560505529 United States FALSE
+columbia water center us Americas Northern America FALSE 1 2021-02-03 89099032 way "Columbia Rd 44, Tide Water, Columbia County, Arkansas, 71753, United States" highway residential 0.3 United States FALSE
+columbus us Americas Northern America FALSE 1 2021-02-03 258190114 relation "Columbus, Franklin, Ohio, United States" boundary administrative 0.729439910682055 United States FALSE
+colville us Americas Northern America FALSE 1 2021-02-03 257341974 relation "Colville, Stevens County, Washington, United States" boundary administrative 0.47774807032046 United States FALSE
+commercial spaceflight federation us Americas Northern America FALSE 1 2021-02-03 80658144 node "Commercial Spaceflight Federation, 1444, I Street Northwest, Downtown, Washington, District of Columbia, 20006, United States" office ngo 0.301 United States FALSE
+common fund us Americas Northern America FALSE 1 2021-02-03 56944182 node "Staunton Creative Community Fund, 10, Byers Street, Dogwood Hill, Staunton, Virginia, 24401, United States" office nonprofit 0.101 United States FALSE
+community and public sector union us Americas Northern America FALSE 1 2021-02-03 172957567 way "The Center for Community and Public Safety, University Drive, North Union Township, Fayette County, Pennsylvania, 15465, United States" building university 0.401 United States FALSE
+concordia university us Americas Northern America FALSE 1 2021-02-03 124004751 way "Concordia University, 2811, Northeast Holman Street, Concordia, Portland, Metro, Oregon, 97211, United States" amenity university 0.525928585624107 United States FALSE
+confederated tribes of the colville reservation us Americas Northern America FALSE 1 2021-02-03 38301258 node "Omak Lake Campground, North End Omak Lake Road, Okanogan County, Washington, United States" tourism camp_site 0.001 United States FALSE
+congress for the nih us Americas Northern America FALSE 1 2021-02-03 77612239 node "Betty McCollum for Congress, 661, Lasalle Street, St. Paul, Ramsey County, Minnesota, 55114, United States" office government 0.201 United States FALSE
+connecticut agricultural experiment station us Americas Northern America FALSE 1 2021-02-03 195858196 way "Connecticut Agricultural Experiment Station, 123, Prospect Hill Historic District, New Haven, New Haven County, Connecticut, 06504-1106, United States" landuse institutional 0.6 United States FALSE
+continental resources us Americas Northern America FALSE 1 2021-02-03 127263494 way "Continental Resources, 175, Ledge Street, Ward 4, Nashua, Hillsborough County, New Hampshire, 03060, United States" building yes 0.201 United States FALSE
+cooper's ferry us Americas Northern America FALSE 1 2021-02-03 299474742 way "Cooper's Ferry Park, Monticello, Lawrence County, Mississippi, United States" leisure park 0.45 United States FALSE
+cornell lab of ornithology us Americas Northern America FALSE 1 2021-02-03 544921 node "159, Cornell Laboratory of Ornithology, Lansing, Lansing Town, Tompkins County, New York, 14850, United States" place locality 0.525 United States FALSE
+corte madera us Americas Northern America FALSE 1 2021-02-03 258504269 relation "Corte Madera, Marin County, California, 94925, United States" boundary administrative 0.633600484003591 United States FALSE
+coskata us Americas Northern America FALSE 1 2021-02-03 496405 node "Coskata, Nantucket County, Massachusetts, United States" place hamlet 0.270881295424728 United States FALSE
+council on foreign relations us Americas Northern America FALSE 1 2021-02-03 2638895 node "Council on Foreign Relations, 58, East 68th Street, Upper East Side, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" office association 0.401 United States FALSE
+courant institute us Americas Northern America FALSE 1 2021-02-03 55398385 node "Courant Institute of Mathematical Sciences, 251, Mercer Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States" amenity university 0.622385266730329 United States FALSE
+covanta us Americas Northern America FALSE 1 2021-02-03 108431439 way "Covanta, Hempstead, Nassau County, New York, United States" landuse industrial 0.3 United States FALSE
+cprs us Americas Northern America FALSE 1 2021-02-03 171962530 way "CPRS, Dairy Lane, Lancaster County, Pennsylvania, 17022, United States" leisure sports_centre 0.101 United States FALSE
+crh us Americas Northern America FALSE 1 2021-02-03 2951088 node "Choate Rosemary Hall, 333, Christian Street, Wallingford, Connecticut, New Haven County, Connecticut, 06492, United States" amenity school 0.381143934225165 United States FALSE
+cross us Americas Northern America FALSE 1 2021-02-03 258347599 relation "Cross County, Arkansas, United States" boundary administrative 0.598270979527558 United States FALSE
+csh vienna us Americas Northern America FALSE 1 2021-02-03 70048369 node "Vienna, Recreation Drive, Sunnyvale, Santa Clara County, California, 94089-2701, United States" railway station 0.383208261767925 United States FALSE
+cso us Americas Northern America FALSE 1 2021-02-03 5565914 node "Caltech Submillimeter Observatory, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.362945678183792 United States FALSE
+curie institute us Americas Northern America FALSE 1 2021-02-03 62876393 node "Marie Curie Institute of Engineering and Communication, Curie Lane, City of Amsterdam, Montgomery County, New York, United States" amenity school 0.201 United States FALSE
+cwru us Americas Northern America FALSE 1 2021-02-03 259081536 relation "Case Western Reserve University, 10900, Euclid Avenue, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States" amenity university 0.514467419199317 United States FALSE
+daiichi sankyo us Americas Northern America FALSE 1 2021-02-03 80948574 node "Daiichi Sankyo, Village Circle, Solana Plaza, Westlake, Tarrant County, Texas, 76092, United States" office yes 0.201 United States FALSE
+dallas cowboys us Americas Northern America FALSE 1 2021-02-03 102618220 way "AT&T Stadium, 900, East Randol Mill Road, Arlington, Tarrant County, Texas, 76011, United States" tourism attraction 0.484986544882205 United States FALSE
+dana farber cancer institute us Americas Northern America FALSE 1 2021-02-03 145616376 way "Dana-Farber Cancer Institute, 450, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States" amenity hospital 0.71689306175332 United States FALSE
+dca us Americas Northern America FALSE 1 2021-02-03 224465042 way "Disney California Adventure, 1620, South Disneyland Drive, Anaheim, Orange County, California, 92802, United States" tourism theme_park 0.462070869758741 United States FALSE
+decc us Americas Northern America FALSE 1 2021-02-03 129379664 way "Duluth Entertainment Convention Center, Railroad Street, Duluth, Saint Louis County, Minnesota, 55802, United States" building yes 0.317609725634953 United States FALSE
+defenders of wildlife us Americas Northern America FALSE 1 2021-02-03 57901658 node "Defenders of Wildlife, 1130, N Street Northwest, Dupont Circle, Washington, District of Columbia, 20037, United States" tourism information 0.301 United States FALSE
+denison us Americas Northern America FALSE 1 2021-02-03 257424444 relation "Denison, Grayson County, Texas, 75020, United States" boundary administrative 0.62462611732643 United States FALSE
+denver museum of nature & science us Americas Northern America FALSE 1 2021-02-03 99790553 way "Denver Museum of Nature and Science, 2001, Colorado Boulevard, Denver, Denver County, Colorado, 80205, United States" tourism museum 0.833256970094253 United States FALSE
+denver museum of nature and science us Americas Northern America FALSE 1 2021-02-03 99790553 way "Denver Museum of Nature and Science, 2001, Colorado Boulevard, Denver, Denver County, Colorado, 80205, United States" tourism museum 0.933256970094253 United States FALSE
+department of enterprise us Americas Northern America FALSE 1 2021-02-03 3043821 node "Enterprise Fire Department, South Main Street, Singing Brook, Enterprise, Coffee County, Alabama, 36330-1915, United States" amenity fire_station 0.301 United States FALSE
+department of environmental quality us Americas Northern America FALSE 1 2021-02-03 220675454 way "Department of Environmental Quality, Aspen Street, Helena, Lewis and Clark County, Montana, 59602-1217, United States" office government 0.401 United States FALSE
+department of labor us Americas Northern America FALSE 1 2021-02-03 196192727 way "Department of Labor, 550, South 16th Street, Capitol View, Haymarket, Lincoln, Lancaster County, Nebraska, 68508, United States" office government 0.301 United States FALSE
+department of radiation oncology us Americas Northern America FALSE 1 2021-02-03 204988396 way "Department of Radiation Oncology, 2280, Inwood Road, Dallas, TX, Dallas, Dallas County, Texas, 75390, United States" building university 0.401 United States FALSE
+depaul university us Americas Northern America FALSE 1 2021-02-03 95148601 way "DePaul University, North Bissell Street, Lincoln Park, Chicago, Cook County, Illinois, 60614, United States" amenity university 0.695671053119323 United States FALSE
+des moines university us Americas Northern America FALSE 1 2021-02-03 126157336 way "Des Moines University, 3200, Grand Avenue, Grand Oaks Condominiums, Des Moines, Polk County, Iowa, 50312, United States" amenity university 0.625616522175778 United States FALSE
+devon energy us Americas Northern America FALSE 1 2021-02-03 121803437 way "Devon Energy, Central Business District, Oklahoma City, Oklahoma County, Oklahoma, United States" landuse commercial 0.4 United States FALSE
+dhhs us Americas Northern America FALSE 1 2021-02-03 80387349 node "DHHS, 220, Capitol Street, Augusta, Kennebec County, Maine, 04330, United States" place house 0.101 United States FALSE
+diamond and washington university us Americas Northern America FALSE 1 2021-02-03 189612585 way "West Diamond Drive, University House, Fayetteville, Washington County, Arkansas, 72701, United States" highway service 0.375 United States FALSE
+dias us Americas Northern America FALSE 1 2021-02-03 100102213 way "Diaz, Jackson County, Arkansas, United States" boundary administrative 0.376527586886318 United States FALSE
+doe joint genome institute us Americas Northern America FALSE 1 2021-02-03 235834399 way "Joint Genome Institute, Smoot Road, Berkeley, Alameda County, California, 94720, United States" building yes 0.610439474412231 United States FALSE
+doe's lawrence berkeley national laboratory us Americas Northern America FALSE 1 2021-02-03 201093023 way "Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States" amenity research_institute 0.501 United States FALSE
+dora us Americas Northern America FALSE 1 2021-02-03 258379011 relation "Dora, Walker County, Alabama, 35038, United States" boundary administrative 0.525494508146147 United States FALSE
+double star us Americas Northern America FALSE 1 2021-02-03 226790102 way "Double Star, Tyler, Smith County, Texas, United States" landuse residential 0.4 United States FALSE
+dow agrosciences us Americas Northern America FALSE 1 2021-02-03 158311065 way "Dow AgroSciences, Ruby H Harper Boulevard, Gilbert Gardens, Plunket Town, Atlanta, Fulton County, Georgia, 30354, United States" building warehouse 0.201 United States FALSE
+drew university us Americas Northern America FALSE 1 2021-02-03 104995030 way "Drew University, Vinal Place, Fairwoods, Madison, Morris County, New Jersey, 07940, United States" amenity university 0.631278630270434 United States FALSE
+duke clinical research institute us Americas Northern America FALSE 1 2021-02-03 100768801 way "Duke Clinical Research Institute, 300, West Morgan Street, American Tobacco Historic District, Durham, Durham County, North Carolina, 27701, United States" building yes 0.401 United States FALSE
+duke lemur center us Americas Northern America FALSE 1 2021-02-03 212038174 way "Duke Lemur Center, Evans Street, Welcome Circle, Durham, Durham County, North Carolina, 27705, United States" tourism zoo 0.605872022275768 United States FALSE
+duke university in durham us Americas Northern America FALSE 1 2021-02-03 259450641 relation "Duke University, 15th Street, 9th Street District, Durham, Durham County, North Carolina, 27705, United States" amenity university 0.993140337132867 United States FALSE
+duke university medical center us Americas Northern America FALSE 1 2021-02-03 259450641 relation "Duke University, 15th Street, 9th Street District, Durham, Durham County, North Carolina, 27705, United States" amenity university 0.793140337132867 United States FALSE
+dunn solar telescope us Americas Northern America FALSE 1 2021-02-03 139772916 way "Dunn Solar Telescope, Telescope Loop, Sacramento Peak Observatory, Sunspot, Otero County, New Mexico, 88349, United States" building yes 0.301 United States FALSE
+dupont corporation us Americas Northern America FALSE 1 2021-02-03 54825357 node "Fort DuPont Redevelopment & Preservation Corporation, 260, Old Elm Avenue, New Castle County, Delaware, 19706, United States" place house 0.201 United States FALSE
+earth system science center us Americas Northern America FALSE 1 2021-02-03 54925314 node "Center for Science in the Earth System, 3737, Brooklyn Avenue Northeast, University District, Seattle, King County, Washington, 98105-6286, United States" office research 0.401 United States FALSE
+earth system science centre us Americas Northern America FALSE 1 2021-02-03 54925314 node "Center for Science in the Earth System, 3737, Brooklyn Avenue Northeast, University District, Seattle, King County, Washington, 98105-6286, United States" office research 0.301 United States FALSE
+earth venture us Americas Northern America FALSE 1 2021-02-03 71060837 node "Earth, Wood & Fire, 214, Mountain Road, Bagleys Venture, Lynchs Corner, Fallston, Harford County, Maryland, 21047, United States" amenity restaurant 0.201 United States FALSE
+ecosystem services us Americas Northern America FALSE 1 2021-02-03 80480832 node "Ecosystem Services, Group Meeting Area, Palo Alto, Santa Clara County, California, 94303, United States" tourism information 0.201 United States FALSE
+edgcomb us Americas Northern America FALSE 1 2021-02-03 88605407 way "Edgcomb Avenue, Knoxville, Tioga County, Pennsylvania, 16928, United States" highway residential 0.2 United States FALSE
+eec us Americas Northern America FALSE 1 2021-02-03 92923719 way "Swanzy Lake Rd, Swanzy, Forsyth Township, Marquette County, Michigan, 49841, United States" highway residential 0.1 United States FALSE
+ekström us Americas Northern America FALSE 1 2021-02-03 89393268 way "Ekstrom, Pierce County, Washington, 98327, United States" highway residential 0.1 United States FALSE
+eldora us Americas Northern America FALSE 1 2021-02-03 258353320 relation "Eldora, Hardin County, Iowa, 50627, United States" boundary administrative 0.542383952483738 United States FALSE
+ellis us Americas Northern America FALSE 1 2021-02-03 258432178 relation "Ellis County, Texas, United States" boundary administrative 0.657733133901671 United States FALSE
+emmett conrad high school us Americas Northern America FALSE 1 2021-02-03 191982414 way "Emmett J Conrad High School, 7502, Fair Oaks Avenue, Vickery Meadows PID, Dallas, Dallas County, Texas, 75231, United States" amenity school 0.662719188578863 United States FALSE
+energy us Americas Northern America FALSE 1 2021-02-03 257952569 relation "Energy, Williamson County, Illinois, 62933, United States" boundary administrative 0.523032671836241 United States FALSE
+energy and minerals us Americas Northern America FALSE 1 2021-02-03 24228476 node "Pathfinder energy service, 1111, Southern Minerals Road, Corpus Christi, Nueces County, Texas, 78409, United States" building industrial 0.201 United States FALSE
+enserch us Americas Northern America FALSE 1 2021-02-03 187679938 way "Enserch Corporation, Gregg County, Texas, United States" landuse industrial 0.3 United States FALSE
+environmental justice us Americas Northern America FALSE 1 2021-02-03 225124870 way "Literacy For Environmental Justice, 1150, Carroll Avenue, San Francisco, San Francisco City and County, California, 94188, United States" building yes 0.201 United States FALSE
+environmental law institute us Americas Northern America FALSE 1 2021-02-03 67439590 node "Environmental Law Institute, 1730, M Street Northwest, Golden Triangle, Washington, District of Columbia, 20036, United States" office association 0.301 United States FALSE
+environmental progress us Americas Northern America FALSE 1 2021-02-03 151121616 way "ACF Environmental, 25, Progress Avenue, Nashua, Hillsborough County, New Hampshire, 03062, United States" building yes 0.201 United States FALSE
+epri us Americas Northern America FALSE 1 2021-02-03 149351356 way "EPRI High Voltage Lab, New Lenox, Lenox, Berkshire County, Massachusetts, United States" landuse industrial 0.3 United States FALSE
+erma us Americas Northern America FALSE 1 2021-02-03 258445399 relation "Erma, Lower Township, Cape May County, New Jersey, United States" place census-designated 0.43674906391142 United States FALSE
+esvelt us Americas Northern America FALSE 1 2021-02-03 85834685 way "Esvelt Road, Daisy, Stevens County, Washington, United States" highway residential 0.2 United States FALSE
+ethical treatment of animals us Americas Northern America FALSE 1 2021-02-03 251457165 way "People for the Ethical Treatment of Animals, Front Street, Norfolk, Virginia, 23510, United States" amenity social_facility 0.401 United States FALSE
+eugene us Americas Northern America FALSE 1 2021-02-03 257538846 relation "Eugene, Lane County, Oregon, United States" boundary administrative 0.678763756395741 United States FALSE
+european society us Americas Northern America FALSE 1 2021-02-03 84196080 node "European Republic, 213, Chestnut Street, Society Hill, Philadelphia, Philadelphia County, Pennsylvania, 19106, United States" amenity fast_food 0.201 United States FALSE
+evergreen state college us Americas Northern America FALSE 1 2021-02-03 258893745 relation "The Evergreen State College, Brenner Road Northwest, Thurston County, Washington, 98505, United States" amenity university 0.301 United States FALSE
+ewing bank us Americas Northern America FALSE 1 2021-02-03 257926178 relation "Ewing, Franklin County, Illinois, United States" boundary administrative 0.524872581583534 United States FALSE
+exeter university us Americas Northern America FALSE 1 2021-02-03 89930509 way "Exeter, University Town Center, Irvine, Orange County, California, 92612, United States" highway residential 0.3 United States FALSE
+fairview health services us Americas Northern America FALSE 1 2021-02-03 158126320 way "Health Services, McMIllan Road, La Loma Park, Berkeley, Alameda County, California, 94720, United States" building yes 0.201 United States FALSE
+fallon paiute-shoshone tribe us Americas Northern America FALSE 1 2021-02-03 231265905 way "Fallon Paiute - Shoshone Tribe, Fallon, Churchill County, Nevada, United States" boundary aboriginal_lands 0.525 United States FALSE
+fdna us Americas Northern America FALSE 1 2021-02-03 90193129 way "Fdna Lane, Las Vegas, Clark County, Nevada, 89102-4345, United States" highway residential 0.2 United States FALSE
+federal express us Americas Northern America FALSE 1 2021-02-03 233799488 way "Federal Express, Santa Fe, Santa Fe County, New Mexico, United States" landuse industrial 0.4 United States FALSE
+federal security service us Americas Northern America FALSE 1 2021-02-03 154159910 way "Navy Federal Credit Union, 141, Security Drive, Winchester, Frederick County, Virginia, 22602, United States" office Credit_Union 0.201 United States FALSE
+federation of american societies us Americas Northern America FALSE 1 2021-02-03 154221123 way "FGAS Cultural Center, 150, Spencerport Road, Rochester, Gates, Monroe County, New York, 14606, United States" building house 0.001 United States FALSE
+feld entertainment us Americas Northern America FALSE 1 2021-02-03 189595545 way "Entertainment, Foothill Ranch Towne Center, Foothill Ranch, Lake Forest, Orange County, California, 92610, United States" highway service 0.175 United States FALSE
+first solar us Americas Northern America FALSE 1 2021-02-03 61379150 node "First Solar, 350, West Washington Street, Tempe, Maricopa County, Arizona, 85281, United States" office yes 0.593222260239594 United States FALSE
+florida gulf coast university in fort myers us Americas Northern America FALSE 1 2021-02-03 35558902 node "Florida Gulf Coast University, 10501, FGCU Boulevard South, North Lake Village, Fort Myers, Lee County, Florida, 33965-6565, United States" building school 0.975561325671519 United States FALSE
+florida museum of natural history us Americas Northern America FALSE 1 2021-02-03 182064668 way "Florida Museum of Natural History, 3215, Hull Road, Gainesville, Alachua County, Florida, 32611, United States" tourism museum 0.868804350670811 United States FALSE
+florida state us Americas Northern America FALSE 1 2021-02-03 257824147 relation "Florida, United States" boundary administrative 0.951213972798062 United States FALSE
+folsom state prison us Americas Northern America FALSE 1 2021-02-03 102683947 way "Folsom State Prison, Johnny Cash Trail, Folsom, Sacramento County, California, 95630, United States" amenity prison 0.680889254526519 United States FALSE
+food & water watch us Americas Northern America FALSE 1 2021-02-03 4509818 node "Duck Deli, 1221, Duck Road, Ships Watch, Duck, Dare County, North Carolina, 27949, United States" amenity restaurant 0.101 United States FALSE
+foothill college us Americas Northern America FALSE 1 2021-02-03 2853914 node "Foothill College, Loop Road, Los Altos Hills, Santa Clara County, California, 94022, United States" amenity school 0.201 United States FALSE
+forensic science service us Americas Northern America FALSE 1 2021-02-03 145457220 way "Forensic Science, Merton Minter, South Texas Medical Center, San Antonio, Bexar County, Texas, 78229, United States" building yes 0.201 United States FALSE
+fort collins us Americas Northern America FALSE 1 2021-02-03 258131035 relation "Fort Collins, Larimer County, Colorado, United States" boundary administrative 0.726613055164061 United States FALSE
+forty seven us Americas Northern America FALSE 1 2021-02-03 2501141 node "Cow Island Number Forty-seven, Memphis, Shelby County, Tennessee, United States" place island 0.525 United States FALSE
+foundation center us Americas Northern America FALSE 1 2021-02-03 51536219 node "Foundation Center, 33, Old Slip, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10005, United States" amenity library 0.201 United States FALSE
+foundation for the nih us Americas Northern America FALSE 1 2021-02-03 154743130 way "The Annenberg Space for Photography, 2000, Avenue of the Stars, Century City, Los Angeles, Los Angeles County, California, 90067, United States" tourism museum 0.523710213530857 United States FALSE
+foundation medicine us Americas Northern America FALSE 1 2021-02-03 43539867 node "Foundation Medicine, Inc. Headquarters, 150, Second Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States" office research 0.201 United States FALSE
+fred hutchinson cancer center us Americas Northern America FALSE 1 2021-02-03 179513052 way "Fred Hutchinson Cancer Research Center, 1100, Fairview Avenue North, South Lake Union, Capitol Hill, Seattle, King County, Washington, 98109, United States" amenity research_institute 0.731005307834616 United States FALSE
+fred hutchinson research center us Americas Northern America FALSE 1 2021-02-03 179513052 way "Fred Hutchinson Cancer Research Center, 1100, Fairview Avenue North, South Lake Union, Capitol Hill, Seattle, King County, Washington, 98109, United States" amenity research_institute 0.731005307834616 United States FALSE
+fsi us Americas Northern America FALSE 1 2021-02-03 3120194 node "Henry Post Army Airfield, Condon Road, Lawton, Comanche County, Oklahoma, 73503, United States" aeroway aerodrome 0.23181178765026 United States FALSE
+fullerton us Americas Northern America FALSE 1 2021-02-03 258631737 relation "Fullerton, Orange County, California, United States" boundary administrative 0.608922490506601 United States FALSE
+funk us Americas Northern America FALSE 1 2021-02-03 258441607 relation "Funk, Phelps County, Nebraska, United States" boundary administrative 0.437009666411203 United States FALSE
+gadzooks us Americas Northern America FALSE 1 2021-02-03 163941067 way "Gadzooks Drive, Silver Ridge, Sandy, Salt Lake County, Utah, 84020, United States" highway residential 0.2 United States FALSE
+gallaher us Americas Northern America FALSE 1 2021-02-03 387807 node "Gallaher, Curry County, New Mexico, 88103, United States" place hamlet 0.35 United States FALSE
+gallup us Americas Northern America FALSE 1 2021-02-03 258164532 relation "Gallup, McKinley County, New Mexico, 87301, United States" boundary administrative 0.564154606259328 United States FALSE
+galveston national laboratory us Americas Northern America FALSE 1 2021-02-03 229364111 way "NMFS - Galveston Laboratory, NOAA, Galveston, Galveston County, Texas, 77551, United States" office government 0.201 United States FALSE
+game commission us Americas Northern America FALSE 1 2021-02-03 70479424 node "Nebraska Game and Parks Commission, 2200, North 33rd Street, Lincoln, Lancaster County, Nebraska, 68503, United States" office government 0.482582546755277 United States FALSE
+gaston berger university us Americas Northern America FALSE 1 2021-02-03 190185049 way "Mary Gaston Residence Hall, South Drive, University Heights, Greenville, Greenville County, South Carolina, 29614, United States" building residential 0.201 United States FALSE
+geha us Americas Northern America FALSE 1 2021-02-03 257939755 relation "Geauga County, Ohio, United States" boundary administrative 0.515207975256723 United States FALSE
+genentech hall us Americas Northern America FALSE 1 2021-02-03 122738337 way "Genentech Hall, Roger Evans Terrace, Mission Bay, San Francisco, San Francisco City and County, California, United States" building yes 0.201 United States FALSE
+general atomics us Americas Northern America FALSE 1 2021-02-03 18281619 node "General Atomics, John Hopkins Court, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States" building office 0.587535809977585 United States FALSE
+general conference us Americas Northern America FALSE 1 2021-02-03 149079985 way "Center for Christian Ministries Churches of God, General Conference, 700, East Melrose Avenue, Bent Tree, Findlay, Hancock County, Ohio, 45840, United States" building yes 0.201 United States FALSE
+general mills us Americas Northern America FALSE 1 2021-02-03 254985713 way "General Mills, Great Falls, Cascade County, Montana, United States" landuse industrial 0.4 United States FALSE
+general services administration us Americas Northern America FALSE 1 2021-02-03 258573536 relation "General Services Administration, 1800, F Street Northwest, Golden Triangle, Washington, District of Columbia, 20037, United States" office government 0.466903631515068 United States FALSE
+geneva university hospitals us Americas Northern America FALSE 1 2021-02-03 203412230 way "University Hospitals Geneva Medical Center, 870, West Main Street, Geneva, Ashtabula County, Ohio, 44041, United States" amenity hospital 0.301 United States FALSE
+genome analysis centre us Americas Northern America FALSE 1 2021-02-03 170711270 way "Genome Analysis Center, 830, West Campus Drive, West Haven, New Haven County, Connecticut, 06516, United States" building university 0.201 United States FALSE
+genome research us Americas Northern America FALSE 1 2021-02-03 100166139 way "Genome Research Institute, Ronald Reagan Cross County Highway, Reading, Hamilton County, Ohio, 45215-5417, United States" amenity research_institute 0.201 United States FALSE
+genomic research us Americas Northern America FALSE 1 2021-02-03 85844826 way "Genomic Drive, University Research Park, Madison, Dane County, Wisconsin, 53719, United States" highway residential 0.3 United States FALSE
+george washington university school us Americas Northern America FALSE 1 2021-02-03 106978219 way "George Washington University, I Street Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States" amenity university 0.861031504404982 United States FALSE
+georgetown university medical center us Americas Northern America FALSE 1 2021-02-03 105725399 way "Georgetown University, 3700, O Street Northwest, Georgetown, Washington, District of Columbia, 20057, United States" amenity university 0.787586492717596 United States FALSE
+georgia state us Americas Northern America FALSE 1 2021-02-03 50248915 node "Georgia State, 2, Martin Luther King Junior Drive Southeast, Five Points, Atlanta, Fulton County, Georgia, 30303-3506, United States" railway station 0.201 United States FALSE
+georgia tech research institute us Americas Northern America FALSE 1 2021-02-03 82853123 node "Georgia Tech Research Institute, 2970, Presidential Drive, Wright Executive Center, Fairborn, Greene County, Ohio, 45324, United States" office educational_institution 0.401 United States FALSE
+github us Americas Northern America FALSE 1 2021-02-03 21615383 node "GitHub, 88, Colin P. Kelly Junior Street, South Beach, San Francisco, San Francisco City and County, California, 94107, United States" office company 0.101 United States FALSE
+gladstone institutes us Americas Northern America FALSE 1 2021-02-03 108770743 way "J David Gladstone Institutes, 1650, Owens Street, Mission Bay, San Francisco, San Francisco City and County, California, 94158, United States" building office 0.201 United States FALSE
+glenn research center us Americas Northern America FALSE 1 2021-02-03 60822274 node "NASA John H. Glenn Research Center at Lewis Field, Taylor Road, Brook Park, Cuyahoga County, Ohio, 44126, United States" office research 0.739197856791149 United States FALSE
+global congress us Americas Northern America FALSE 1 2021-02-03 173285347 way "SRG Global, 601, North Congress Avenue, Smythe, Evansville, Vanderburgh County, Indiana, 47715, United States" building yes 0.201 United States FALSE
+global ecology us Americas Northern America FALSE 1 2021-02-03 147781560 way "Global Ecology Research Center, Searsville Road, Stanford, Santa Clara County, California, 94305-6015, United States" building yes 0.201 United States FALSE
+global health us Americas Northern America FALSE 1 2021-02-03 118152495 way "Global Center for Health Innovation, 133, Saint Clair Avenue Northeast, East 4th Street, Warehouse District, Cleveland, Cuyahoga County, Ohio, 44114, United States" building yes 0.494028740055238 United States FALSE
+global security us Americas Northern America FALSE 1 2021-02-03 177539015 way "Global Security, East 33rd Street, Vancouver, Clark County, Washington, 98663, United States" office company 0.201 United States FALSE
+greenwood genetic center us Americas Northern America FALSE 1 2021-02-03 121423652 way "Greenwood Genetic Center, Columbia Office, 1911, Pulaski Street, Elmwood, Columbia, Richland County, South Carolina, 29201, United States" building yes 0.301 United States FALSE
+grinnell us Americas Northern America FALSE 1 2021-02-03 258144015 relation "Grinnell, Gove County, Kansas, 67738, United States" boundary administrative 0.51550718966255 United States FALSE
+gsr us Americas Northern America FALSE 1 2021-02-03 123444071 way "Graduate School & Research Building, Bosque Street, San Antonio, Bexar County, Texas, 78249-1620, United States" building university 0.001 United States FALSE
+guardian us Americas Northern America FALSE 1 2021-02-03 2795396 node "The Guardian, San Juan County, Colorado, United States" natural peak 0.4 United States FALSE
+guardian angels us Americas Northern America FALSE 1 2021-02-03 52339565 node "Guardian Angels, 581, East 14 Mile Road, Clawson, Oakland County, Michigan, 48014, United States" amenity place_of_worship 0.201 United States FALSE
+gulfstream v us Americas Northern America FALSE 1 2021-02-03 152738447 way "Gulfstream, Conroe, Montgomery County, Texas, 77303, United States" highway residential 0.2 United States FALSE
+hall us Americas Northern America FALSE 1 2021-02-03 258640088 relation "Hall County, Texas, United States" boundary administrative 0.654110162810059 United States FALSE
+hampton university us Americas Northern America FALSE 1 2021-02-03 258960793 relation "Hampton University, 100, East Queen Street, Kecoughtan, Hampton, Virginia, 23668, United States" amenity university 0.637183546812171 United States FALSE
+harlem junior high school us Americas Northern America FALSE 1 2021-02-03 194527401 way "Harlem Junior High School, Northfield Avenue, Loves Park, Winnebago County, Illinois, 61111, United States" amenity school 0.401 United States FALSE
+harris county public health us Americas Northern America FALSE 1 2021-02-03 70168132 node "Dillard St at E Main St (County Public Health), South Dillard Street, Downtown Durham, Durham, Durham County, North Carolina, 27701, United States" highway bus_stop 0.301 United States FALSE
+hartwick college us Americas Northern America FALSE 1 2021-02-03 121610396 way "Hartwick College, 1, Hartwick Drive, Oneonta, City of Oneonta, Otsego County, New York, 13820, United States" amenity university 0.573438300637181 United States FALSE
+harvard business school us Americas Northern America FALSE 1 2021-02-03 2751379 node "Harvard Business School, Harvard Way, Allston, Boston, Suffolk County, Massachusetts, 02138-3824, United States" amenity university 0.839985702342783 United States FALSE
+harvard forest us Americas Northern America FALSE 1 2021-02-03 97627124 way "Harvard Forest, Quaker Drive, Petersham, Worcester County, Massachusetts, 01366, United States" leisure nature_reserve 0.201 United States FALSE
+harvard university lab us Americas Northern America FALSE 1 2021-02-03 258370425 relation "Harvard University, Kingsley Street, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134-1420, United States" amenity university 0.977190722653673 United States FALSE
+harvey mudd college us Americas Northern America FALSE 1 2021-02-03 98492541 way "Harvey Mudd College, East Foothill Boulevard, Claremont, Los Angeles County, California, 91711, United States" amenity university 0.700782553145287 United States FALSE
+has us Americas Northern America FALSE 1 2021-02-03 257963057 relation "Harrison County, Ohio, United States" boundary administrative 0.518837343149246 United States FALSE
+hastings center us Americas Northern America FALSE 1 2021-02-03 459457 node "Hastings Center, Town of Hastings, Oswego County, New York, 13036, United States" place hamlet 0.45 United States FALSE
+haverford us Americas Northern America FALSE 1 2021-02-03 447354 node "Haverford, Lower Merion Township, Montgomery County, Pennsylvania, 19003, United States" place hamlet 0.503670690295642 United States FALSE
+haverford college us Americas Northern America FALSE 1 2021-02-03 115142668 way "Haverford College, East Railroad Avenue, Haverford Township, Delaware County, Pennsylvania, 19010, United States" amenity college 0.657348082673311 United States FALSE
+hawaiian volcano observatory us Americas Northern America FALSE 1 2021-02-03 102153617 way "Hawaiian Volcano Observatory, Crater Rim Trail, Hawaiʻi County, Hawaii, 96718, United States" building yes 0.301 United States FALSE
+hawks us Americas Northern America FALSE 1 2021-02-03 435217 node "Hawks, Bismark Township, Presque Isle County, Michigan, 49743, United States" place hamlet 0.35 United States FALSE
+hcmc us Americas Northern America FALSE 1 2021-02-03 123770771 way "Hennepin County Medical Center, 701, Park Avenue South, Minneapolis, Hennepin County, Minnesota, 55415, United States" amenity hospital 0.250254845255209 United States FALSE
+health and human services us Americas Northern America FALSE 1 2021-02-03 159574403 way "Health and Human Services, Dove Street, Clinton Township, Macomb County, Michigan, 48038, United States" building university 0.401 United States FALSE
+healthcare us Americas Northern America FALSE 1 2021-02-03 257378484 way "Healthcare, Shiloh, Lancaster County, South Carolina, 29720-2135, United States" highway service 0.175 United States FALSE
+heidelberg university hospital us Americas Northern America FALSE 1 2021-02-03 164310513 way "Heidelberg University, Governor's Trail, College Hill, Tiffin, Seneca County, Ohio, 44883, United States" amenity university 0.519018527529768 United States FALSE
+helios us Americas Northern America FALSE 1 2021-02-03 111625127 way "Helios, 1600, 2nd Avenue, Pike Place Market Area, Belltown, Seattle, King County, Washington, 98101, United States" building apartments 0.361844955490085 United States FALSE
+hennepin county medical center us Americas Northern America FALSE 1 2021-02-03 123770771 way "Hennepin County Medical Center, 701, Park Avenue South, Minneapolis, Hennepin County, Minnesota, 55415, United States" amenity hospital 0.650254845255209 United States FALSE
+henry ford hospital us Americas Northern America FALSE 1 2021-02-03 193942596 way "Henry Ford Hospital, 2799, West Grand Boulevard, Henry Ford, New Center, Detroit, Wayne County, Michigan, 48202, United States" amenity hospital 0.670940340656356 United States FALSE
+henrys us Americas Northern America FALSE 1 2021-02-03 334760 node "Henrys, Maple Valley, King County, Washington, 98010, United States" place hamlet 0.35 United States FALSE
+hershey us Americas Northern America FALSE 1 2021-02-03 258025884 relation "Hershey, Dauphin County, Pennsylvania, United States" boundary administrative 0.570462886806853 United States FALSE
+hess us Americas Northern America FALSE 1 2021-02-03 464089 node "Hess, Harford County, Maryland, United States" place hamlet 0.35 United States FALSE
+hewlett us Americas Northern America FALSE 1 2021-02-03 257852582 relation "Hewlett, Hempstead, Nassau County, New York, United States" boundary administrative 0.498524014044495 United States FALSE
+hewlett foundation us Americas Northern America FALSE 1 2021-02-03 258952342 relation "Hewlett Foundation, 2121, Sand Hill Road, Stanford Hills, Menlo Park, San Mateo County, California, 94028, United States" office ngo 0.201 United States FALSE
+high point university us Americas Northern America FALSE 1 2021-02-03 2719486 node "High Point University, North University Parkway, High Point, Guilford County, North Carolina, 27262, United States" amenity school 0.701151058873139 United States FALSE
+hill us Americas Northern America FALSE 1 2021-02-03 258432168 relation "Hill County, Texas, United States" boundary administrative 0.654736575831137 United States FALSE
+history of natural science us Americas Northern America FALSE 1 2021-02-03 3051871 node "El Campo Museum of Art, History, and Natural Science, North Mechanic Street, El Campo, Wharton County, Texas, 77437, United States" tourism museum 0.401 United States FALSE
+hoover institution us Americas Northern America FALSE 1 2021-02-03 103143878 way "Hoover Institution on War, Revolution and Peace, Galvez Street, Stanford, Santa Clara County, California, 94305-6015, United States" amenity college 0.65558864174307 United States FALSE
+hopewell us Americas Northern America FALSE 1 2021-02-03 259361968 relation "Hopewell, Virginia, United States" boundary administrative 0.579389836000794 United States FALSE
+hopewell culture national historical park us Americas Northern America FALSE 1 2021-02-03 259178645 relation "Hopewell Culture National Historical Park, Ross County, Ohio, United States" leisure park 0.92962282009393 United States FALSE
+houghton us Americas Northern America FALSE 1 2021-02-03 258207257 relation "Houghton County, Michigan, United States" boundary administrative 0.601814895980315 United States FALSE
+house appropriations committee us Americas Northern America FALSE 1 2021-02-03 81345390 node "House Appropriations Committee, North 9th Street, Shockoe Slip, Richmond, Virginia, 23219, United States" office government 0.301 United States FALSE
+house of representative us Americas Northern America FALSE 1 2021-02-03 87659921 way "2 Portland Fish Pier Portland ME Representative Pingrees Office, Old Port, Downtown, Portland, Cumberland County, Maine, 04101-4145, United States" highway residential 0.3 United States FALSE
+houston methodist research institute us Americas Northern America FALSE 1 2021-02-03 147281798 way "Houston Methodist Research Institute, 6670, Bertner Avenue, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" building hospital 0.401 United States FALSE
+howard university us Americas Northern America FALSE 1 2021-02-03 258484447 relation "Howard University, Howard Place Northwest, Howard University, Washington, District of Columbia, 20001, United States" amenity university 0.719338807988632 United States FALSE
+hudson institute us Americas Northern America FALSE 1 2021-02-03 3044001 node "Hudson Institute, Quaker Ridge Road, Cortlandt, Westchester, New York, 10520, United States" building yes 0.201 United States FALSE
+human health us Americas Northern America FALSE 1 2021-02-03 94919022 way "Western Human Nutrition Research Center, West Health Sciences Drive, Yolo County, California, 95616-5270, United States" building university 0.201 United States FALSE
+humane society us Americas Northern America FALSE 1 2021-02-03 38478592 node "The Humane Society, 7115, Georgia Avenue Northwest, Shepherd Park, Washington, District of Columbia, 20012, United States" shop pet 0.201 United States FALSE
+humane society of the united states us Americas Northern America FALSE 1 2021-02-03 38478592 node "The Humane Society, 7115, Georgia Avenue Northwest, Shepherd Park, Washington, District of Columbia, 20012, United States" shop pet 0.601 United States FALSE
+humpty dumpty us Americas Northern America FALSE 1 2021-02-03 164108425 way "Humpty Dumpty, West Barnstable, Barnstable, Barnstable County, Massachusetts, 0264, United States" highway path 0.275 United States FALSE
+hurd us Americas Northern America FALSE 1 2021-02-03 500391 node "Hurd, Caribou, Aroostook County, Maine, United States" place hamlet 0.35 United States FALSE
+ibm research us Americas Northern America FALSE 1 2021-02-03 98702289 way "IBM Almaden Research Center, 650, Harry Road, IBM Almaden Research Center, San Jose, Santa Clara County, California, 95120, United States" building yes 0.483827688081076 United States FALSE
+ibm research at almaden research center us Americas Northern America FALSE 1 2021-02-03 98702289 way "IBM Almaden Research Center, 650, Harry Road, IBM Almaden Research Center, San Jose, Santa Clara County, California, 95120, United States" building yes 0.883827688081076 United States FALSE
+ibm thomas j. watson research center us Americas Northern America FALSE 1 2021-02-03 110787015 way "IBM Yorktown research lab, Adams Road, Town of New Castle, Town of Yorktown, Westchester, New York, 10562, United States" office research 0.201 United States FALSE
+icf international us Americas Northern America FALSE 1 2021-02-03 70920084 node "ICF International, 615, Southwest Alder Street, Downtown, Portland, Metro, Oregon, 97205, United States" office company 0.201 United States FALSE
+ieee us Americas Northern America FALSE 1 2021-02-03 258920692 relation "IEEE, 445, Hoes Lane, Piscataway Township, Middlesex County, New Jersey, 08854, United States" building yes 0.101 United States FALSE
+igm us Americas Northern America FALSE 1 2021-02-03 214200010 way "Kingman Airport, Mohave Airport Drive, Mohave County, Arizona, United States" aeroway aerodrome 0.2885709817045 United States FALSE
+illinois institute of technology us Americas Northern America FALSE 1 2021-02-03 127098290 way "Illinois Institute of Technology, East 30th Street, Douglas, Chicago, Cook County, Illinois, 60616, United States" amenity university 0.879673085462407 United States FALSE
+illinois natural history survey us Americas Northern America FALSE 1 2021-02-03 2344232 node "Illinois Natural History Survey Area, Moultrie County, Illinois, 61951, United States" leisure park 0.55 United States FALSE
+illinois state university us Americas Northern America FALSE 1 2021-02-03 259445049 relation "Illinois State University, North Main Street, Normal, McLean County, Illinois, 61761, United States" amenity university 0.301 United States FALSE
+impc us Americas Northern America FALSE 1 2021-02-03 204982626 way "IMPC, Inglesby Drive, Williamsburg East, Richland County, South Carolina, 29223, United States" amenity place_of_worship 0.101 United States FALSE
+indian national trust us Americas Northern America FALSE 1 2021-02-03 102851004 way "Woodbridge Conservation Trust (35 Indian Trail), Woodbridge, New Haven County, Connecticut, United States" natural wood 0.4 United States FALSE
+indiana state university us Americas Northern America FALSE 1 2021-02-03 107213197 way "Indiana State University, North 7th Street, Terre Haute, Vigo County, Indiana, 47804, United States" amenity university 0.736151154174256 United States FALSE
+indiana university bloomington us Americas Northern America FALSE 1 2021-02-03 107215239 way "Indiana University Bloomington, East 3rd Street, Bloomington, Monroe County, Indiana, 47401-6124, United States" amenity university 0.301 United States FALSE
+information center us Americas Northern America FALSE 1 2021-02-03 88944375 way "Information Center, Polk County, Arkansas, 71953, United States" highway residential 0.3 United States FALSE
+information power us Americas Northern America FALSE 1 2021-02-03 2959862 node "Fish Ladder and New England Power Company Information Center, Bridge Street, Bellows Falls Downtown Historic District, Bellows Falls, Rockingham, Windham County, Vermont, 03609, United States" tourism information 0.201 United States FALSE
+inouye solar telescope us Americas Northern America FALSE 1 2021-02-03 150478014 way "Daniel K. Inouye Solar Telescope, Crater Road, Maui County, Hawaii, United States" man_made telescope 0.551308416199056 United States FALSE
+institute for cancer research us Americas Northern America FALSE 1 2021-02-03 102403056 way "David H. Koch Institute for Integrative Cancer Research, 500, Main Street, East Cambridge, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02142, United States" building university 0.697580560553068 United States FALSE
+institute of forensic science us Americas Northern America FALSE 1 2021-02-03 149986396 way "Forensic Science Institute, East 2nd Street, Edmond, Oklahoma County, Oklahoma, 73083, United States" building yes 0.301 United States FALSE
+institute of human virology us Americas Northern America FALSE 1 2021-02-03 171936676 way "Institute of Human Virology, 725, West Lombard Street, Ridgely's Delight, Baltimore, Maryland, 21201, United States" building university 0.401 United States FALSE
+institute of immunology us Americas Northern America FALSE 1 2021-02-03 54695744 node "Allergy Asthma & Immunology Institute: Laura Ispas-Ponas, MD, 19455, Deerfield Avenue, Lansdowne Woods of Virginia, Lansdowne, Loudoun County, Virginia, 20176, United States" amenity doctors 0.301 United States FALSE
+institute of life sciences us Americas Northern America FALSE 1 2021-02-03 126803509 way "Life Sciences Institute, Washtenaw Avenue, Ann Arbor, Washtenaw County, Michigan, 48108, United States" building university 0.478140546517606 United States FALSE
+integrated research facility us Americas Northern America FALSE 1 2021-02-03 158319264 way "Integrated Biorefinery Research Facility, Denver West Parkway, Pleasant View, Jefferson County, Colorado, 80401-4015, United States" building yes 0.301 United States FALSE
+intellectual ventures us Americas Northern America FALSE 1 2021-02-03 70855788 node "Intellectual Ventures Laboratory, 14360, Southeast Eastgate Way, Eastgate, Bellevue, King County, Washington, 98007, United States" office company 0.201 United States FALSE
+internal medicine us Americas Northern America FALSE 1 2021-02-03 209636367 way "Internal Medicine, Chestnut Avenue, Dansville, North Dansville, Livingston County, New York, 14437, United States" amenity doctors 0.201 United States FALSE
+international finance corporation us Americas Northern America FALSE 1 2021-02-03 106721102 way "International Finance Corporation, 2121, Pennsylvania Avenue Northwest, Washington, District of Columbia, 20006, United States" office yes 0.301 United States FALSE
+international rescue committee us Americas Northern America FALSE 1 2021-02-03 82409109 node "International Rescue Committee, 1535, Liberty Lane, Westside, Missoula, Missoula County, Montana, 59807, United States" amenity social_centre 0.301 United States FALSE
+irena us Americas Northern America FALSE 1 2021-02-03 257479734 relation "Irena, Worth County, Missouri, United States" boundary administrative 0.447285603202449 United States FALSE
+irving us Americas Northern America FALSE 1 2021-02-03 258777731 relation "Irving, Dallas County, Texas, United States" boundary administrative 0.616662915473728 United States FALSE
+isle royale us Americas Northern America FALSE 1 2021-02-03 258888859 relation "Isle Royale, Keweenaw County, Michigan, United States" place island 0.55796975755477 United States FALSE
+isro satellite center us Americas Northern America FALSE 1 2021-02-03 68074173 node "The Satellite Center, Williams Boulevard, Kenner, Jefferson Parish, Louisiana, 70062, United States" shop yes 0.201 United States FALSE
+j. paul getty museum us Americas Northern America FALSE 1 2021-02-03 55027361 node "The J. Paul Getty Museum, Beverly Park Drive, Brentwood, Los Angeles, Los Angeles County, California, 90049, United States" tourism museum 0.873062316630288 United States FALSE
+j&j us Americas Northern America FALSE 1 2021-02-03 49289982 node "J and J, Ward County, Texas, 79756, United States" place neighbourhood 0.45 United States FALSE
+jackson state university us Americas Northern America FALSE 1 2021-02-03 118809848 way "Jackson State University, Saint Louis Street, Jackson, Hinds County, Mississippi, 39203, United States" amenity university 0.721467320409497 United States FALSE
+jacksonville state university us Americas Northern America FALSE 1 2021-02-03 258550067 relation "Jacksonville State University, 700, Pelham Road North, Jacksonville, Calhoun County, Alabama, 36265, United States" amenity university 0.301 United States FALSE
+jaguar us Americas Northern America FALSE 1 2021-02-03 83098527 node "Jaguar, Gurabo, Puerto Rico, 00778, United States" place suburb 0.375 United States FALSE
+james madison university us Americas Northern America FALSE 1 2021-02-03 259182914 relation "James Madison University, Harrison Street, Harrisonburg, Rockingham County, Virginia, 22801, United States" amenity university 0.764385501255418 United States FALSE
+janssen pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 171007297 way "Janssen Pharmaceuticals, Ortho Drive, Raritan, Somerset County, New Jersey, 08869, United States" building yes 0.201 United States FALSE
+jason us Americas Northern America FALSE 1 2021-02-03 454400 node "Jason, Greene County, North Carolina, 28551:28580, United States" place hamlet 0.35 United States FALSE
+jci us Americas Northern America FALSE 1 2021-02-03 254337932 way "1100, JCI, Selma, Johnston County, North Carolina, 27576, United States" landuse industrial 0.3 United States FALSE
+jefferies us Americas Northern America FALSE 1 2021-02-03 487880 node "Jefferis, Menallen Township, Fayette County, Pennsylvania, 15484, United States" place hamlet 0.25 United States FALSE
+jefferson us Americas Northern America FALSE 1 2021-02-03 258358929 relation "Jefferson County, Texas, United States" boundary administrative 0.657913863605315 United States FALSE
+jefferson community and technical college us Americas Northern America FALSE 1 2021-02-03 181934405 way "Eastern Gateway Community College, Jefferson County Campus, 4000, Sunset Boulevard, Braybarton Boulevard Historic District, Becker Highlands, Steubenville, Jefferson County, Ohio, 43952, United States" amenity college 0.672343749103071 United States FALSE
+jefferson parish us Americas Northern America FALSE 1 2021-02-03 258214613 relation "Jefferson Parish, Louisiana, United States" boundary administrative 0.685339066716717 United States FALSE
+john jay college of criminal justice us Americas Northern America FALSE 1 2021-02-03 169888445 way "John Jay College of Criminal Justice, 11th Avenue, Hell's Kitchen, Manhattan Community Board 4, Manhattan, New York County, New York, 10018, United States" amenity college 0.987075864564083 United States FALSE
+johns hopkins bayview medical center us Americas Northern America FALSE 1 2021-02-03 109799549 way "Johns Hopkins Bayview Medical Center, 4940, Eastern Avenue, Greektown, Baltimore, Maryland, 21224, United States" amenity hospital 0.799042266993274 United States FALSE
+johnson & johnson of new brunswick us Americas Northern America FALSE 1 2021-02-03 99014438 way "Johnson and Johnson, New Brunswick, Middlesex County, New Jersey, 08903, United States" highway service 0.475 United States FALSE
+joint institute us Americas Northern America FALSE 1 2021-02-03 96516634 way "Joint Institute for Lab Astrophysics, 1900, Colorado Avenue, The Hill, Boulder, Boulder County, Colorado, 80309, United States" building university 0.526239076957718 United States FALSE
+joslin diabetes center us Americas Northern America FALSE 1 2021-02-03 147408996 way "Joslin Diabetes Center, 1, Joslin Place, Boston, Suffolk County, Massachusetts, 02215, United States" amenity clinic 0.557277503353622 United States FALSE
+jst us Americas Northern America FALSE 1 2021-02-03 146469981 way "Johnstown-Cambria County Airport, Airport Road, Richland Township, Cambria County, Pennsylvania, 15904, United States" aeroway aerodrome 0.217338060184506 United States FALSE
+jupiters us Americas Northern America FALSE 1 2021-02-03 151252671 way "Jupiter's, 1350, Smith Avenue, Mt Washington Mill, Baltimore, Maryland, 21209, United States" amenity restaurant 0.001 United States FALSE
+kahea us Americas Northern America FALSE 1 2021-02-03 89134590 way "Kahea Street, Makakilo Heights, Kapolei, Honolulu County, Hawaii, 96707, United States" highway residential 0.2 United States FALSE
+kaiser foundation health plan us Americas Northern America FALSE 1 2021-02-03 212439225 way "Kaiser Foundation Hospital, Modesto Helipad, Health Care Way, Modesto, Stanislaus County, California, 95368, United States" aeroway helipad 0.301 United States FALSE
+kaiser foundation hospitals us Americas Northern America FALSE 1 2021-02-03 195863008 way "MetroHealth Parma Medical Office, 12031, Snow Road, Parma, Cuyahoga County, Ohio, 44130, United States" amenity hospital 0.001 United States FALSE
+kellogg biological station us Americas Northern America FALSE 1 2021-02-03 2299744 node "Kellogg Biological Preserve, Emmett Charter Township, Calhoun County, Michigan, 49014, United States" leisure park 0.35 United States FALSE
+kellys us Americas Northern America FALSE 1 2021-02-03 239282811 way "The Kelly's, Edina, Hennepin County, Minnesota, United States" landuse residential 0.2 United States FALSE
+kenyon college us Americas Northern America FALSE 1 2021-02-03 174692957 way "Kenyon College, Gambier Road, Gambier, College Township, Knox County, Ohio, 43022, United States" amenity college 0.640956111033812 United States FALSE
+ketchum us Americas Northern America FALSE 1 2021-02-03 257781466 relation "Ketchum, Blaine County, Idaho, 83340, United States" boundary administrative 0.49577998822869 United States FALSE
+kibble us Americas Northern America FALSE 1 2021-02-03 2423509 node "Kibble Hill, Monroe County, West Virginia, United States" natural peak 0.4 United States FALSE
+kic us Americas Northern America FALSE 1 2021-02-03 101634590 way "Mesa Del Rey Airport, Bitterwater Road, King City, Monterey County, California, 93930, United States" aeroway aerodrome 0.18463416789672 United States FALSE
+kids us Americas Northern America FALSE 1 2021-02-03 123412820 way "Kids, Gunnison County, Colorado, 81230, United States" highway path 0.175 United States FALSE
+king juan carlos university us Americas Northern America FALSE 1 2021-02-03 152402826 way "King Juan Carlos I of Spain Center, 54, Washington Square South, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States" building university 0.301 United States FALSE
+king kong us Americas Northern America FALSE 1 2021-02-03 89019482 way "King Kong, Bexar County, Texas, 78236, United States" highway residential 0.3 United States FALSE
+kings us Americas Northern America FALSE 1 2021-02-03 258002610 relation "Kings County, California, United States" boundary administrative 0.648553789525574 United States FALSE
+kingsbrook jewish medical center us Americas Northern America FALSE 1 2021-02-03 209315997 way "Kingsbrook Jewish Medical Center, 585, Schenectady Avenue, East Flatbush, Brooklyn, Kings County, New York, 11203, United States" amenity hospital 0.653363019766637 United States FALSE
+korean studies us Americas Northern America FALSE 1 2021-02-03 259381167 relation "Center for Korean Studies, 1881, East West Road, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" building university 0.201 United States FALSE
+kqed us Americas Northern America FALSE 1 2021-02-03 45347963 node "KQED, 50, West San Fernando Street, Downtown Historic District, San Jose, Santa Clara County, California, 95110, United States" amenity studio 0.439805842395375 United States FALSE
+ksu us Americas Northern America FALSE 1 2021-02-03 134730614 way "Kent State University, Health Center Drive, Kent, Portage County, Ohio, 44242-0001, United States" amenity university 0.481992451472996 United States FALSE
+kuhlman us Americas Northern America FALSE 1 2021-02-03 427205 node "Kuhlman, Highlands County, Florida, 33872:33875, United States" place hamlet 0.35 United States FALSE
+l-1 us Americas Northern America FALSE 1 2021-02-03 177817604 way "L-1, Palm Beach County, Florida, 33417, United States" waterway canal 0.45 United States FALSE
+la jolla institute of immunology us Americas Northern America FALSE 1 2021-02-03 149701516 way "La Jolla Institute for Allergy and Immunology, Athena Circle, Science Research Park, University City, San Diego, San Diego County, California, 92039, United States" building university 0.401 United States FALSE
+la parguera us Americas Northern America FALSE 1 2021-02-03 51134028 node "La Parguera, Parguera, Lajas, Puerto Rico, United States" place suburb 0.475 United States FALSE
+labcorp us Americas Northern America FALSE 1 2021-02-03 209061591 way "LabCorp, Burlington, Alamance County, North Carolina, United States" highway residential 0.2 United States FALSE
+laboratory of virology us Americas Northern America FALSE 1 2021-02-03 133911148 way "Primate Virology & Immunology Laboratory, 188, County Road 98, Plainfield, Davis, Yolo County, California, 95616, United States" building university 0.201 United States FALSE
+lafayette college us Americas Northern America FALSE 1 2021-02-03 259082367 relation "Lafayette College, 730, High Street, College Hill, Easton, Northampton County, Pennsylvania, 18042, United States" amenity university 0.659772446157665 United States FALSE
+lake mercer us Americas Northern America FALSE 1 2021-02-03 258399251 relation "Grand Lake–Saint Marys, Montezuma, Mercer County, Ohio, 45822, United States" natural water 0.522734482343971 United States FALSE
+langone medical center us Americas Northern America FALSE 1 2021-02-03 125494622 way "NYU Langone Medical Center, East 30th Street, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10016, United States" amenity hospital 0.653159798268413 United States FALSE
+large binocular telescope observatory us Americas Northern America FALSE 1 2021-02-03 104893463 way "Large Binocular Telescope, Mount Graham International Observatory Road, Old Columbine, Graham County, Arizona, United States" man_made observatory 0.829506969685059 United States FALSE
+larsen c us Americas Northern America FALSE 1 2021-02-03 445188 node "Larsen, Jacksonville, Duval County, Florida, 32207, United States" place hamlet 0.45 United States FALSE
+lawrence university us Americas Northern America FALSE 1 2021-02-03 258589542 relation "Lawrence University, 711, East Boldt Way, Appleton, Outagamie County, Wisconsin, 54911, United States" amenity university 0.624872581583534 United States FALSE
+lb myrtle us Americas Northern America FALSE 1 2021-02-03 89847089 way "Myrtle, Houston, Harris County, Texas, 77054, United States" highway residential 0.2 United States FALSE
+lee university us Americas Northern America FALSE 1 2021-02-03 217690083 way "Lee University, North Ocoee Street, Cleveland, Bradley County, Tennessee, 37311, United States" amenity university 0.562774714414326 United States FALSE
+lehigh university us Americas Northern America FALSE 1 2021-02-03 2597738 node "Lehigh University, Library Drive, Sayre Park, Bethlehem, Northampton County, Pennsylvania, 18015, United States" amenity school 0.201 United States FALSE
+lehman college of the city university of new york us Americas Northern America FALSE 1 2021-02-03 107135502 way "Lehman College of the City University of New York, 250, Bedford Park Boulevard West, The Bronx, Bronx County, New York, 10468, United States" amenity university 1.2697288539961 United States FALSE
+lena foundation us Americas Northern America FALSE 1 2021-02-03 26990642 node "LENA Research Foundation, 5525, Central Avenue, Boulder, Boulder County, Colorado, 80301, United States" office research 0.201 United States FALSE
+life sciences us Americas Northern America FALSE 1 2021-02-03 252383599 way "Life Sciences, Suffolk County, New York, 11794-5252, United States" highway footway 0.275 United States FALSE
+lifelong medical care us Americas Northern America FALSE 1 2021-02-03 52123935 node "Lifelong Medical Care, 11th Street, Iron Triangle, Richmond, Contra Costa County, California, 94801, United States" amenity clinic 0.301 United States FALSE
+lille university hospital us Americas Northern America FALSE 1 2021-02-03 169772928 way "Friedberg Lifelong Learning Center (LL-31C), West University Drive, Boca Raton, Palm Beach County, Florida, 33431, United States" building university 0.101 United States FALSE
+lincoln park zoo us Americas Northern America FALSE 1 2021-02-03 258697898 relation "Lincoln Park Zoo, 2001, North Clark Street, Belgravia Terrace, Lincoln Park, Chicago, Cook County, Illinois, 60614, United States" tourism zoo 0.635161875786798 United States FALSE
+llnl us Americas Northern America FALSE 1 2021-02-03 95865246 way "Lawrence Livermore National Laboratory, South Vasco Road, Livermore, Alameda County, California, 94550, United States" amenity science_park 0.493328255224182 United States FALSE
+local motors us Americas Northern America FALSE 1 2021-02-03 51604923 node "Local Motors, 151, Saint George Boulevard, National Harbor, Potomac Vista, Fort Washington, Prince George's County, Maryland, 20745, United States" office company 0.201 United States FALSE
+lockheed us Americas Northern America FALSE 1 2021-02-03 87602610 way "Lockheed, Willow Park, Parker County, Texas, United States" highway residential 0.2 United States FALSE
+lockheed martin of denver us Americas Northern America FALSE 1 2021-02-03 69800309 node "Lockheed Martin, North Mathilda Avenue, Sunnyvale, Santa Clara County, California, 94089, United States" railway station 0.51689306175332 United States FALSE
+loma linda university us Americas Northern America FALSE 1 2021-02-03 244288874 way "Loma Linda University, Tulip Avenue, Loma Linda, San Bernardino County, California, 92350, United States" amenity university 0.301 United States FALSE
+long island university us Americas Northern America FALSE 1 2021-02-03 142291190 way "The Island, 4213, 5th Avenue Northeast, University District, Seattle, King County, Washington, 98105, United States" building yes 0.201 United States FALSE
+los alamos us Americas Northern America FALSE 1 2021-02-03 257505561 relation "Los Alamos, Los Alamos County, New Mexico, United States" boundary administrative 0.677156057530702 United States FALSE
+los angeles county superior court us Americas Northern America FALSE 1 2021-02-03 19959088 node "Los Angeles County Superior Court, South Commonwealth Avenue, Westlake, Los Angeles, Los Angeles County, California, 90005, United States" amenity courthouse 0.501 United States FALSE
+los angeles times us Americas Northern America FALSE 1 2021-02-03 258868206 relation "Los Angeles Times, 202, South Spring Street, Historic Core District, Downtown, Los Angeles, Los Angeles County, California, 90013, United States" office newspaper 0.503130333992136 United States FALSE
+louisiana state university in baton rouge us Americas Northern America FALSE 1 2021-02-03 100338394 way "Louisiana State University, West Lakeshore Drive, College Town, Baton Rouge, East Baton Rouge Parish, Louisiana, 70802, United States" amenity university 1.05035884372188 United States FALSE
+loyola university chicago us Americas Northern America FALSE 1 2021-02-03 259482995 relation "Loyola University Chicago, 1032, West Sheridan Road, Rogers Park, Chicago, Rogers Park Township, Cook County, Illinois, 60660, United States" amenity university 0.78906723611033 United States FALSE
+loyola university medical center us Americas Northern America FALSE 1 2021-02-03 134129591 way "Loyola University Medical Center, 2160, South 1st Avenue, Maywood, Proviso Township, Cook County, Illinois, 60153, United States" amenity hospital 0.661844955490085 United States FALSE
+loyola university of chicago us Americas Northern America FALSE 1 2021-02-03 123418197 way "Loyola University Water Tower Campus, North Rush Street, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States" amenity university 0.78906723611033 United States FALSE
+lunar planetary institute us Americas Northern America FALSE 1 2021-02-03 2467172 node "Lunar and Planetary Institute Rice University, West Oaks Drive, Pasadena, Harris County, Texas, 77058, United States" amenity school 0.301 United States FALSE
+lyft us Americas Northern America FALSE 1 2021-02-03 157118156 way "Lyft, 26th Street, Potrero Terrace, San Francisco, San Francisco City and County, California, 94124, United States" building yes 0.101 United States FALSE
+macchiarini us Americas Northern America FALSE 1 2021-02-03 106996300 way "Peter Macchiarini Steps, Telegraph Hill, San Francisco, San Francisco City and County, California, 94113, United States" highway steps 0.175 United States FALSE
+magdalena ridge observatory us Americas Northern America FALSE 1 2021-02-03 210665019 way "Magdalena Ridge Observatory 2.4 m Telescope, Water Canyon Road, Socorro County, New Mexico, United States" man_made telescope 0.301 United States FALSE
+magee-womens research institute us Americas Northern America FALSE 1 2021-02-03 174580335 way "Magee-Womens Research Institute, 204, Craft Avenue, South Oakland, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States" building apartments 0.401 United States FALSE
+maharishi university of management us Americas Northern America FALSE 1 2021-02-03 232195936 way "Maharishi International University, 1000, North 4th Street, Fairfield, Jefferson County, Iowa, 52557, United States" amenity university 0.201 United States FALSE
+manchester university us Americas Northern America FALSE 1 2021-02-03 182019486 way "Manchester University, 604, East College Avenue, North Manchester, Wabash County, Indiana, 46962, United States" amenity university 0.534623598134972 United States FALSE
+manufacturing usa us Americas Northern America FALSE 1 2021-02-03 234440084 way "Zippo Manufacturing Company, Bradford Township, McKean County, Pennsylvania, United States" landuse industrial 0.492802990599768 United States FALSE
+marine policy center us Americas Northern America FALSE 1 2021-02-03 108710790 way "Bush River Yacht Club, 4001, East Baker Avenue, Wildwood, Harford County, Maryland, 21009, United States" leisure marina 0.001 United States FALSE
+marine research us Americas Northern America FALSE 1 2021-02-03 26002868 node "West Marine, Research Boulevard, North Crossing, Austin, Travis County, Texas, 78752, United States" shop boat 0.201 United States FALSE
+marquette university us Americas Northern America FALSE 1 2021-02-03 258967349 relation "Marquette University, West Canal Street, Menomonee River Valley, Milwaukee, Milwaukee County, Wisconsin, 53208, United States" amenity university 0.69509364958047 United States FALSE
+marriott harrison us Americas Northern America FALSE 1 2021-02-03 210483963 way "Marriott Renaissance, Hutchinson River Parkway, Town of Harrison, New York, 10577, United States" tourism hotel 0.201 United States FALSE
+mary lyon centre us Americas Northern America FALSE 1 2021-02-03 684057 node "Mary Lyon, 50, Beechcroft Street, Faneuil, Brighton, Boston, Suffolk County, Massachusetts, 02135, United States" amenity school 0.201 United States FALSE
+mason inman us Americas Northern America FALSE 1 2021-02-03 223001264 way "Mason Road, Pleasent Meadows Apartments, Inman, Spartanburg County, South Carolina, 29349, United States" highway residential 0.3 United States FALSE
+mass. us Americas Northern America FALSE 1 2021-02-03 258278823 relation "Massachusetts, United States" boundary administrative 0.836449761303479 United States FALSE
+massachusetts institute of technology in cambridge us Americas Northern America FALSE 1 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 1.24674262776464 United States FALSE
+massachusetts institute of technology lincoln laboratory us Americas Northern America FALSE 1 2021-02-03 20038570 node "Massachusetts Institute of Technology Lincoln Laboratory, 244, Wood Street, Lexington, Middlesex County, Massachusetts, 01731, United States" building industrial 0.601 United States FALSE
+massachusetts of technology us Americas Northern America FALSE 1 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 0.946742627764641 United States FALSE
+masten space systems us Americas Northern America FALSE 1 2021-02-03 82389889 node "Masten Space Systems, 1570, Sabovich Street, Mojave, Kern County, California, 93501, United States" office company 0.644815486121403 United States FALSE
+masten space systems of mojave us Americas Northern America FALSE 1 2021-02-03 82389889 node "Masten Space Systems, 1570, Sabovich Street, Mojave, Kern County, California, 93501, United States" office company 0.744815486121403 United States FALSE
+mbl us Americas Northern America FALSE 1 2021-02-03 133977853 way "Manistee County-Blacker Airport, Chippewa Highway, Manistee Township, Manistee County, Michigan, 49660, United States" aeroway aerodrome 0.252344279227432 United States FALSE
+mcafee us Americas Northern America FALSE 1 2021-02-03 98813875 way "McAfee, Mission College Boulevard, Santa Clara, Santa Clara County, California, 95054-1231, United States" building yes 0.566266067536779 United States FALSE
+mcgovern institute for brain research us Americas Northern America FALSE 1 2021-02-03 488056 node "McGovern Institute for Brain Research (MIT), 43, Vassar Street, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" amenity research_institute 0.810037958989748 United States FALSE
+mclean hospital us Americas Northern America FALSE 1 2021-02-03 200768064 way "McLean Hospital, 115, Mill Street, Kendall Gardens, Belmont, Middlesex County, Massachusetts, 02478, United States" amenity hospital 0.526548011937258 United States FALSE
+media lab us Americas Northern America FALSE 1 2021-02-03 133210918 way "E14 - Media Lab, 75, Amherst Street, Cambridge, Middlesex County, Massachusetts, 02139, United States" building university 0.201 United States FALSE
+medical college of wisconsin us Americas Northern America FALSE 1 2021-02-03 223514733 way "Medical College of Wisconsin, 8701, East Connell Court, Wauwatosa, Milwaukee County, Wisconsin, 53226, United States" amenity university 0.755899467051989 United States FALSE
+meharry medical college us Americas Northern America FALSE 1 2021-02-03 195325955 way "Meharry Medical College, 1005, Dr D B Todd Jr Boulevard, Nashville-Davidson, Davidson County, Tennessee, 37208, United States" amenity university 0.301 United States FALSE
+merck & co. us Americas Northern America FALSE 1 2021-02-03 299016689 node "Merck & Co., 4633, Merck Road, Finch Mill, Wilson, Wilson County, North Carolina, 27893, United States" amenity pharmacy 0.201 United States FALSE
+"merck, johnson & johnson" us Americas Northern America FALSE 1 2021-02-03 210048712 way "Merck Campus, De Soto, Johnson County, Kansas, United States" landuse industrial 0.5 United States FALSE
+merrimack pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 43463000 node "Merrimack Pharmaceuticals, 1, Broadway, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity research_institute 0.201 United States FALSE
+methodist hospital us Americas Northern America FALSE 1 2021-02-03 170349304 way "Methodist Hospital, 2301, South Broad Street, South Philadelphia, Philadelphia, Philadelphia County, Pennsylvania, 19145, United States" amenity hospital 0.341913844040538 United States FALSE
+metropolitan state university of denver us Americas Northern America FALSE 1 2021-02-03 20321803 node "Metropolitan State University of Denver, Lawrence Street Mall, Auraria, Denver, Denver County, Colorado, 80217, United States" amenity university 0.851537799411788 United States FALSE
+mexican national forest commission us Americas Northern America FALSE 1 2021-02-03 69476412 node "San Antonio and Mexican Gulf Railroad, FM 1090, Port Lavaca, Calhoun County, Texas, 77979, United States" tourism information 0.101 United States FALSE
+miami university of ohio in oxford us Americas Northern America FALSE 1 2021-02-03 134890642 way "Miami University, McKee Avenue, Oxford, Oxford Township, Butler County, Ohio, 45056, United States" amenity university 0.901832830623064 United States FALSE
+micron technology us Americas Northern America FALSE 1 2021-02-03 139763063 way "Micron Technology, Boise, Ada County, Idaho, United States" landuse industrial 0.4 United States FALSE
+military college of south carolina us Americas Northern America FALSE 1 2021-02-03 195543970 way "The Citadel, 171, Moultrie Street, Charleston, Charleston County, South Carolina, 29409, United States" amenity university 0.631222267761364 United States FALSE
+millipore us Americas Northern America FALSE 1 2021-02-03 202253346 way "Millipore, 11, Prescott Road, Squantum, Jaffrey, Cheshire County, New Hampshire, 03452, United States" building commercial 0.101 United States FALSE
+millipore sigma us Americas Northern America FALSE 1 2021-02-03 259388950 relation "Millipore Sigma, North Harrison Road, Pleasant Gap, Spring Township, Centre County, Pennsylvania, 16823, United States" building commercial 0.201 United States FALSE
+minnesota department of natural resources us Americas Northern America FALSE 1 2021-02-03 79363327 node "Minnesota Department of Natural Resources, County Road 21, Jameson, Ranier, Koochiching County, Minnesota, 56649, United States" office government 0.501 United States FALSE
+minnesota state fair us Americas Northern America FALSE 1 2021-02-03 86373774 way "Minnesota Avenue, Fair Oaks, Sacramento County, California, 95628-7416, United States" highway residential 0.4 United States FALSE
+miss us Americas Northern America FALSE 1 2021-02-03 258375642 relation "Mississippi, United States" boundary administrative 0.800391778545257 United States FALSE
+missile defense agency us Americas Northern America FALSE 1 2021-02-03 123924708 way "Missile Defense Agency, 18th Street, Fort Belvoir South Post, Fort Belvoir, Fairfax County, Virginia, 22060, United States" building yes 0.301 United States FALSE
+mission blue us Americas Northern America FALSE 1 2021-02-03 258451463 relation "Mission, Umatilla County, Oregon, United States" boundary administrative 0.424032054467804 United States FALSE
+missouri university of science and technology us Americas Northern America FALSE 1 2021-02-03 259052765 relation "Missouri University of Science and Technology, North Walker Avenue, Rolla, Phelps County, Missouri, 65409, United States" amenity university 1.00078255314529 United States FALSE
+mit press us Americas Northern America FALSE 1 2021-02-03 63902179 node "The MIT Press Bookstore, 297, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" shop books 0.201 United States FALSE
+mit press of cambridge us Americas Northern America FALSE 1 2021-02-03 63902179 node "The MIT Press Bookstore, 297, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" shop books 0.301 United States FALSE
+mitre corporation us Americas Northern America FALSE 1 2021-02-03 103399470 way "The MITRE Corporation, 202, Burlington Road, Bedford, Middlesex County, Massachusetts, 01730, United States" building office 0.201 United States FALSE
+mo us Americas Northern America FALSE 1 2021-02-03 258150217 relation "Missouri, United States" boundary administrative 0.73288134470033 United States FALSE
+mo. us Americas Northern America FALSE 1 2021-02-03 258150217 relation "Missouri, United States" boundary administrative 0.73288134470033 United States FALSE
+moe us Americas Northern America FALSE 1 2021-02-03 258150217 relation "Missouri, United States" boundary administrative 0.73288134470033 United States FALSE
+molecular ecology us Americas Northern America FALSE 1 2021-02-03 257345614 way "Wildlife Molecular Ecology Office, 2322, Mowry Road, Gainesville, Alachua County, Florida, 32611, United States" office research 0.201 United States FALSE
+molycorp us Americas Northern America FALSE 1 2021-02-03 174420277 way "Molycorp Evaporation Ponds, San Bernardino County, California, United States" landuse disused:industrial 0.3 United States FALSE
+monell us Americas Northern America FALSE 1 2021-02-03 370315 node "Monell, Sweetwater County, Wyoming, United States" place hamlet 0.35 United States FALSE
+montana state us Americas Northern America FALSE 1 2021-02-03 258349675 relation "Montana, United States" boundary administrative 0.901736049923475 United States FALSE
+morehouse school of medicine us Americas Northern America FALSE 1 2021-02-03 296931474 node "Morehouse School of Medicine, 720, Westview Drive Southwest, Joel Chandler Harris Homes, Atlanta, Fulton County, Georgia, 30310, United States" amenity university 0.740791981823335 United States FALSE
+morgan mitchell us Americas Northern America FALSE 1 2021-02-03 2475110 node "Morgan Peak, Mitchell County, Texas, 79565, United States" natural peak 0.5 United States FALSE
+mote marine laboratory us Americas Northern America FALSE 1 2021-02-03 73893475 node "Mote Marine Laboratory and Aquarium, 1600, Ken Thompson Parkway, Sarasota, Sarasota County, Florida, 34236, United States" tourism museum 0.301 United States FALSE
+mothers against drunk driving us Americas Northern America FALSE 1 2021-02-03 55217955 node "Mothers Against Drunk Driving, Del Prado Boulevard South, Cape Coral, Lee County, Florida, 33990, United States" office association 0.401 United States FALSE
+mount discovery us Americas Northern America FALSE 1 2021-02-03 2597020 node "Mount Discovery, Essex County, New York, 12950, United States" natural peak 0.5 United States FALSE
+mount holyoke college us Americas Northern America FALSE 1 2021-02-03 96922935 way "Mount Holyoke College, Ferry Street, South Hadley, Hampshire County, Massachusetts, 01075, United States" amenity college 0.761796795268744 United States FALSE
+mount sinai medical center us Americas Northern America FALSE 1 2021-02-03 167167559 way "Mount Sinai Medical Center, 4300, Alton Road, Miami Beach, Miami-Dade County, Florida, 33140, United States" amenity hospital 0.633228686818865 United States FALSE
+ms us Americas Northern America FALSE 1 2021-02-03 258375642 relation "Mississippi, United States" boundary administrative 0.700391778545257 United States FALSE
+msu us Americas Northern America FALSE 1 2021-02-03 165822886 way "Montana State University, West College Street, Bozeman, Gallatin County, Montana, 59715, United States" amenity university 0.429796188420265 United States FALSE
+multiple sclerosis foundation us Americas Northern America FALSE 1 2021-02-03 57425651 node "Multiple Sclerosis Foundation, 6520, North Andrews Avenue, Fort Lauderdale, Broward County, Florida, 33309, United States" office company 0.301 United States FALSE
+museum of natural history us Americas Northern America FALSE 1 2021-02-03 2968697 node "Museum of Natural History, 17, North Clinton Street, Iowa City, Johnson County, Iowa, 52245, United States" tourism museum 0.659145294756841 United States FALSE
+nasa federal credit union us Americas Northern America FALSE 1 2021-02-03 74145150 node "NASA Federal Credit Union, 2452, Solomons Island Road, Dorsey Heights, Parole, Anne Arundel County, Maryland, 20776:21037, United States" amenity bank 0.401 United States FALSE
+nasa headquarters us Americas Northern America FALSE 1 2021-02-03 103417943 way "National Aeronautics and Space Administration Headquarters, E Street Southwest, Southwest Employment Area, Washington, District of Columbia, 20546, United States" office government 0.101 United States FALSE
+nashville zoo us Americas Northern America FALSE 1 2021-02-03 7117976 node "Croft House, Elysian Fields Road, Paragon Mills, Nashville-Davidson, Davidson County, Tennessee, 37211, United States" tourism museum 0.101 United States FALSE
+national agency us Americas Northern America FALSE 1 2021-02-03 258146830 relation "Agency, Wapello County, Iowa, 52530, United States" boundary administrative 0.53283621062172 United States FALSE
+national bureau of economic research us Americas Northern America FALSE 1 2021-02-03 97970473 way "National Bureau of Economic Research, 1050, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02138, United States" building yes 0.934032993844314 United States FALSE
+national center for genome resources in santa fe us Americas Northern America FALSE 1 2021-02-03 234806388 way "National Center for Genome Resources, Santa Fe, Santa Fe County, New Mexico, United States" landuse commercial 0.9 United States FALSE
+national center for health research us Americas Northern America FALSE 1 2021-02-03 182466192 way "CHER, West 2nd Street, Morehead, Rowan County, Kentucky, 40351, United States" building school 0.001 United States FALSE
+national climate service us Americas Northern America FALSE 1 2021-02-03 78587650 node "Climate, 5282, Monahans Avenue, The Shops at Clearfork, Fort Worth, Tarrant County, Texas, 76109, United States" shop sports 0.101 United States FALSE
+national comprehensive cancer center us Americas Northern America FALSE 1 2021-02-03 170461892 way "Comprehensive Cancer Center, 340, Exempla Circle, Lafayette, Boulder County, Colorado, 80026, United States" office yes 0.301 United States FALSE
+national energy research scientific computing center us Americas Northern America FALSE 1 2021-02-03 167787512 way "National Energy Research Scientific Computing Center (NERSC), Cyclotron Road, Northside, Berkeley, Alameda County, California, 94720, United States" building yes 0.601 United States FALSE
+national engineering technology research center us Americas Northern America FALSE 1 2021-02-03 105357679 way "Engineering Systems Building, Technology Trail, GE Global Research Center, Niskayuna, Schenectady County, New York, 12309, United States" building industrial 0.401 United States FALSE
+national foundation us Americas Northern America FALSE 1 2021-02-03 49534292 node "Foundation, Monahans, Ward County, Texas, 79756, United States" place neighbourhood 0.35 United States FALSE
+national geographic society us Americas Northern America FALSE 1 2021-02-03 104285798 way "National Geographic Society, Sumner Row, Golden Triangle, Washington, District of Columbia, 20006-5346, United States" building government 0.85218387169211 United States FALSE
+national heart us Americas Northern America FALSE 1 2021-02-03 356190 node "Heart, Fulton County, Arkansas, 72539, United States" place hamlet 0.35 United States FALSE
+national hurricane center us Americas Northern America FALSE 1 2021-02-03 212513790 way "National Hurricane Center, Miami-Dade County, Florida, 33199, United States" highway service 0.375 United States FALSE
+national institute of food and agriculture us Americas Northern America FALSE 1 2021-02-03 102637103 way "National Institute of Food and Agriculture, Waterfront Centre, 9th Street Southwest, Southwest Waterfront, Washington, District of Columbia, 20024, United States" building yes 0.906728041583383 United States FALSE
+national intelligence us Americas Northern America FALSE 1 2021-02-03 23760341 node "Intelligence, Babson Boulder Trail, Gloucester, Essex County, Massachusetts, 01930-3540, United States" historic archaeological_site 0.101 United States FALSE
+national kidney foundation us Americas Northern America FALSE 1 2021-02-03 8481622 node "National Kidney Foundation, 100, North Main Street, Keister Addition, Blacksburg, Montgomery County, Virginia, 24060-7401, United States" office association 0.301 United States FALSE
+national library of medicine us Americas Northern America FALSE 1 2021-02-03 100564321 way "NLM, 8600, Rockville Pike, Glenbrook, East Bethesda, Bethesda, Montgomery County, Maryland, 20894, United States" amenity library 0.574397490815619 United States FALSE
+national nuclear laboratory us Americas Northern America FALSE 1 2021-02-03 3063674 node "Vallecitos Nuclear Center, Vallecitos Road, Alameda County, California, 94586, United States" building yes 0.469114061872155 United States FALSE
+national reconnaissance office us Americas Northern America FALSE 1 2021-02-03 153231959 way "National Reconnaissance Office, Fairfax County, Virginia, United States" landuse military 0.790008541274048 United States FALSE
+national renewable energy laboratory us Americas Northern America FALSE 1 2021-02-03 136641314 way "Solar Energy Research Facility, Denver West Parkway, Pleasant View, Jefferson County, Colorado, 80401-4015, United States" building yes 0.101 United States FALSE
+national research centre us Americas Northern America FALSE 1 2021-02-03 123856183 way "National Research Center, 30th Street, Boulder, Boulder County, Colorado, 80304, United States" building office 0.201 United States FALSE
+national science library us Americas Northern America FALSE 1 2021-02-03 124347967 way "Brown University Sciences Library, 101-109, Thayer Street, College Hill, Providence, Providence County, Rhode Island, 02912, United States" amenity library 0.474532111506442 United States FALSE
+national wildlife federation us Americas Northern America FALSE 1 2021-02-03 232820332 way "National Wildlife Federation, Business Center Drive, Pinecrest, Reston, Fairfax County, Virginia, 20190, United States" man_made works 0.301 United States FALSE
+natural sciences us Americas Northern America FALSE 1 2021-02-03 205619227 way "Natural Sciences, 34th Avenue, Phoenix, Maricopa County, Arizona, 85019, United States" building yes 0.201 United States FALSE
+nature center us Americas Northern America FALSE 1 2021-02-03 107104919 way "Nature Center, Mendon, Monroe County, New York, United States" landuse construction 0.4 United States FALSE
+nature news us Americas Northern America FALSE 1 2021-02-03 95688403 way "Sandy Bottom Nature Park, 1255, Morrison, Hampton, Newport News, Virginia, 23666, United States" boundary national_park 0.325 United States FALSE
+nau us Americas Northern America FALSE 1 2021-02-03 138822770 way "Northern Arizona University, South Beaver Street, Flagstaff Normal Addition, Flagstaff, Coconino County, Arizona, 86001, United States" amenity university 0.451100009026849 United States FALSE
+navajo nation reservation us Americas Northern America FALSE 1 2021-02-03 259240483 relation "Navajo Nation, United States" boundary aboriginal_lands 0.692311230103081 United States FALSE
+naval postgraduate school us Americas Northern America FALSE 1 2021-02-03 199378988 way "US Naval Postgraduate School, 1, Del Monte, Monterey, Monterey County, California, 93943, United States" landuse military 0.5 United States FALSE
+ncsu us Americas Northern America FALSE 1 2021-02-03 2661843 node "NCSU Pond Number One Dam, Wake County, North Carolina, 27603-2668, United States" waterway dam 0.35 United States FALSE
+ne us Americas Northern America FALSE 1 2021-02-03 257963338 relation "Nebraska, United States" boundary administrative 0.799657112825905 United States FALSE
+netflix us Americas Northern America FALSE 1 2021-02-03 169311000 way "Netflix, 3175, Northeast Aloclek Drive, East Hillsboro, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, 97124, United States" office company 0.101 United States FALSE
+new bedford whaling museum us Americas Northern America FALSE 1 2021-02-03 142269179 way "New Bedford Whaling Museum, 18, Johnny Cake Hill, New Bedford, Bristol County, Massachusetts, 02740, United States" tourism museum 0.660958143076972 United States FALSE
+new harvest us Americas Northern America FALSE 1 2021-02-03 176266386 way "New Harvest, Spruce Street, Spruce Hill, Philadelphia, Philadelphia County, Pennsylvania, 19139, United States" amenity fast_food 0.201 United States FALSE
+new jersey institute of technology us Americas Northern America FALSE 1 2021-02-03 185826691 way "New Jersey Institute of Technology, Wickliffe Street, University Heights, Newark, Essex County, New Jersey, 07103, United States" amenity university 0.913510524610342 United States FALSE
+new madrid us Americas Northern America FALSE 1 2021-02-03 258032415 relation "New Madrid County, Missouri, United States" boundary administrative 0.712205972002166 United States FALSE
+new york institute of technology us Americas Northern America FALSE 1 2021-02-03 214578329 way "New York Institute of Technology, North Hempstead Turnpike, Old Westbury, Oyster Bay, Nassau County, New York, 11548, United States" amenity university 0.501 United States FALSE
+new york stock exchange us Americas Northern America FALSE 1 2021-02-03 158002696 way "New York Stock Exchange, 11, Wall Street, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10005, United States" tourism attraction 0.401 United States FALSE
+new york university medical center us Americas Northern America FALSE 1 2021-02-03 158641184 way "New York University Medical Center, East 38th Street, Murray Hill, Manhattan Community Board 6, Manhattan, New York County, New York, 10016, United States" amenity clinic 0.501 United States FALSE
+newhall us Americas Northern America FALSE 1 2021-02-03 257449480 relation "Newhall, Benton County, Iowa, United States" boundary administrative 0.53504820152981 United States FALSE
+nicholls state university us Americas Northern America FALSE 1 2021-02-03 100200943 way "Nicholls State University, 906, East 1st Street, Thibodaux, Lafourche Parish, Louisiana, 70301, United States" amenity university 0.69394918828843 United States FALSE
+nightingale us Americas Northern America FALSE 1 2021-02-03 439499 node "Nightingale, Frederick County, Maryland, 21774, United States" place hamlet 0.35 United States FALSE
+nih clinical center us Americas Northern America FALSE 1 2021-02-03 101358622 way "NIH Clinical Center, 10, Center Drive, National Institutes of Health, Maplewood, Bethesda, Montgomery County, Maryland, 20892, United States" building hospital 0.615064072959253 United States FALSE
+nlm us Americas Northern America FALSE 1 2021-02-03 100564321 way "NLM, 8600, Rockville Pike, Glenbrook, East Bethesda, Bethesda, Montgomery County, Maryland, 20894, United States" amenity library 0.674397490815619 United States FALSE
+nmfs us Americas Northern America FALSE 1 2021-02-03 248605045 way "NMFS, Cottage Street, Fort Trumbull, Milford, New Haven County, Connecticut, 06461, United States" building service 0.101 United States FALSE
+nomad us Americas Northern America FALSE 1 2021-02-03 259247036 relation "NoMad, Manhattan Community Board 5, Manhattan, New York County, New York, United States" boundary administrative 0.429555066820797 United States FALSE
+non-noaa us Americas Northern America FALSE 1 2021-02-03 248632258 way "NOAA, Pascagoula, Jackson County, Mississippi, 39567, United States" highway tertiary 0.2 United States FALSE
+north carolina department of environmental quality us Americas Northern America FALSE 1 2021-02-03 220675454 way "Department of Environmental Quality, Aspen Street, Helena, Lewis and Clark County, Montana, 59602-1217, United States" office government 0.401 United States FALSE
+northern illinois university us Americas Northern America FALSE 1 2021-02-03 192458528 way "Northern Illinois University, Stadium Drive, DeKalb, DeKalb County, Illinois, 60115, United States" amenity university 0.301 United States FALSE
+northridge us Americas Northern America FALSE 1 2021-02-03 345694 node "Northridge, Los Angeles, Los Angeles County, California, 91324, United States" place suburb 0.518973378442822 United States FALSE
+northwest fisheries science center us Americas Northern America FALSE 1 2021-02-03 173032772 way "Northwest Fisheries Science Center, 2725, Montlake Boulevard East, Montlake, Seattle, King County, Washington, 98112, United States" office government 0.401 United States FALSE
+northwest research associates us Americas Northern America FALSE 1 2021-02-03 2985973 node "Santa Barbara County Building;Lompoc Museum;Lompoc Museum Associates Research Library, 200, South H Street, Lompoc, Santa Barbara County, California, 93436, United States" tourism museum 0.328160971568546 United States FALSE
+npa us Americas Northern America FALSE 1 2021-02-03 10613845 node "Pensacola Naval Air Station/Forrest Sherman Field, Skyhawk Drive, Pensacola, Escambia County, Florida, 32508, United States" aeroway aerodrome 0.426476718565125 United States FALSE
+npr us Americas Northern America FALSE 1 2021-02-03 49983705 node "WVXU 91.7 FM, Central Parkway, Betts-Longworth Historic District, West End, Cincinnati, Hamilton County, Ohio, 45210, United States" amenity studio 0.299997827209804 United States FALSE
+nrao us Americas Northern America FALSE 1 2021-02-03 299024599 relation "Green Bank Observatory, ICB Road, Green Bank, Pocahontas County, West Virginia, 24944, United States" amenity research_institute 0.001 United States FALSE
+nrg us Americas Northern America FALSE 1 2021-02-03 6784494 node "NRG, 3600, South Broad Street, Packer Park, South Philadelphia, Philadelphia, Philadelphia County, Pennsylvania, 19112, United States" railway station 0.401865618613023 United States FALSE
+nrg energy us Americas Northern America FALSE 1 2021-02-03 226847874 way "NRG Energy Fly Ash Landfill, Tonawanda, Erie County, New York, United States" landuse landfill 0.4 United States FALSE
+nsa us Americas Northern America FALSE 1 2021-02-03 135361590 way "National Security Agency, Anne Arundel County, Maryland, United States" landuse government 0.566177100706018 United States FALSE
+nucor us Americas Northern America FALSE 1 2021-02-03 132810990 way "Nucor Steel, Montgomery County, Indiana, United States" landuse industrial 0.3 United States FALSE
+ny us Americas Northern America FALSE 1 2021-02-03 257701567 relation "New York, United States" boundary administrative 0.765584640908957 United States FALSE
+nyu school of medicine us Americas Northern America FALSE 1 2021-02-03 12578717 node "NYU School of Medicine, 562, 1st Avenue, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10017-6927, United States" amenity university 0.799286093607089 United States FALSE
+oakland university us Americas Northern America FALSE 1 2021-02-03 101157737 way "Oakland University, 201, Meadow Brook Road, Rochester, Oakland County, Michigan, 48309-4401, United States" amenity university 0.611679724670082 United States FALSE
+obstetrics and gynecology us Americas Northern America FALSE 1 2021-02-03 2345795 node "Obstetrics and Gynecology, 1015, Union Street, Boone, Boone County, Iowa, 50036, United States" amenity doctors 0.301 United States FALSE
+occidental us Americas Northern America FALSE 1 2021-02-03 100208097 way "Occidental, Sonoma County, California, 95465, United States" boundary administrative 0.475700293936422 United States FALSE
+occidental petroleum us Americas Northern America FALSE 1 2021-02-03 185703827 way "Occidental Petroleum, Deauville Boulevard, Westridge Park, Midland, Midland County, Texas, 79703, United States" building yes 0.201 United States FALSE
+occupational safety and health administration us Americas Northern America FALSE 1 2021-02-03 216527579 way "Occupational Safety & Health, Shuler Loop Trailhead, Durant, Bryan County, Oklahoma, 74701, United States" building yes 0.301 United States FALSE
+ocean and atmosphere us Americas Northern America FALSE 1 2021-02-03 179780174 way "W.M. Keck Foundation Center for Ocean Atmosphere Research, San Diego, San Diego County, California, United States" landuse industrial 0.4 United States FALSE
+office for science us Americas Northern America FALSE 1 2021-02-03 3035430 node "The Mary Baker Eddy Library for the Betterment of Humanity, Christian Science Plaza, South End, Boston, Suffolk County, Massachusetts, 02115, United States" amenity library 0.470074815609084 United States FALSE
+office of criminal investigations us Americas Northern America FALSE 1 2021-02-03 3040663 node "Criminal Investigations, South Park Avenue, Titusville, Brevard County, Florida, 32780, United States" building public 0.201 United States FALSE
+office of new drugs us Americas Northern America FALSE 1 2021-02-03 43881066 node "Drugs, 1st Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States" amenity pharmacy 0.201 United States FALSE
+office of technology assessment us Americas Northern America FALSE 1 2021-02-03 65556891 node "Research, Technology & Assessment, 1001, East Wooster Street, Bentwood Estates, Bowling Green, Wood County, Ohio, 43403, United States" office educational_institution 0.201 United States FALSE
+office of the united states trade representative us Americas Northern America FALSE 1 2021-02-03 106912217 way "Office of the United States Trade Representative, 600, 17th Street Northwest, Washington, District of Columbia, 20006, United States" office government 0.819931111449548 United States FALSE
+ohio state university medical center us Americas Northern America FALSE 1 2021-02-03 178969993 way "Wexner Medical Center at The Ohio State University, 410, West Tenth Avenue, University District District 4, Columbus, Franklin, Ohio, 43210, United States" amenity hospital 0.700804307025448 United States FALSE
+ohsu us Americas Northern America FALSE 1 2021-02-03 200879490 way "OHSU Center For Health And Healing, 3303, Southwest Bond Avenue, South Portland, Portland, Metro, Oregon, 97239, United States" building yes 0.307534521399027 United States FALSE
+opal us Americas Northern America FALSE 1 2021-02-03 258462411 relation "Opal, Lincoln County, Wyoming, United States" boundary administrative 0.446398790789336 United States FALSE
+open academic society us Americas Northern America FALSE 1 2021-02-03 171172391 way "Health Professions Academic Building, 901, South 9th Street, Society Hill, Philadelphia, Philadelphia County, Pennsylvania, 19107, United States" building hospital 0.319931111449548 United States FALSE
+open phil us Americas Northern America FALSE 1 2021-02-03 448866 node "Phil, Robeson County, North Carolina, United States" place hamlet 0.35 United States FALSE
+operation campus us Americas Northern America FALSE 1 2021-02-03 230031793 way "Faculties Operation, Campus Drive, Concord, Contra Costa County, California, 94521, United States" building school 0.201 United States FALSE
+orasure technologies us Americas Northern America FALSE 1 2021-02-03 69665845 node "OraSure Technologies - Eaton Avenue Facility, 1745, Eaton Avenue, Kaywin, Bethlehem, Lehigh County, Pennsylvania, 18018, United States" man_made works 0.201 United States FALSE
+oregon national primate research center us Americas Northern America FALSE 1 2021-02-03 210428336 way "Oregon National Primate Research Center, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, United States" landuse commercial 0.7 United States FALSE
+overlea high school us Americas Northern America FALSE 1 2021-02-03 111694033 way "Overlea High School, Wildwood Avenue, Linhigh, Overlea, Baltimore County, Maryland, 21206, United States" amenity school 0.301 United States FALSE
+oxford west us Americas Northern America FALSE 1 2021-02-03 196505852 way "Oxford West, Paramount Estates, Auburn Hills, Oakland County, Michigan, 48309-4427, United States" highway residential 0.3 United States FALSE
+pacific institute us Americas Northern America FALSE 1 2021-02-03 160911248 way "Mid-Pacific Institute, Kaaka Place, Lower MÄ<81>noa, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" amenity school 0.469299555080491 United States FALSE
+pacific lutheran university us Americas Northern America FALSE 1 2021-02-03 95404782 way "Pacific Lutheran University, 12180, Park Avenue South, Parkland, Tacoma, Pierce County, Washington, 98447, United States" amenity university 0.686028263148971 United States FALSE
+pacific northwest us Americas Northern America FALSE 1 2021-02-03 257884713 relation "Pacific, King County, Washington, United States" boundary administrative 0.511447002935904 United States FALSE
+pacific northwest research station us Americas Northern America FALSE 1 2021-02-03 7571845 node "Pacific Star, Research Boulevard, Woodland Village, Pond Springs, Austin, Williamson County, Texas, 78759, United States" amenity restaurant 0.201 United States FALSE
+pacific tsunami warning center us Americas Northern America FALSE 1 2021-02-03 297701617 node "Pacific Tsunami Warning Center, Perimeter Road, Pacific Tsunami Warning Center, Ewa Beach, Honolulu County, Hawaii, 96706, United States" man_made monitoring_station 0.754544854295327 United States FALSE
+packard us Americas Northern America FALSE 1 2021-02-03 408214 node "Packard, Town of Wagner, Marinette County, Wisconsin, 49877, United States" place hamlet 0.35 United States FALSE
+pandora us Americas Northern America FALSE 1 2021-02-03 258361127 relation "Pandora, Putnam County, Ohio, 45877, United States" boundary administrative 0.41689306175332 United States FALSE
+park service us Americas Northern America FALSE 1 2021-02-03 120606840 way "Park Service, Groveton, Fairfax County, Virginia, 22310-6299, United States" highway service 0.275 United States FALSE
+peabody museum of archaeology and ethnology us Americas Northern America FALSE 1 2021-02-03 2943218 node "Peabody Museum of Archaeology and Ethnology, 11, Divinity Avenue, Cambridge, Middlesex County, Massachusetts, 02138, United States" tourism museum 1.00313937321747 United States FALSE
+penn state university us Americas Northern America FALSE 1 2021-02-03 258601905 relation "Penn State University, Mount Nittany Expressway, Houserville, College Township, Centre County, Pennsylvania, 16802-2604, United States" amenity university 0.862656889872636 United States FALSE
+perelman school of medicine us Americas Northern America FALSE 1 2021-02-03 103925708 way "Perelman Center for Advanced Medicine, East Service Drive, University City, Philadelphia, Philadelphia County, Pennsylvania, 19104, United States" building yes 0.405371759161912 United States FALSE
+pgc us Americas Northern America FALSE 1 2021-02-03 220208091 way "Grant County Airport, Fish Hatchery Road, Grant County, West Virginia, 26847, United States" aeroway aerodrome 0.110430435186894 United States FALSE
+philip campbell us Americas Northern America FALSE 1 2021-02-03 141178973 way "Saint Philip School, North Campbell Avenue, West Ridge, Rogers Park, Chicago, Jefferson Township, Cook County, Illinois, 60645, United States" amenity school 0.201 United States FALSE
+philip diamond us Americas Northern America FALSE 1 2021-02-03 108999433 way "St. Philip the Apostle Church, 725, Diamond Street, Noe Valley, San Francisco, San Francisco City and County, California, 94114, United States" amenity place_of_worship 0.201 United States FALSE
+phoenix medical school us Americas Northern America FALSE 1 2021-02-03 66777927 node "Phoenix Medical, 176, Merrick Road, Lynbrook, Hempstead, Nassau County, New York, 11563, United States" place house 0.201 United States FALSE
+pik us Americas Northern America FALSE 1 2021-02-03 258470779 relation "Pike County, Ohio, United States" boundary administrative 0.617433418056826 United States FALSE
+pioneer us Americas Northern America FALSE 1 2021-02-03 258145486 relation "Pioneer, Humboldt County, Iowa, United States" boundary administrative 0.530939679465417 United States FALSE
+pioneer hi-bred international us Americas Northern America FALSE 1 2021-02-03 259591250 relation "Pioneer Hi-Bred International Inc., 19456, Victory Drive, Southhaven, Mankato, Blue Earth County, Minnesota, 56001, United States" building commercial 0.401 United States FALSE
+pixar us Americas Northern America FALSE 1 2021-02-03 70771733 node "Pixar, Park Avenue, Emeryville, Alameda County, California, 94608, United States" highway bus_stop 0.101 United States FALSE
+planet labs us Americas Northern America FALSE 1 2021-02-03 154551012 way "Planet Labs, 346, 9th Street, West SoMa, San Francisco, San Francisco City and County, California, 94103, United States" building yes 0.201 United States FALSE
+planetary sciences us Americas Northern America FALSE 1 2021-02-03 39668919 node "Earth, Atmospheric, and Planetary Sciences Library, 550, West Stadium Avenue, West Lafayette, Tippecanoe County, Indiana, 47907, United States" amenity library 0.201 United States FALSE
+planned parenthood us Americas Northern America FALSE 1 2021-02-03 44150828 node "Planned Parenthood, 183, Saint Paul Street, Downtown, Burlington, Chittenden County, Vermont, 05401, United States" amenity clinic 0.201 United States FALSE
+planning commission us Americas Northern America FALSE 1 2021-02-03 145886965 way "Maryland-National Capital Park and Planning Commission, 6611, Kenilworth Avenue, Riverdale Park, Prince George's County, Maryland, 20737, United States" office government 0.497085518539193 United States FALSE
+plasma science and fusion center us Americas Northern America FALSE 1 2021-02-03 98018371 way "Plasma Fusion & Science Ctr, 167, Albany Street, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States" building university 0.301 United States FALSE
+pleiades us Americas Northern America FALSE 1 2021-02-03 2294942 node "The Pleiades, Whatcom County, Washington, United States" natural peak 0.4 United States FALSE
+pnnl us Americas Northern America FALSE 1 2021-02-03 47080016 node "PNNL Guesthouse/ User Housing Facility, Battelle Boulevard, Tri-Cities, Benton County, Washington, 99354-2303, United States" tourism guest_house 0.101 United States FALSE
+point carbon us Americas Northern America FALSE 1 2021-02-03 258600968 relation "Carbon County, Montana, United States" boundary administrative 0.583120203849316 United States FALSE
+polar science center us Americas Northern America FALSE 1 2021-02-03 183870807 way "PARS, Polar Aeronomy and Radio Science, Fairbanks, Fairbanks North Star, Alaska, United States" landuse industrial 0.4 United States FALSE
+potash corporation of saskatchewan us Americas Northern America FALSE 1 2021-02-03 180233467 way "Potash Corporation of Saskatchewan Nitrogen Fertilizer, Augusta, Richmond County, Georgia, United States" landuse industrial 0.6 United States FALSE
+powell center us Americas Northern America FALSE 1 2021-02-03 187415894 way "Powell Center, Creston-Kenilworth, Portland, Metro, Oregon, United States" landuse retail 0.4 United States FALSE
+power us Americas Northern America FALSE 1 2021-02-03 258584590 relation "Power County, Idaho, 83211, United States" boundary administrative 0.56152149654469 United States FALSE
+princeton hydro us Americas Northern America FALSE 1 2021-02-03 258173845 relation "Hydro, Caddo County, Oklahoma, United States" boundary administrative 0.383208261767925 United States FALSE
+princeton university press us Americas Northern America FALSE 1 2021-02-03 99832796 way "Princeton University Press, William Street, Princeton, Mercer County, New Jersey, 08540, United States" building university 0.301 United States FALSE
+psc us Americas Northern America FALSE 1 2021-02-03 119085054 way "Peter W. Stott Center, 930, Southwest Hall Street, University District, Downtown, Portland, Metro, Oregon, 97201, United States" leisure sports_centre 0.3277684953714 United States FALSE
+public lab us Americas Northern America FALSE 1 2021-02-03 61104485 node "Public Lab (NYC), 19, Morris Avenue, Brooklyn Navy Yard, Brooklyn, Kings County, New York, 11205, United States" office ngo 0.201 United States FALSE
+qiagen us Americas Northern America FALSE 1 2021-02-03 41703932 node "QIAGEN, 1700, Seaport Boulevard, Pacific Shores Center, Redwood City, San Mateo County, California, 94063, United States" office it 0.101 United States FALSE
+quantum us Americas Northern America FALSE 1 2021-02-03 220451883 way "Quantum, Tallahassee, Leon County, Florida, United States" landuse residential 0.3 United States FALSE
+quest diagnostics us Americas Northern America FALSE 1 2021-02-03 80813530 node "Quest Diagnostics, 319, Longwood Avenue, Boston, Suffolk County, Massachusetts, 02115, United States" place house 0.481311730611622 United States FALSE
+quinnipiac university us Americas Northern America FALSE 1 2021-02-03 259033660 relation "Quinnipiac University, Blandon Drive, Hamden, New Haven County, Connecticut, 06518, United States" amenity university 0.609392399368322 United States FALSE
+r street institute us Americas Northern America FALSE 1 2021-02-03 451003 node "Institute, Jefferson, Kanawha County, West Virginia, 25064, United States" place hamlet 0.554934934074513 United States FALSE
+radio science us Americas Northern America FALSE 1 2021-02-03 183870807 way "PARS, Polar Aeronomy and Radio Science, Fairbanks, Fairbanks North Star, Alaska, United States" landuse industrial 0.4 United States FALSE
+rainbow babies and children's hospital us Americas Northern America FALSE 1 2021-02-03 64089560 node "UH Rainbow Babies & Children’s Hospital, 2101, Adelbert Road, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States" amenity hospital 0.909633810660442 United States FALSE
+raven aerostar us Americas Northern America FALSE 1 2021-02-03 241681489 way "Raven Aerostar, Northeast 3rd Street, Madison, Lake County, South Dakota, 57042, United States" building industrial 0.201 United States FALSE
+rcr us Americas Northern America FALSE 1 2021-02-03 132953507 way "Fulton County Airport, SR 25, Rochester, Fulton County, Indiana, 46975, United States" aeroway aerodrome 0.260058384040688 United States FALSE
+recognition us Americas Northern America FALSE 1 2021-02-03 213255421 way "Volunteer Recognition Park, Schuylerville, Town of Saratoga, Saratoga County, New York, United States" leisure park 0.25 United States FALSE
+red crescent us Americas Northern America FALSE 1 2021-02-03 258176473 relation "Red Creek, Wolcott Town, Wayne County, New York, United States" boundary administrative 0.498906231699698 United States FALSE
+rehabilitation research us Americas Northern America FALSE 1 2021-02-03 176264206 way "Rehabilitation Research Training Building, West Main Street, The Fan, Richmond, Virginia, 23220, United States" building yes 0.201 United States FALSE
+relampago us Americas Northern America FALSE 1 2021-02-03 368618 node "Relampago, Hidalgo County, Texas, United States" place hamlet 0.455899467051989 United States FALSE
+research animal resources center us Americas Northern America FALSE 1 2021-02-03 118554634 way "Research Animal Resources, 1861, Buford Place, St. Paul, Ramsey County, Minnesota, 55108, United States" building yes 0.301 United States FALSE
+research biosecurity us Americas Northern America FALSE 1 2021-02-03 106116575 way "Biosecurity Research Institute, Denison Avenue, Manhattan, Riley County, Kansas, 66506â€<90>1600, United States" building university 0.201 United States FALSE
+research integrity us Americas Northern America FALSE 1 2021-02-03 65571490 node "Police Integrity Research Lab, Ridge Street, Athletics District, Bowling Green, Wood County, Ohio, 43403, United States" office research 0.201 United States FALSE
+research mission us Americas Northern America FALSE 1 2021-02-03 169420504 way "University of Kansas Medical Center Research Institute, 4330, Shawnee Mission Parkway, Fairway, Johnson County, Kansas, 66205, United States" place house 0.201 United States FALSE
+research projects us Americas Northern America FALSE 1 2021-02-03 166563644 way "Defense Advanced Research Projects Agency, 675, North Randolph Street, Ballston, Arlington, Arlington County, Virginia, 22203, United States" office government 0.201 United States FALSE
+research rocket us Americas Northern America FALSE 1 2021-02-03 130028486 way "Research Park Boulevard Northwest, Rideout Village, Huntsville, Madison County, Alabama, 35814, United States" highway motorway 0.2 United States FALSE
+research university us Americas Northern America FALSE 1 2021-02-03 2953848 node "Davies Family Research Library, 1200, Southwest Park Avenue, University District, Downtown, Portland, Metro, Oregon, 97205, United States" amenity library 0.637845445938682 United States FALSE
+review committee us Americas Northern America FALSE 1 2021-02-03 65256602 node "JLARC - Joint Legislative Audit and Review Committee, 11th Avenue Southwest, Olympia, Thurston County, Washington, 98504, United States" office research 0.201 United States FALSE
+revolutionary court us Americas Northern America FALSE 1 2021-02-03 89870391 way "Revolutionary Court, East Pikeland Township, Chester County, Pennsylvania, 19460, United States" highway residential 0.3 United States FALSE
+risk management solutions us Americas Northern America FALSE 1 2021-02-03 65756807 node "Risk Management Solutions, 799, West Gaines Street, Tallahassee, Leon County, Florida, 32304, United States" office yes 0.301 United States FALSE
+robert c. byrd green bank telescope us Americas Northern America FALSE 1 2021-02-03 102881650 way "Green Bank Telescope, Slavin Hollow Road, Pocahontas County, West Virginia, 24944, United States" man_made telescope 0.790988572487363 United States FALSE
+robert h. lurie children's hospital of chicago us Americas Northern America FALSE 1 2021-02-03 208072291 way "Ann & Robert H. Lurie Children's Hospital Heliport, Lurie Children's Hospital Emergency Lane, Streeterville, Near North Side, Chicago, Cook County, Illinois, 60611, United States" aeroway helipad 0.701 United States FALSE
+rochelle diamond us Americas Northern America FALSE 1 2021-02-03 26235794 node "Rochelle Diamond Lodge, 215, North 9th Street, Rochelle, Ogle County, Illinois, 61068, United States" tourism motel 0.201 United States FALSE
+rocky mountain institute us Americas Northern America FALSE 1 2021-02-03 67076208 node "Rocky Mountain Institute/RMI, 2490, Junction Place, Boulder Junction, Boulder, Boulder County, Colorado, 80301, United States" office association 0.301 United States FALSE
+rocky mountain laboratories us Americas Northern America FALSE 1 2021-02-03 214062263 way "Rocky Mountain Laboratories, Leisure Village, Hamilton, Ravalli County, Montana, United States" landuse commercial 0.5 United States FALSE
+roger williams park zoo us Americas Northern America FALSE 1 2021-02-03 162060422 way "Roger Williams Park Zoo, 1000, Elmwood Avenue, Providence, Providence County, Rhode Island, 02907, United States" tourism zoo 0.615498150437213 United States FALSE
+roosevelt university us Americas Northern America FALSE 1 2021-02-03 2336069 node "Roosevelt University, 430, South Michigan Avenue, Printer's Row, Loop, Chicago, Cook County, Illinois, 60605, United States" amenity university 0.614479959227419 United States FALSE
+rosetta stone us Americas Northern America FALSE 1 2021-02-03 37420348 node "Rosetta stone, 6000, North Terminal Parkway, College Park, Clayton County, Georgia, 30337, United States" shop jewelry 0.201 United States FALSE
+royal scientific society us Americas Northern America FALSE 1 2021-02-03 174783944 way "Rensselaer Society of Engineers, 1501, Sage Avenue, City of Troy, Rensselaer County, New York, 12180, United States" building house 0.101 United States FALSE
+rush university medical center us Americas Northern America FALSE 1 2021-02-03 150024552 way "Rush University Medical Center, 1653, West Congress Parkway, Near West Side, Illinois Medical District, Chicago, Illinois Medical District, Illinois, 60612, United States" amenity hospital 0.689701883147039 United States FALSE
+safeway us Americas Northern America FALSE 1 2021-02-03 173823433 way "Safeway, West Pierson Street, Phoenix, Maricopa County, Arizona, 85340, United States" shop supermarket 0.381950414040809 United States FALSE
+saint anselm college us Americas Northern America FALSE 1 2021-02-03 255793083 way "Saint Anselm College, Eaton Road, Pinardville, Goffstown, Hillsborough County, New Hampshire, 03102, United States" amenity university 0.301 United States FALSE
+saint louis university us Americas Northern America FALSE 1 2021-02-03 259124957 relation "Saint Louis University, 1, North Grand Boulevard, St Louis University, City of Saint Louis, Missouri, 63103, United States" amenity university 0.77813837372741 United States FALSE
+saint martin's university us Americas Northern America FALSE 1 2021-02-03 228320701 way "Saint Martin's University, I 5, Lacey, Thurston County, Washington, 98516-5364, United States" amenity university 0.710838391011185 United States FALSE
+salesforce us Americas Northern America FALSE 1 2021-02-03 70950029 node "Salesforce, 433, North Capitol Avenue, Fayette Street Conservation Area, Indianapolis, Marion, Indiana, 46204, United States" office company 0.101 United States FALSE
+salisbury university us Americas Northern America FALSE 1 2021-02-03 186046675 way "Salisbury University, 1101, Camden Avenue, Camden, Salisbury, Wicomico County, Maryland, 21801, United States" amenity university 0.577478932777613 United States FALSE
+san francisco brain research institute us Americas Northern America FALSE 1 2021-02-03 133163876 way "Brain Research Institute, 670, Charles E Young Drive South, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity research_institute 0.301 United States FALSE
+san francisco department of public health us Americas Northern America FALSE 1 2021-02-03 51450093 node "IL Department of Public Health, 422, South 5th Street, Springfield, Sangamon County, Illinois, 62701, United States" office government 0.501 United States FALSE
+sanford underground research facility us Americas Northern America FALSE 1 2021-02-03 182033784 way "630, Sanford Underground Research Facility, Lead, Lawrence County, South Dakota, 57754, United States" landuse industrial 0.6 United States FALSE
+santa clara us Americas Northern America FALSE 1 2021-02-03 258271205 relation "Santa Clara County, California, United States" boundary administrative 0.764168809666577 United States FALSE
+satori us Americas Northern America FALSE 1 2021-02-03 257593503 relation "Story, Sheridan County, Wyoming, 82842, United States" place locality 0.297085518539193 United States FALSE
+scb us Americas Northern America FALSE 1 2021-02-03 3028939 node "Scribner State Airport, 1574, Road 15, Hooper, Dodge County, Nebraska, 68031, United States" aeroway aerodrome 0.178140546517606 United States FALSE
+school of health professions us Americas Northern America FALSE 1 2021-02-03 216286733 way "School of Health Professions, 9th Avenue South, Five Points South, Birmingham, Jefferson County, Alabama, 35294, United States" building university 0.401 United States FALSE
+school of natural resources us Americas Northern America FALSE 1 2021-02-03 26489221 node "Natural Resources, 1367, Valencia Street, Liberty Street Historic District, San Francisco, San Francisco City and County, California, 94110, United States" amenity social_facility 0.201 United States FALSE
+school of social sciences us Americas Northern America FALSE 1 2021-02-03 302307768 node "School of Social Sciences, 6100, Main Street, Houston, Harris County, Texas, 77005, United States" amenity university 0.617338060184506 United States FALSE
+sci us Americas Northern America FALSE 1 2021-02-03 258539307 relation "Scioto County, Ohio, United States" boundary administrative 0.614306518100907 United States FALSE
+science and engineering us Americas Northern America FALSE 1 2021-02-03 105892341 way "Science/Engineering, Panorama Drive, Bakersfield, Kern County, California, 93305, United States" building yes 0.201 United States FALSE
+seaman us Americas Northern America FALSE 1 2021-02-03 258449460 relation "Seaman, Adams County, Ohio, United States" boundary administrative 0.416167966338533 United States FALSE
+seattle us Americas Northern America FALSE 1 2021-02-03 258415102 relation "Seattle, King County, Washington, United States" boundary administrative 0.772979173564379 United States FALSE
+seattle children's hospital us Americas Northern America FALSE 1 2021-02-03 259228662 relation "Seattle Children's Hospital, 4800, Sand Point Way Northeast, Laurelhurst, Seattle, King County, Washington, 98105, United States" amenity hospital 0.678688679458624 United States FALSE
+seattle times us Americas Northern America FALSE 1 2021-02-03 147961931 way "The Seattle Times, 1000, Denny Way, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States" office newspaper 0.709495227301736 United States FALSE
+seaworld us Americas Northern America FALSE 1 2021-02-03 159858865 way "SeaWorld San Diego, 500, Sea World Drive, San Diego, San Diego County, California, 92109, United States" tourism theme_park 0.479859879460608 United States FALSE
+seaworld entertainment us Americas Northern America FALSE 1 2021-02-03 112132633 way "Aquatica: SeaWorld's Waterpark San Diego, 2052, Entertainment Circle, Chula Vista, San Diego County, California, 92154, United States" tourism theme_park 0.201 United States FALSE
+seton hall university us Americas Northern America FALSE 1 2021-02-03 98909108 way "Seton Hall University, Seton Drive, South Orange, Essex County, New Jersey, 61, United States" amenity university 0.774893814120778 United States FALSE
+seven sons us Americas Northern America FALSE 1 2021-02-03 89368026 way "Seven Sons Road, Grant County, New Mexico, 88026, United States" highway residential 0.3 United States FALSE
+sfb us Americas Northern America FALSE 1 2021-02-03 146097502 way "Orlando Sanford International Airport, Summerlin Avenue, Wynwood, Sanford, Seminole County, Florida, 32773, United States" aeroway aerodrome 0.402243537687533 United States FALSE
+shawnee state university us Americas Northern America FALSE 1 2021-02-03 213692812 way "Shawnee State University, US 23, Boneyfiddle Commercial Historic District, Portsmouth, Scioto County, Ohio, 41175, United States" amenity university 0.301 United States FALSE
+shire pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 140916147 way "Shire Pharmaceuticals, 200, Riverpark Drive, North Reading, Middlesex County, Massachusetts, 01864, United States" building commercial 0.201 United States FALSE
+shoemaker levy 9 us Americas Northern America FALSE 1 2021-02-03 48677113 node "A Shine To Go, 1710, Allied Street, McIntire Plaza Shopping Center, Greenfields, Charlottesville, Virginia, 22903, United States" craft shoemaker 0.101 United States FALSE
+silver spring networks us Americas Northern America FALSE 1 2021-02-03 138261973 way "Silver Spring Networks, 230, West Tasman Drive, San Jose, Santa Clara County, California, 95134-1358, United States" building office 0.301 United States FALSE
+simons center us Americas Northern America FALSE 1 2021-02-03 160830886 way "Simons Center, John S Toll Drive, Suffolk County, New York, 11794, United States" building university 0.201 United States FALSE
+sky news us Americas Northern America FALSE 1 2021-02-03 42369599 node "Blue Sky Cafe, Covered Walkway, Newport News, Virginia, 23602, United States" amenity restaurant 0.201 United States FALSE
+slac national accelerator laboratory in stanford us Americas Northern America FALSE 1 2021-02-03 299175282 way "Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States" amenity research_center 0.927082745074033 United States FALSE
+sloan digital sky us Americas Northern America FALSE 1 2021-02-03 3752682 node "Sloan Digital Sky Survey telescope, Apache Point Road, Otero County, New Mexico, 88349, United States" man_made telescope 0.301 United States FALSE
+small earth nepal us Americas Northern America FALSE 1 2021-02-03 88622633 way "Small Street, White Earth, Mountrail County, North Dakota, United States" highway residential 0.3 United States FALSE
+smc us Americas Northern America FALSE 1 2021-02-03 154928635 way "Space and Missile Systems Center, North Douglas Street, El Segundo, Los Angeles County, California, 90245, United States" office government 0.332141421099015 United States FALSE
+smithsonian conservation biology institute us Americas Northern America FALSE 1 2021-02-03 259518942 relation "Smithsonian Conservation Biology Institute, Front Royal, Warren County, Virginia, United States" boundary national_park 0.734080577887678 United States FALSE
+smithsonian conservation biology institute in front royal us Americas Northern America FALSE 1 2021-02-03 259518942 relation "Smithsonian Conservation Biology Institute, Front Royal, Warren County, Virginia, United States" boundary national_park 1.03408057788768 United States FALSE
+society islands us Americas Northern America FALSE 1 2021-02-03 68173148 node "Audobon Society Wildlife & Marine Sanctuary, Cruz Bay, Saint Thomas - Saint John District, United States Virgin Islands, 000830, United States" leisure park 0.35 United States FALSE
+society of nuclear medicine us Americas Northern America FALSE 1 2021-02-03 108632117 way "Society of Nuclear Medicine and Molecular Imaging, Samuel Morse Drive, Pinecrest, Reston, Fairfax County, Virginia, 20190, United States" building yes 0.401 United States FALSE
+solidarity us Americas Northern America FALSE 1 2021-02-03 48908995 node "The Spirit of Polonia, North 10th Street, Westown, Milwaukee, Milwaukee County, Wisconsin, 53233, United States" tourism artwork 0.339306791900516 United States FALSE
+sonoma state university us Americas Northern America FALSE 1 2021-02-03 136713211 way "Sonoma State University, 1801, East Cotati Avenue, C Section, Rohnert Park, Sonoma County, California, 94928, United States" amenity university 0.720803171748129 United States FALSE
+south african san institute us Americas Northern America FALSE 1 2021-02-03 2850026 node "First African Baptist Church, Institute Street, Statesboro, Bulloch County, Georgia, 30458, United States" amenity place_of_worship 0.201 United States FALSE
+south carolina us Americas Northern America FALSE 1 2021-02-03 257325089 relation "South Carolina, United States" boundary administrative 0.90345926227768 United States FALSE
+south dakota state university in brookings us Americas Northern America FALSE 1 2021-02-03 109863860 way "South Dakota State University, Harvey Dunn Street, Brookings, Brookings County, South Dakota, 57007, United States" amenity university 1.00718370279007 United States FALSE
+southern gardens citrus us Americas Northern America FALSE 1 2021-02-03 88472039 way "West Southern Street, Homosassa Springs, Citrus County, Florida, 34461, United States" highway residential 0.3 United States FALSE
+southern illinois university in carbondale us Americas Northern America FALSE 1 2021-02-03 178049913 way "Southern Illinois University at Carbondale, Susan Schumake Memorial Overpass, East Campus Housing Area, Lake Shore Drive Area, Carbondale, Jackson County, Illinois, 62901, United States" amenity university 0.501 United States FALSE
+southern poverty law center us Americas Northern America FALSE 1 2021-02-03 48759870 node "Southern Poverty Law Center, 400, Washington Avenue, Montgomery, Montgomery County, Alabama, 36104, United States" office association 0.876048939755188 United States FALSE
+space and technology us Americas Northern America FALSE 1 2021-02-03 177657788 way "Holding Space Gallery, 3546, Michigan Avenue, Clark Street Technology Park, Detroit, Wayne County, Michigan, 48216, United States" building commercial 0.201 United States FALSE
+spect us Americas Northern America FALSE 1 2021-02-03 87269115 way "Spect Court, Virginia Hills, Groveton, Fairfax County, Virginia, 22310, United States" highway residential 0.2 United States FALSE
+spirit cave us Americas Northern America FALSE 1 2021-02-03 210761029 way "Cades Spirit Bend, Bee Cave, Travis County, Texas, 78733, United States" highway residential 0.3 United States FALSE
+sri international us Americas Northern America FALSE 1 2021-02-03 2879218 node "SRI International, 333, Ravenswood Avenue, Menlo Park, San Mateo County, California, 94025, United States" office research 0.201 United States FALSE
+st cloud state university us Americas Northern America FALSE 1 2021-02-03 258951532 relation "St. Cloud State University, 720, 4th Avenue South, St. Cloud, Stearns County, Minnesota, 56301, United States" amenity university 0.810507227685364 United States FALSE
+stanford genome technology center us Americas Northern America FALSE 1 2021-02-03 125860486 way "Stanford Genome Technology Center, 855, South California Avenue, Evergreen Park, Palo Alto, Santa Clara County, California, 94304, United States" office research 0.401 United States FALSE
+stanford libraries us Americas Northern America FALSE 1 2021-02-03 147987374 way "Lathrop Library, 518, Memorial Way, Stanford, Santa Clara County, California, 94305-6015, United States" amenity library 0.406301518086152 United States FALSE
+stanford linear accelerator center us Americas Northern America FALSE 1 2021-02-03 299175282 way "Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States" amenity research_center 0.827082745074033 United States FALSE
+stanford medical center us Americas Northern America FALSE 1 2021-02-03 63574186 node "Stanford Medical Center, Quarry Road Extension, Stanford, Palo Alto, Santa Clara County, California, 94305-6015, United States" highway bus_stop 0.301 United States FALSE
+stanford school of medicine us Americas Northern America FALSE 1 2021-02-03 13364304 node "Stanford School Of Medicine, D Street, Menlo Park, San Mateo County, California, 94025, United States" amenity university 0.401 United States FALSE
+star program us Americas Northern America FALSE 1 2021-02-03 254478022 way "North Star, Program Way, Larimer County, Colorado, United States" building cabin 0.201 United States FALSE
+starcraft us Americas Northern America FALSE 1 2021-02-03 52644991 node "Starcraft, Northeast 4th Street, Bellevue, King County, Washington, 98004-5002, United States" tourism artwork 0.101 United States FALSE
+state for energy us Americas Northern America FALSE 1 2021-02-03 123397480 way "United States District Court for Western District of Oklahoma, The Underground, Bank of Oklahoma Plaza, Central Business District, Oklahoma City, Oklahoma County, Oklahoma, 73104:73106, United States" amenity courthouse 0.201 United States FALSE
+stennis space center us Americas Northern America FALSE 1 2021-02-03 225894763 way "John C. Stennis Space Center, Hancock County, Mississippi, 39529, United States" amenity research_institute 0.720736361552565 United States FALSE
+stockton university us Americas Northern America FALSE 1 2021-02-03 95943679 way "Stockton University, Garden State Parkway, Clarks Mill, Galloway Township, Atlantic County, New Jersey, 08241, United States" amenity university 0.563793454953531 United States FALSE
+stony brook university medical center us Americas Northern America FALSE 1 2021-02-03 104502319 way "Stony Brook University, 100, Nicolls Road, Suffolk County, New York, 11794, United States" amenity university 0.803198357564167 United States FALSE
+stowers institute for medical research us Americas Northern America FALSE 1 2021-02-03 174674425 way "Stowers Institute for Medical Research, 1000, East 50th Street, Kansas City, Jackson County, Missouri, 64110, United States" office research 0.715498150437213 United States FALSE
+stuart school of business us Americas Northern America FALSE 1 2021-02-03 2815985 node "Stuart School, 39th Street, Metairie, Jefferson Parish, Louisiana, 70001, United States" amenity school 0.201 United States FALSE
+subaru telescope us Americas Northern America FALSE 1 2021-02-03 101632679 way "Subaru Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.61807260783706 United States FALSE
+suny upstate medical university us Americas Northern America FALSE 1 2021-02-03 300965654 way "SUNY Upstate Medical University Bursar Office, 155, Elizabeth Blackwell Street, University Hill, Syracuse, Onondaga County, New York, 13210, United States" building yes 0.401 United States FALSE
+superior court us Americas Northern America FALSE 1 2021-02-03 89146279 way "Superior Court, The Landings, Toms River, Ocean County, New Jersey, 08755, United States" highway residential 0.3 United States FALSE
+sutter health us Americas Northern America FALSE 1 2021-02-03 17827506 node "Sutter Health, Garden Highway, Sacramento, Sacramento County, California, 95605, United States" building office 0.201 United States FALSE
+takeda pharmaceutical company us Americas Northern America FALSE 1 2021-02-03 235148162 way "Takeda Pharmaceutical, Thousand Oaks, Ventura County, California, United States" landuse industrial 0.4 United States FALSE
+takeda pharmaceuticals us Americas Northern America FALSE 1 2021-02-03 43478299 node "Takeda Pharmaceuticals, 300, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" place house 0.201 United States FALSE
+tama us Americas Northern America FALSE 1 2021-02-03 258588234 relation "Tama County, Iowa, United States" boundary administrative 0.608199002879145 United States FALSE
+task force for global health us Americas Northern America FALSE 1 2021-02-03 103398915 way "The Task Force for Global Health, 325, Swanton Way, Oakhurst, Decatur, DeKalb County, Georgia, 30030, United States" building office 0.501 United States FALSE
+tennessee valley authority us Americas Northern America FALSE 1 2021-02-03 108570171 way "Tennessee Valley Authority, 1101, Market Street, Chattanooga, Hamilton County, Tennessee, 37402, United States" building commercial 0.778949510198751 United States FALSE
+terra bella us Americas Northern America FALSE 1 2021-02-03 258597384 relation "Terra Bella, Tulare County, California, United States" boundary census 0.575700293936422 United States FALSE
+tex us Americas Northern America FALSE 1 2021-02-03 257418219 relation "Texas, United States" boundary administrative 0.858052139534058 United States FALSE
+texas a & m university in college station us Americas Northern America FALSE 1 2021-02-03 259129741 relation "Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States" amenity university 1.25527727305854 United States FALSE
+texas a&m in college station us Americas Northern America FALSE 1 2021-02-03 104362432 way "Texas A & M, Lakeway Drive, College Station, Brazos County, Texas, 77845, United States" building yes 0.501 United States FALSE
+texas a&m university at college station us Americas Northern America FALSE 1 2021-02-03 259129741 relation "Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States" amenity university 1.35527727305854 United States FALSE
+texas children's hospital us Americas Northern America FALSE 1 2021-02-03 50694412 node "Texas Children's Hospital, 6621, Fannin Street, Texas Medical Center, Houston, Harris County, Texas, 77030, United States" amenity hospital 0.699521898980972 United States FALSE
+texas gulf coast us Americas Northern America FALSE 1 2021-02-03 203071766 way "Texas Gulf Coast Regional Airport, Aifport Way, Brazoria County, Texas, United States" aeroway aerodrome 0.550254845255209 United States FALSE
+the boston globe us Americas Northern America FALSE 1 2021-02-03 92324871 way "Boston Street, Globe, Gila County, Arizona, 85501, United States" highway residential 0.3 United States FALSE
+the cdc us Americas Northern America FALSE 1 2021-02-03 172987439 way "CDC, New Center, Detroit, Wayne County, Michigan, United States" landuse farmyard 0.3 United States FALSE
+the circuit court us Americas Northern America FALSE 1 2021-02-03 20736035 node "Circuit Court, Maryland Avenue, Croydon Park, Rockville, Montgomery County, Maryland, 20850, United States" amenity courthouse 0.403130333992136 United States FALSE
+the george washington university us Americas Northern America FALSE 1 2021-02-03 106978219 way "George Washington University, I Street Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States" amenity university 0.861031504404982 United States FALSE
+the guardian us Americas Northern America FALSE 1 2021-02-03 2795396 node "The Guardian, San Juan County, Colorado, United States" natural peak 0.5 United States FALSE
+the institute of mathematical sciences us Americas Northern America FALSE 1 2021-02-03 55398385 node "Courant Institute of Mathematical Sciences, 251, Mercer Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States" amenity university 0.922385266730329 United States FALSE
+the university of california us Americas Northern America FALSE 1 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 0.948194378261701 United States FALSE
+the university of california at berkeley us Americas Northern America FALSE 1 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.1481943782617 United States FALSE
+the university of california at san diego us Americas Northern America FALSE 1 2021-02-03 94305187 way "University of California, San Diego, 9500, Gilman Drive, San Diego, San Diego County, California, 92093, United States" amenity university 1.14938836421927 United States FALSE
+the university of pennsylvania us Americas Northern America FALSE 1 2021-02-03 258680341 relation "University of Pennsylvania, Market Street, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19139, United States" amenity university 0.926036457903365 United States FALSE
+the washington times us Americas Northern America FALSE 1 2021-02-03 162772326 way "Washington Times, 3600, New York Avenue Northeast, Washington, District of Columbia, 20002, United States" office newspaper 0.301 United States FALSE
+the woodrow wilson international center for scholars us Americas Northern America FALSE 1 2021-02-03 47333285 node "Woodrow Wilson International Center for Scholars, 1300, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20004, United States" office government 1.00659791861715 United States FALSE
+thirty meter telescope us Americas Northern America FALSE 1 2021-02-03 5539908 node "Thirty Meter Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States" man_made telescope 0.654348884656857 United States FALSE
+thomas jefferson national accelerator facility in newport news us Americas Northern America FALSE 1 2021-02-03 150234788 way "Thomas Jefferson National Accelerator Facility, Oyster Point, Newport News, Virginia, United States" landuse industrial 1 United States FALSE
+thomas jefferson university us Americas Northern America FALSE 1 2021-02-03 259368934 relation "Thomas Jefferson University, Ranstead Street, Society Hill, Philadelphia, Philadelphia County, Pennsylvania, 19107, United States" amenity university 0.709231479174104 United States FALSE
+tlr us Americas Northern America FALSE 1 2021-02-03 102668648 way "Mefford Field, Golden State Highway, Tulare, Tulare County, California, 93274-8029, United States" aeroway aerodrome 0.166903631515068 United States FALSE
+toyota technological institute us Americas Northern America FALSE 1 2021-02-03 67853957 node "Toyota Technological Institute, 6045, South Kenwood Avenue, Woodlawn, Chicago, Hyde Park Township, Cook County, Illinois, 60637, United States" office research 0.638803667479001 United States FALSE
+translational research us Americas Northern America FALSE 1 2021-02-03 100492214 way "Translational Genomics Research Institute, East Taylor Street, Phoenix, Maricopa County, Arizona, 85004, United States" building yes 0.415498150437213 United States FALSE
+triceratops us Americas Northern America FALSE 1 2021-02-03 7673484 node "Triceratops, 940, Skyline Drive, Rapid City, Pennington County, South Dakota, 57702-8170, United States" tourism artwork 0.101 United States FALSE
+trump white house us Americas Northern America FALSE 1 2021-02-03 445769 node "Trump, Baltimore County, Maryland, 21161, United States" place hamlet 0.375244632729739 United States FALSE
+tucson us Americas Northern America FALSE 1 2021-02-03 258050070 relation "Tucson, Pima County, Arizona, United States" boundary administrative 0.70803284036725 United States FALSE
+tulane university school of medicine us Americas Northern America FALSE 1 2021-02-03 169112739 way "Tulane University School of Medicine, 131, South Robertson Street, Storyville, New Orleans, Orleans Parish, Louisiana, 70112, United States" building yes 0.501 United States FALSE
+twas us Americas Northern America FALSE 1 2021-02-03 298656564 way "Twas the Night Before Christmas, Spirit of Christmas Lane, Jefferson Township, Berks County, Pennsylvania, United States" tourism attraction 0.101 United States FALSE
+u.s. national academy of sciences us Americas Northern America FALSE 1 2021-02-03 106787905 way "National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States" office ngo 1.20593943258948 United States FALSE
+u.s. senate us Americas Northern America FALSE 1 2021-02-03 367209 node "Senate, Jack County, Texas, United States" place hamlet 0.55 United States FALSE
+uc-berkeley us Americas Northern America FALSE 1 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 0.748194378261701 United States FALSE
+uc-davis us Americas Northern America FALSE 1 2021-02-03 258689332 relation "University of California, Davis, Russell Boulevard, Davis, Yolo County, California, 95616, United States" amenity university 0.101 United States FALSE
+ucla medical center us Americas Northern America FALSE 1 2021-02-03 19477330 node "UCLA Medical Center, Westwood Plaza, Westwood Village, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" highway bus_stop 0.301 United States FALSE
+ucla ronald reagan medical center us Americas Northern America FALSE 1 2021-02-03 258368083 relation "Ronald Reagan UCLA Medical Center, 757, Westwood Plaza, Westwood, Los Angeles, Los Angeles County, California, 90095, United States" amenity hospital 0.883144349963485 United States FALSE
+ucsb us Americas Northern America FALSE 1 2021-02-03 205319990 way "University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States" place locality 0.125 United States FALSE
+un assembly us Americas Northern America FALSE 1 2021-02-03 161485338 way "1318, The Assembly, Tallahassee, Leon County, Florida, 32303, United States" landuse commercial 0.4 United States FALSE
+unc-chapel hill us Americas Northern America FALSE 1 2021-02-03 258459202 relation "University of North Carolina, South Columbia Street, Downtown, Chapel Hill, Orange County, North Carolina, 27516, United States" amenity university 0.782889212190386 United States FALSE
+underwriters laboratories us Americas Northern America FALSE 1 2021-02-03 154447688 way "Underwriters Laboratories, Pfingsten Road, Northfield Township, Cook County, Illinois, 60015-1331, United States" building yes 0.201 United States FALSE
+uniformed services university us Americas Northern America FALSE 1 2021-02-03 161336966 way "Uniformed Services University of the Health Sciences, 4301, Jones Bridge Road, Bethesda, Montgomery County, Maryland, 20814, United States" place house 0.739197856791149 United States FALSE
+uniformed services university of the health sciences us Americas Northern America FALSE 1 2021-02-03 161336966 way "Uniformed Services University of the Health Sciences, 4301, Jones Bridge Road, Bethesda, Montgomery County, Maryland, 20814, United States" place house 1.13919785679115 United States FALSE
+union carbide us Americas Northern America FALSE 1 2021-02-03 49293344 node "Union Carbide, Odessa, Ector County, Texas, 79763, United States" place neighbourhood 0.45 United States FALSE
+union college us Americas Northern America FALSE 1 2021-02-03 107146317 way "Union College, Seward Place, Schenectady, Schenectady County, New York, 12305:12309, United States" amenity university 0.670997532660143 United States FALSE
+united launch alliance us Americas Northern America FALSE 1 2021-02-03 226339536 way "United Launch Alliance, Morgan County, Alabama, United States" landuse industrial 0.5 United States FALSE
+united states food and drug administration us Americas Northern America FALSE 1 2021-02-03 161684229 way "Food and Drug Administration, San Juan Antiguo, San Juan, Puerto Rico, United States" landuse industrial 0.8 United States FALSE
+united states of america us Americas Northern America FALSE 1 2021-02-03 257984054 relation United States boundary administrative 1.13569136745759 United States FALSE
+united states patent and trademark office us Americas Northern America FALSE 1 2021-02-03 55565757 node "Silicon Valley United States Patent and Trademark Office, South 4th Street, Saint James Square Historic District, Japantown, San Jose, Santa Clara County, California, 95112-3580, United States" office government 0.601 United States FALSE
+university of buffalo us Americas Northern America FALSE 1 2021-02-03 666703 node "University, Main Circle, University Heights, Buffalo, Erie County, New York, 14215, United States" railway station 0.390508362962683 United States FALSE
+university of california at riverside us Americas Northern America FALSE 1 2021-02-03 33709158 node "UCR ARTSblock, 3824, Main Street, Riverside, Riverside County, California, 92501, United States" tourism museum 0.558218474293395 United States FALSE
+university of california berkeley us Americas Northern America FALSE 1 2021-02-03 258416614 relation "University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States" amenity university 1.0481943782617 United States FALSE
+university of california in merced us Americas Northern America FALSE 1 2021-02-03 129779241 way "University of California, Merced, 5200, Mineral King Road, Merced County, California, 95343, United States" amenity university 0.913735597530124 United States FALSE
+university of california irvine us Americas Northern America FALSE 1 2021-02-03 99651593 way "University of California, Irvine, Mesa View Drive, Newport Beach, Orange County, California, 92617-5135, United States" amenity university 0.932750585799837 United States FALSE
+university of california san diego us Americas Northern America FALSE 1 2021-02-03 94305187 way "University of California, San Diego, 9500, Gilman Drive, San Diego, San Diego County, California, 92093, United States" amenity university 1.04938836421927 United States FALSE
+university of colorado anschutz medical campus us Americas Northern America FALSE 1 2021-02-03 37514871 node "University of Colorado Anschutz Medical Campus, East 17th Place, Aurora, Adams County, Colorado, 80045, United States" amenity university 0.601 United States FALSE
+university of columbia us Americas Northern America FALSE 1 2021-02-03 105725399 way "Georgetown University, 3700, O Street Northwest, Georgetown, Washington, District of Columbia, 20057, United States" amenity university 0.887586492717596 United States FALSE
+university of connecticut avery point us Americas Northern America FALSE 1 2021-02-03 258603549 relation "University of Connecticut Avery Point, 1084, Shennecossett Road, Groton, New London County, Connecticut, 06340, United States" amenity university 0.501 United States FALSE
+university of dallas us Americas Northern America FALSE 1 2021-02-03 209882960 way "University of Dallas, Rochelle Boulevard, Irving, Dallas County, Texas, 75039, United States" amenity university 0.687650262005596 United States FALSE
+university of hawai'i us Americas Northern America FALSE 1 2021-02-03 158423062 way "University of Hawaiʻi, Lower Campus, Woodlawn Drive, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States" amenity parking 0.401 United States FALSE
+university of kansas in lawrence us Americas Northern America FALSE 1 2021-02-03 226545942 way "University of Kansas, Louisiana Street, Malls Shopping Center, Lawrence, Douglas County, Kansas, 66046, United States" amenity university 1.06269698033331 United States FALSE
+university of kansas medical center us Americas Northern America FALSE 1 2021-02-03 156808377 way "University of Kansas Medical Center, 3901, Rainbow Boulevard, Kansas City, Wyandotte County, Kansas, 66160, United States" amenity hospital 0.781950414040809 United States FALSE
+university of louisiana us Americas Northern America FALSE 1 2021-02-03 226545942 way "University of Kansas, Louisiana Street, Malls Shopping Center, Lawrence, Douglas County, Kansas, 66046, United States" amenity university 0.862696980333312 United States FALSE
+"university of minnesota, morris" us Americas Northern America FALSE 1 2021-02-03 259054108 relation "University of Minnesota, Morris, Avenida de Cesar Chavez, Morris, Stevens County, Minnesota, 56267, United States" amenity university 0.401 United States FALSE
+university of mons us Americas Northern America FALSE 1 2021-02-03 118474741 way "Alabama State University, 915, South Jackson Street, Montgomery, Montgomery County, Alabama, 36104, United States" amenity university 0.509712984743276 United States FALSE
+university of namur us Americas Northern America FALSE 1 2021-02-03 2897922 node "Notre Dame de Namur University, Laxague Drive, Belmont, San Mateo County, California, 94002, United States" amenity school 0.201 United States FALSE
+university of nebraska medical center us Americas Northern America FALSE 1 2021-02-03 243858337 way "University of Nebraska Medical Center, Dewey Avenue, Omaha, Douglas County, Nebraska, 68198, United States" amenity university 0.501 United States FALSE
+university of nebraska omaha us Americas Northern America FALSE 1 2021-02-03 133934557 way "University of Nebraska at Omaha, University Drive South, Omaha, Douglas County, Nebraska, 68182, United States" amenity university 0.784723197268746 United States FALSE
+university of nebraska state museum us Americas Northern America FALSE 1 2021-02-03 54350454 node "University of Nebraska State Museum, 645, North 14th Street, Downtown, Haymarket, Lincoln, Lancaster County, Nebraska, 68588, United States" tourism museum 0.781950414040809 United States FALSE
+university of nebraska–lincoln us Americas Northern America FALSE 1 2021-02-03 105525403 way "Sheldon Museum of Art, North 12th Street, Downtown, Haymarket, Lincoln, Lancaster County, Nebraska, 68588-0300, United States" tourism gallery 0.603230229325644 United States FALSE
+university of nevada las vegas us Americas Northern America FALSE 1 2021-02-03 127461263 way "University of Nevada, Las Vegas, 4505, Maryland Circle, Midtown UNLV, Las Vegas, Clark County, Nevada, 89154, United States" amenity university 0.983772660357429 United States FALSE
+university of new hampshire school of law us Americas Northern America FALSE 1 2021-02-03 240177061 way "University of New Hampshire School of Law, Blanchard Street, West End, Concord, Merrimack County, New Hampshire, 03301, United States" amenity university 0.701 United States FALSE
+university of north carolina greensboro us Americas Northern America FALSE 1 2021-02-03 198171825 way "University of North Carolina - Greensboro, West Market Street, Westerwood, Greensboro, Guilford County, North Carolina, 27403, United States" amenity university 0.501 United States FALSE
+university of north carolina-chapel hill us Americas Northern America FALSE 1 2021-02-03 258459202 relation "University of North Carolina, South Columbia Street, Downtown, Chapel Hill, Orange County, North Carolina, 27516, United States" amenity university 1.18288921219039 United States FALSE
+university of north florida us Americas Northern America FALSE 1 2021-02-03 2878760 node "University of North Florida, South U N F Drive, Jacksonville, Duval County, Florida, 32246-6624, United States" amenity school 0.401 United States FALSE
+university of northern colorado us Americas Northern America FALSE 1 2021-02-03 167749471 way "University of Northern Colorado, 501, 20th Street, Jackson Field, Greeley, Weld County, Colorado, 80631, United States" amenity university 0.814405926306359 United States FALSE
+university of parma us Americas Northern America FALSE 1 2021-02-03 207662730 way "University Hospitals Parma Medical Center, 7007, Powers Boulevard, Cleveland, Cuyahoga County, Ohio, 44129, United States" amenity hospital 0.201 United States FALSE
+university of puerto rico-mayagüez us Americas Northern America FALSE 1 2021-02-03 144582128 way "Universidad de Puerto Rico - Recinto Universitario de Mayagüez, Calle Ceiba, Ensanche ParÃs, Barrio Pueblo, Mayagüez, Puerto Rico, 00680, United States" amenity university 0.648376470606964 United States FALSE
+university of puget sound us Americas Northern America FALSE 1 2021-02-03 95240431 way "University of Puget Sound, 1500, North Warner Street, Tacoma, Pierce County, Washington, 98416, United States" amenity university 0.841004242546897 United States FALSE
+university of rochester medical center us Americas Northern America FALSE 1 2021-02-03 208125826 way "University of Rochester Medical Center, 601, Elmwood Avenue, Upper Mount Hope, Rochester, Monroe County, New York, 14611, United States" amenity hospital 0.754365194683011 United States FALSE
+university of rutgers us Americas Northern America FALSE 1 2021-02-03 185251759 way "Rutgers University Newark, Washington Street, Teachers Village, Newark, Essex County, New Jersey, 07102, United States" amenity university 0.561038475674441 United States FALSE
+university of south alabama us Americas Northern America FALSE 1 2021-02-03 2909833 node "University of South Alabama, USA South Drive, West Hill, Mobile, Mobile County, Alabama, 36688, United States" amenity university 0.401 United States FALSE
+university of south alabama in mobile us Americas Northern America FALSE 1 2021-02-03 2909833 node "University of South Alabama, USA South Drive, West Hill, Mobile, Mobile County, Alabama, 36688, United States" amenity university 0.501 United States FALSE
+university of south carolina us Americas Northern America FALSE 1 2021-02-03 126084543 way "University of South Carolina, South Pickens Street, Hollywood, Columbia, Richland County, South Carolina, 29205, United States" amenity university 0.923689910980171 United States FALSE
+university of st thomas us Americas Northern America FALSE 1 2021-02-03 101263266 way "University of St. Thomas, Otis Avenue, St. Paul, Ramsey County, Minnesota, 55104, United States" amenity university 0.81644595554698 United States FALSE
+university of washington bothell us Americas Northern America FALSE 1 2021-02-03 101052625 way "University of Washington-Bothell, South Campus Way, Bothell, King County, Washington, 98011, United States" amenity university 0.702778707896871 United States FALSE
+university of wisconsin–madison us Americas Northern America FALSE 1 2021-02-03 259436351 relation "University of Wisconsin-Madison, Lake Mendota Drive, Madison, Dane County, Wisconsin, 53705, United States" amenity university 0.980768897517013 United States FALSE
+uprm us Americas Northern America FALSE 1 2021-02-03 203932623 way "UPRM Solar house project, Paseo Magas, Miradero, Mayagüez, Puerto Rico, 00680, United States" building house 0.101 United States FALSE
+us agricultural research service us Americas Northern America FALSE 1 2021-02-03 48071247 node "USDA, Agricultural Research Service, Phemister Road, Fort Collins, Larimer County, Colorado, 80525-1424, United States" office government 0.401 United States FALSE
+us air national guard us Americas Northern America FALSE 1 2021-02-03 259576829 relation "US Air National Guard, Savannah, Chatham County, Georgia, United States" landuse military 0.6 United States FALSE
+us appeals court us Americas Northern America FALSE 1 2021-02-03 90738673 way "Appeals Court, Independence, Kenton County, Kentucky, 41051, United States" highway residential 0.3 United States FALSE
+us bureau of land management us Americas Northern America FALSE 1 2021-02-03 64573812 node "La Posa South LTVA, US 95, Quartzsite, La Paz County, Arizona, 85346, United States" tourism caravan_site 0.101 United States FALSE
+us bureau of reclamation us Americas Northern America FALSE 1 2021-02-03 81194393 node "US Bureau of Reclamation, 4th Avenue North, West Downtown, Billings, Yellowstone County, Montana, 59101, United States" office government 0.401 United States FALSE
+us cdc us Americas Northern America FALSE 1 2021-02-03 172987439 way "CDC, New Center, Detroit, Wayne County, Michigan, United States" landuse farmyard 0.3 United States FALSE
+us centers for disease control us Americas Northern America FALSE 1 2021-02-03 245173649 way "Centers for Disease Control, Chester Creek Connector, Anchorage, Alaska, 99508-3501, United States" building yes 0.401 United States FALSE
+us central intelligence agency us Americas Northern America FALSE 1 2021-02-03 134865123 way "Central Intelligence Agency, Clearview Manor, McLean, Fairfax County, Virginia, United States" landuse government 0.5 United States FALSE
+us customs us Americas Northern America FALSE 1 2021-02-03 169811968 way "US Customs, Mc Aree Road, Eagle Ridge Apartments, Waukegan, Lake County, Illinois, 60087, United States" office government 0.201 United States FALSE
+us department of agriculture forest service us Americas Northern America FALSE 1 2021-02-03 48599253 node "US Department of Agriculture, Maine Avenue Southwest, Washington, District of Columbia, 20250, United States" office government 1.00973759439018 United States FALSE
+us department of commerce us Americas Northern America FALSE 1 2021-02-03 229151840 way "US Department of Commerce, Observatory Avenue, Garden Court Apartments, Ukiah, Mendocino County, California, 95482, United States" building yes 0.401 United States FALSE
+us department of interior us Americas Northern America FALSE 1 2021-02-03 148880750 way "Rincon Mountain Visitor Center, 3693, South Old Spanish Trail, Tucson, Pima County, Arizona, 85748, United States" tourism information 0.001 United States FALSE
+us department of veterans affairs us Americas Northern America FALSE 1 2021-02-03 231756243 way "US Department of Veterans Affairs, 1535, 1st Avenue East, MedQuarter, Cedar Rapids, Linn County, Iowa, 52402, United States" office government 0.501 United States FALSE
+us drug enforcement agency us Americas Northern America FALSE 1 2021-02-03 183416479 way "US Drug Enforcement Agency, World Communications Drive, Omaha, Douglas County, Nebraska, 68122, United States" building yes 0.401 United States FALSE
+us energy us Americas Northern America FALSE 1 2021-02-03 257952569 relation "Energy, Williamson County, Illinois, 62933, United States" boundary administrative 0.523032671836241 United States FALSE
+us federal aviation administration us Americas Northern America FALSE 1 2021-02-03 129948979 way "Federal Aviation Administration, Bernalillo County, New Mexico, United States" boundary administrative 0.65 United States FALSE
+us federal communications commission us Americas Northern America FALSE 1 2021-02-03 301202937 node "Federal Communications Commission, 45, L Street Northeast, NoMa, Near Northeast, Washington, District of Columbia, 20554, United States" office government 0.894765406107107 United States FALSE
+us government us Americas Northern America FALSE 1 2021-02-03 135061647 way "US Government, Blaine County, Montana, United States" boundary protected_area 0.325 United States FALSE
+us library of congress us Americas Northern America FALSE 1 2021-02-03 257979591 relation "Library of Congress, Thomas Jefferson Building, 2nd Street Southeast, Washington, District of Columbia, 20003, United States" tourism attraction 1.05445651415754 United States FALSE
+us marine corps us Americas Northern America FALSE 1 2021-02-03 11558120 node "US Marine Corps, 64, Kala Bagai Way, Downtown Berkeley, Berkeley, Alameda County, California, 94704, United States" office government 0.301 United States FALSE
+us massachusetts institute of technology us Americas Northern America FALSE 1 2021-02-03 258016252 relation "Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States" amenity university 1.14674262776464 United States FALSE
+us national football league us Americas Northern America FALSE 1 2021-02-03 140878974 way "Bay Area Christian School Football Field, Oak Creek Drive, Oak Creek, League City, Galveston County, Texas, 77573, United States" leisure pitch 0.201 United States FALSE
+us national guard us Americas Northern America FALSE 1 2021-02-03 165631796 way "US National Guard, Montgomery County, Maryland, United States" landuse military 0.5 United States FALSE
+us national hurricane center us Americas Northern America FALSE 1 2021-02-03 212513790 way "National Hurricane Center, Miami-Dade County, Florida, 33199, United States" highway service 0.375 United States FALSE
+us national institute of aerospace us Americas Northern America FALSE 1 2021-02-03 181006875 way "National Institute of Aerospace (NIA) and U.S. Representative Scott Rigell, 1100, Exploration Way, Hampton Roads Center - North Campus, Hampton, Virginia, 23666, United States" building commercial 0.501 United States FALSE
+us national marine fisheries service us Americas Northern America FALSE 1 2021-02-03 98716401 way "National Marine Fisheries Service, Santa Cruz, Santa Cruz County, California, United States" boundary administrative 0.525 United States FALSE
+us national optical astronomy observatory us Americas Northern America FALSE 1 2021-02-03 39657118 node "National Optical Astronomy Observatory, 950, North Cherry Avenue, Tucson, Pima County, Arizona, 85721, United States" amenity research_institute 0.401 United States FALSE
+us national robotics engineering center us Americas Northern America FALSE 1 2021-02-03 162468249 way "National Robotics Engineering Center, 10, 40th Street, Lawrenceville, Central Lawrenceville, Pittsburgh, Allegheny County, Pennsylvania, 15201, United States" building industrial 0.590508362962683 United States FALSE
+us national wildlife federation us Americas Northern America FALSE 1 2021-02-03 232820332 way "National Wildlife Federation, Business Center Drive, Pinecrest, Reston, Fairfax County, Virginia, 20190, United States" man_made works 0.401 United States FALSE
+us office of personnel management us Americas Northern America FALSE 1 2021-02-03 106443728 way "Office of Personnel Management, 1900, E Street Northwest, Washington, District of Columbia, 20006, United States" office government 0.401 United States FALSE
+us pacific tsunami warning center us Americas Northern America FALSE 1 2021-02-03 297701617 node "Pacific Tsunami Warning Center, Perimeter Road, Pacific Tsunami Warning Center, Ewa Beach, Honolulu County, Hawaii, 96706, United States" man_made monitoring_station 0.754544854295327 United States FALSE
+us postal service us Americas Northern America FALSE 1 2021-02-03 224813157 way "US Postal Service, Sutton, Matanuska-Susitna, Alaska, United States" landuse industrial 0.5 United States FALSE
+us ski and snowboard association us Americas Northern America FALSE 1 2021-02-03 253409560 way "Nichols Ski and Snowboard, 21938, Michigan Avenue, Morley Area Residents Association, Dearborn, Wayne County, Michigan, 48124, United States" shop sports 0.401 United States FALSE
+us social security administration us Americas Northern America FALSE 1 2021-02-03 76558039 node "US Social Security Administration, West Sedgley Avenue, Philadelphia, Philadelphia County, Pennsylvania, 19132, United States" office government 0.401 United States FALSE
+us white house us Americas Northern America FALSE 1 2021-02-03 147370893 way "White House, 1600, Pennsylvania Avenue Northwest, Washington, District of Columbia, 20500, United States" historic castle 0.93472115416811 United States FALSE
+usf us Americas Northern America FALSE 1 2021-02-03 258794377 relation "University of San Francisco, 2130, Fulton Street, North of Panhandle, San Francisco, San Francisco City and County, California, 94117, United States" amenity university 0.483095905643059 United States FALSE
+uta us Americas Northern America FALSE 1 2021-02-03 257844025 relation "Utah, United States" boundary administrative 0.803765430740067 United States FALSE
+uw medicine us Americas Northern America FALSE 1 2021-02-03 151366370 way "UW Medicine, North 205th Street - 244th Street Southwest, Edmonds, Snohomish County, Washington, 98026, United States" building yes 0.201 United States FALSE
+vaccine research center us Americas Northern America FALSE 1 2021-02-03 213549295 way "Vaccine Research Center, Convent Drive, National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, 20891, United States" building yes 0.301 United States FALSE
+vanderbilt university medical center us Americas Northern America FALSE 1 2021-02-03 198973508 way "Vanderbilt University Medical Center, 1211, Medical Center Drive, Nashville-Davidson, Davidson County, Tennessee, 37232, United States" amenity hospital 0.7277684953714 United States FALSE
+venter institute us Americas Northern America FALSE 1 2021-02-03 183799690 way "J. Craig Venter Institute, Capricorn Lane, San Diego, San Diego County, California, 92093, United States" building university 0.201 United States FALSE
+vi-systems us Americas Northern America FALSE 1 2021-02-03 173136088 way "Systems, Berry Street, South Beach, San Francisco, San Francisco City and County, California, 94158, United States" tourism artwork 0.101 United States FALSE
+vickers us Americas Northern America FALSE 1 2021-02-03 404820 node "Vickers, Northwood, Wood County, Ohio, 43619, United States" place hamlet 0.35 United States FALSE
+village veterinary medical center us Americas Northern America FALSE 1 2021-02-03 178105276 way "Village Veterinary Medical Center, Kingston Pike, Dixie Lee Junction, Farragut, Knox County, Tennessee, 37934, United States" amenity veterinary 0.401 United States FALSE
+voice of america us Americas Northern America FALSE 1 2021-02-03 243204715 way "Voice of America, Marathon, Monroe County, Florida, United States" landuse industrial 0.5 United States FALSE
+von kleinsmid center us Americas Northern America FALSE 1 2021-02-03 259003738 relation "Von Kleinsmid Center for International and Public Affairs, 3518, Trousdale Parkway, University Park, Los Angeles, Los Angeles County, California, 90089, United States" building university 0.301 United States FALSE
+wakemed us Americas Northern America FALSE 1 2021-02-03 116051721 way "WakeMed Soccer Park, Cary, Wake County, North Carolina, United States" leisure park 0.515288505579639 United States FALSE
+wal-mart us Americas Northern America FALSE 1 2021-02-03 171263241 way "Wal-Mart, Frisco, Denton County, Texas, 75036, United States" highway service 0.275 United States FALSE
+wash us Americas Northern America FALSE 1 2021-02-03 257846660 relation "Washington, United States" boundary administrative 0.812929792315567 United States FALSE
+washington college us Americas Northern America FALSE 1 2021-02-03 195835630 way "Washington College, 300, Washington Avenue, Lees Corner, Chestertown, Kent County, Maryland, 21620, United States" amenity university 0.616731953273046 United States FALSE
+washington times us Americas Northern America FALSE 1 2021-02-03 162772326 way "Washington Times, 3600, New York Avenue Northeast, Washington, District of Columbia, 20002, United States" office newspaper 0.201 United States FALSE
+web of science us Americas Northern America FALSE 1 2021-02-03 64913555 node "Web Science and Digital Libraries Research Group, 4600, Elkhorn Avenue, Norfolk, Virginia, 23508, United States" office yes 0.201 United States FALSE
+weeden us Americas Northern America FALSE 1 2021-02-03 2424327 node "Weeden Hill, Windsor, Windsor County, Vermont, United States" natural peak 0.4 United States FALSE
+welsh us Americas Northern America FALSE 1 2021-02-03 257788849 relation "Welsh, Jefferson Davis Parish, Louisiana, 70591, United States" boundary administrative 0.36851441835616 United States FALSE
+wesleyan us Americas Northern America FALSE 1 2021-02-03 433666 node "Wesleyan, Macon, Bibb County, Georgia, 31210, United States" place neighbourhood 0.35 United States FALSE
+west virginia department of environmental protection us Americas Northern America FALSE 1 2021-02-03 83977046 node "West Virginia Department of Environmental Protection, 607, 57th Street Southeast, Charleston, Kanawha County, West Virginia, 25304, United States" office government 0.601 United States FALSE
+western environmental law center us Americas Northern America FALSE 1 2021-02-03 45649564 node "Western Environmental Law Center: Northern Rockies Office, Reeders Alley, Last Chance Gulch, Helena, Lewis and Clark County, Montana, 59601, United States" office lawyer 0.401 United States FALSE
+white oak conservation center us Americas Northern America FALSE 1 2021-02-03 253782332 way "Conservation Center, Inner Loop, Houston, Harris County, Texas, 77024-8022, United States" building yes 0.201 United States FALSE
+whittemore peterson institute in reno us Americas Northern America FALSE 1 2021-02-03 174133369 way "Whittemore Peterson Institute, North Medical Way, Reno, Washoe County, Nevada, 89557, United States" building university 0.501 United States FALSE
+wichita state university us Americas Northern America FALSE 1 2021-02-03 2785487 node "Wichita State University, Perimeter Road, Wichita, Sedgwick County, Kansas, 67260-0074, United States" amenity university 0.755054694349514 United States FALSE
+wikimedia foundation us Americas Northern America FALSE 1 2021-02-03 60460773 node "Wikimedia Foundation, 120, Kearny Street, Union Square, San Francisco, San Francisco City and County, California, 94104, United States" office foundation 1.04735447105057 United States FALSE
+wildlife department us Americas Northern America FALSE 1 2021-02-03 235737387 way "Red Rock Wildlife Management Area, Game Department Road, Grant County, New Mexico, United States" leisure nature_reserve 0.201 United States FALSE
+wildlife services us Americas Northern America FALSE 1 2021-02-03 208429848 way "US Fish & Wildlife Services, 101, Park de Ville Drive, Fairview Marketplace, Columbia, Boone County, Missouri, 65203, United States" building yes 0.201 United States FALSE
+wilmerhale us Americas Northern America FALSE 1 2021-02-03 299916888 node "WilmerHale, 60, State Street, Dock Square, Financial District, Boston, Suffolk County, Massachusetts, 02109, United States" office lawyer 0.101 United States FALSE
+winthrop hospital us Americas Northern America FALSE 1 2021-02-03 258517235 relation "Winthrop, Suffolk County, Massachusetts, 02152, United States" boundary administrative 0.548258147549701 United States FALSE
+wisc-tv us Americas Northern America FALSE 1 2021-02-03 2318577 node "WISC-TV (Madison), Daytona Beach Drive, Madison, Dane County, Wisconsin, 53711, United States" man_made tower 0.201 United States FALSE
+wisconsin alumni research foundation us Americas Northern America FALSE 1 2021-02-03 101032142 way "Wisconsin Alumni Research Foundation, 614, Walnut Street, Madison, Dane County, Wisconsin, 53706, United States" building university 0.401 United States FALSE
+withers us Americas Northern America FALSE 1 2021-02-03 423638 node "Withers, Washington County, Virginia, United States" place hamlet 0.35 United States FALSE
+woodrow wilson international center for scholars us Americas Northern America FALSE 1 2021-02-03 47333285 node "Woodrow Wilson International Center for Scholars, 1300, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20004, United States" office government 1.00659791861715 United States FALSE
+woods hole us Americas Northern America FALSE 1 2021-02-03 489384 node "Woods Hole, Falmouth, Barnstable County, Massachusetts, 02543, United States" place village 0.599945269937336 United States FALSE
+worcester polytechnic institute us Americas Northern America FALSE 1 2021-02-03 299167589 relation "Worcester Polytechnic Institute, 100, Institute Road, Lincoln Square, Hammond Heights, Worcester, Worcester County, Massachusetts, 01609, United States" amenity university 0.727443521124928 United States FALSE
+world commission us Americas Northern America FALSE 1 2021-02-03 69631578 node "Calhoun County Participation in World War II, South Ann Street, Port Lavaca, Calhoun County, Texas, 77979, United States" tourism information 0.101 United States FALSE
+wyeth us Americas Northern America FALSE 1 2021-02-03 384418 node "Wyeth, Andrew County, Missouri, 64483, United States" place hamlet 0.35 United States FALSE
+xavier university of louisiana us Americas Northern America FALSE 1 2021-02-03 296045405 way "Xavier University of Louisiana, 1, Drexel Drive, Mid-City, New Orleans, Orleans Parish, Louisiana, 70135, United States" amenity university 0.801059138797379 United States FALSE
+xcel energy us Americas Northern America FALSE 1 2021-02-03 119271696 way "Xcel Energy, 1901, East Horsetooth Road, Peachtree, Fort Collins, Larimer County, Colorado, 80525, United States" building yes 0.581776066939633 United States FALSE
+xcor us Americas Northern America FALSE 1 2021-02-03 296995407 way "Xcor Aerospace, Earhart Drive, Midland Spaceport Business Park, Midland, Midland County, Texas, United States" aeroway hangar 0.101 United States FALSE
+xerox us Americas Northern America FALSE 1 2021-02-03 197336370 way "Xerox, Wilsonville, Metro, Oregon, United States" landuse industrial 0.3 United States FALSE
+yahoo us Americas Northern America FALSE 1 2021-02-03 259181165 relation "Yahoo, Sunnyvale, Santa Clara County, California, United States" landuse commercial 0.3 United States FALSE
+yale law school us Americas Northern America FALSE 1 2021-02-03 258747361 relation "Yale Law School, 127, Wall Street, Downtown, New Haven, New Haven County, Connecticut, 06511-8918, United States" building university 0.301 United States FALSE
+zebrafish international resource center us Americas Northern America FALSE 1 2021-02-03 226773628 way "Zebrafish International Resource Center, 1307, Franklin Boulevard, Eugene, Lane County, Oregon, 97403-5274, United States" building yes 0.401 United States FALSE
+zynga us Americas Northern America FALSE 1 2021-02-03 128825110 way "Zynga, 650, Townsend Street, West SoMa, San Francisco, San Francisco City and County, California, 90103, United States" building yes 0.101 United States FALSE
+bwindi impenetrable forest ug Africa Eastern Africa FALSE 1 2021-02-03 258803943 relation "Bwindi Impenetrable Forest, Mpungu Sub-County, Kisoro, Western Region, Uganda" natural wood 0.562719188578863 Uganda FALSE
+civil aviation authority ug Africa Eastern Africa FALSE 1 2021-02-03 170067698 way "Civil Aviation Authority, Airport Road, Old Entebbe Subward, Kigungu Ward, Bukiberu, Wakiso, Central Region, 7545, Uganda" office government 0.61689306175332 Uganda FALSE
+ethiopian airlines ug Africa Eastern Africa FALSE 1 2021-02-03 43675550 node "Ethiopian Airlines, Kimathi Avenue, Kibuli, Nakasero, Kampala Capital City, Kampala, Central Region, 7063, Uganda" office company 0.201 Uganda FALSE
+genetic technologies ug Africa Eastern Africa FALSE 1 2021-02-03 72430341 node "AGT Agro Genetic Technologies, Fort Portal - Kampala Road, Kiwumu, Buloba, Wakiso, Central Region, P.O BOX 14047, Uganda" office research 0.201 Uganda FALSE
+institute of pure ug Africa Eastern Africa FALSE 1 2021-02-03 62440383 node "Umma Islamic Institute Yumbe, Moyo Road, Ibanga, Yumbe, Northern Region, 6, Uganda" amenity school 0.101 Uganda FALSE
+licensing board ug Africa Eastern Africa FALSE 1 2021-02-03 52447752 node "Ministry of Works and Transport - Transport Licensing Board - Main Office, Old Portbell Road, Wankoko, Kiswa, Kampala Capital City, Kampala, Central Region, 24144, Uganda" office government 0.201 Uganda FALSE
+makerere ug Africa Eastern Africa FALSE 1 2021-02-03 22277112 node "Makerere, Kampala Capital City, Kampala, Central Region, P.O. BOX 36152 KAMPALA, Uganda" place suburb 0.375 Uganda FALSE
+mbarara university ug Africa Eastern Africa FALSE 1 2021-02-03 48867675 node "Mbarara University of Science and Technology, University Road, Boma B, Mbarara, Western Region, PO BOX 1051, Uganda" amenity school 0.201 Uganda FALSE
+oci ug Africa Eastern Africa FALSE 1 2021-02-03 60558755 node "Oci, Ajia, Arua, Northern Region, Uganda" place village 0.375 Uganda FALSE
+ötzi ug Africa Eastern Africa FALSE 1 2021-02-03 47932812 node "Mount Otze, Moyo, Northern Region, Uganda" natural peak 0.3 Uganda FALSE
+uganda virus research institute ug Africa Eastern Africa FALSE 1 2021-02-03 176398119 way "Uganda Virus Research Institute, 51-59, Nakiwogo Road, Lunyo Estate, Nakiwogo, Entebbe, Wakiso, Central Region, 31304, Uganda" office research 0.401 Uganda FALSE
+almaz ua Europe Eastern Europe FALSE 1 2021-02-03 2367823 node "Ð<90>лмаз, Пшенична вулицÑ<8f>, Перемога, Борщагівка, СвÑ<8f>тошинÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 03165, Україна" railway halt 0.31689306175332 Україна FALSE
+bogomoletz institute of physiology ua Europe Eastern Europe FALSE 1 2021-02-03 103259236 way "ІнÑ<81>титут фізіології ім. О.О. БогомольцÑ<8f> Ð<9d>Ð<90>Ð<9d>У, 4, Ð<90>кадеміка БогомольцÑ<8f> вулицÑ<8f>, ЛевашовÑ<81>ька Гора, Липки, ПечерÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 01043, Україна" office research 0.001 Україна FALSE
+climate council ua Europe Eastern Europe FALSE 1 2021-02-03 17215913 node "Кліматичний Ñ<81>алон ""Мертвого морÑ<8f>"", 12, Городище вулицÑ<8f>, СуховолÑ<8f>, ТруÑ<81>кавець, ТруÑ<81>кавецька міÑ<81>ька об'єднана територіальна громада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 82200, Україна" amenity doctors 0.001 Україна FALSE
+cwc ua Europe Eastern Europe FALSE 1 2021-02-03 259500805 relation "Міжнародний Ð<90>еропорт Чернівці, УÑ<81>тима Кармелюка вулицÑ<8f>, Чернівці, Чернівецький район, Чернівецька облаÑ<81>Ñ‚ÑŒ, 58009, Україна" aeroway aerodrome 0.343659122005759 Україна FALSE
+elkh ua Europe Eastern Europe FALSE 1 2021-02-03 44342547 node "Ðльх-КаÑ<8f>, ДобровÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, СимферопольÑ<81>кий район, 98533, Україна" natural peak 0.3 Україна FALSE
+grl ua Europe Eastern Europe FALSE 1 2021-02-03 79972495 node "ГРЛ, КиївÑ<81>ький район, Полтава, ПoлтaвÑ<81>ькa міÑ<81>ька громада, ПолтавÑ<81>ький район, ПолтавÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 36007, Україна" place suburb 0.275 Україна FALSE
+hrk ua Europe Eastern Europe FALSE 1 2021-02-03 100226680 way "Міжнародний аеропорт ""Харків"", Планерний провулок, ОÑ<81>нов’Ñ<8f>нÑ<81>ький район, Харків, Ð¥apківÑ<81>ькa міÑ<81>ька громада, ХарківÑ<81>ький район, ХарківÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 61031, Україна" aeroway aerodrome 0.436669512144612 Україна FALSE
+institute of geological sciences ua Europe Eastern Europe FALSE 1 2021-02-03 118391727 way "ІнÑ<81>титут геологічних наук, 55б, ОлеÑ<81>Ñ<8f> Гончара вулицÑ<8f>, СвÑ<8f>тоÑ<81>лавÑ<81>ький Ñ<8f>Ñ€, Центр, ШевченківÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 01054, Україна" building university 0.001 Україна FALSE
+ivf ua Europe Eastern Europe FALSE 1 2021-02-03 257286052 relation "Івано-ФранківÑ<81>ька облаÑ<81>Ñ‚ÑŒ, Україна" boundary administrative 0.598264833674486 Україна FALSE
+national climate council ua Europe Eastern Europe FALSE 1 2021-02-03 17215913 node "Кліматичний Ñ<81>алон ""Мертвого морÑ<8f>"", 12, Городище вулицÑ<8f>, СуховолÑ<8f>, ТруÑ<81>кавець, ТруÑ<81>кавецька міÑ<81>ька об'єднана територіальна громада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 82200, Україна" amenity doctors 0.001 Україна FALSE
+national scientific research council ua Europe Eastern Europe FALSE 1 2021-02-03 126589521 way "Ð<9d>ауководоÑ<81>лідний інÑ<81>титут ""Синтез"", ТуÑ<81>тановичі, БориÑ<81>лав, БориÑ<81>лавÑ<81>ький Ñ<81>тароÑ<81>тинÑ<81>ький округ, БориÑ<81>лавÑ<81>ька міÑ<81>ька рада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, Україна" landuse industrial 0.2 Україна FALSE
+nektar ua Europe Eastern Europe FALSE 1 2021-02-03 157515631 way "4, Ð<9d>ектар, Вишків, Луцьк, Луцька міÑ<81>ька громада, Луцький район, ВолинÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 43000-43499, Україна" landuse industrial 0.2 Україна FALSE
+nmts ua Europe Eastern Europe FALSE 1 2021-02-03 202363077 way "19, Ð<9d>авчальний центр цивільного захиÑ<81>ту, Броди, БродівÑ<81>ька міÑ<81>ька рада, ЗолочівÑ<81>ький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 80600-80603, Україна" landuse commercial 0.2 Україна FALSE
+ods ua Europe Eastern Europe FALSE 1 2021-02-03 138824479 way "Міжнародний аеропорт ""ОдеÑ<81>а"", Івана та ЮріÑ<8f> Лип вулицÑ<8f>, 10-й квартал, Район IV-1 ""Південно-Західний"" (""Черемушки""), МалиновÑ<81>ький район, ОдеÑ<81>а, ОдеÑ<81>ький район, ОдеÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 65078, Україна" aeroway aerodrome 0.445681568627775 Україна FALSE
+polytechnic university of milan ua Europe Eastern Europe FALSE 1 2021-02-03 48343820 node "Політехнічний універÑ<81>итет, Шевченка проÑ<81>пект, Відрада, ПриморÑ<81>ький район, ОдеÑ<81>а, ОдеÑ<81>ький район, ОдеÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 65050, Україна" highway bus_stop 0.001 Україна FALSE
+saints cyril ua Europe Eastern Europe FALSE 1 2021-02-03 22338079 node "Пам'Ñ<8f>тник Кирилу Ñ– Мефодію, Кирила Ñ– МефодіÑ<8f> площа, Пентагон, Мукачево, МукачівÑ<81>ька міÑ<81>ька громада, МукачівÑ<81>ький район, ЗакарпатÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 89600, Україна" historic memorial 0.001 Україна FALSE
+scientific council ua Europe Eastern Europe FALSE 1 2021-02-03 126589521 way "Ð<9d>ауководоÑ<81>лідний інÑ<81>титут ""Синтез"", ТуÑ<81>тановичі, БориÑ<81>лав, БориÑ<81>лавÑ<81>ький Ñ<81>тароÑ<81>тинÑ<81>ький округ, БориÑ<81>лавÑ<81>ька міÑ<81>ька рада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, Україна" landuse industrial 0.2 Україна FALSE
+uae ministry of foreign affairs ua Europe Eastern Europe FALSE 1 2021-02-03 96214681 way "МініÑ<81>терÑ<81>тво закордонних Ñ<81>прав, 1, МихайлівÑ<81>ька площа, Старий Київ, Центр, ШевченківÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 01025, Україна" amenity public_building 0.436669512144612 Україна FALSE
+unified command ua Europe Eastern Europe FALSE 1 2021-02-03 159462615 way "Kommandobunkersilo, Ð<9d>-24, СинюхинобрідÑ<81>ька Ñ<81>ільÑ<81>ька територіальна громада, ПервомайÑ<81>ький район, МиколаївÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 55235, Україна" building silo 0.001 Україна FALSE
+aga khan university tz Africa Eastern Africa FALSE 1 2021-02-03 68562414 node "Aga Khan University, T5, Arusha, Northern Zone, 10086, Tanzania" amenity school 0.301 Tanzania FALSE
+antiquities authority tz Africa Eastern Africa FALSE 1 2021-02-03 49902313 node "Antiquities Authority (to get permit for islands), Kilwa-Nangurukuru Road, Kilwa Masoko, Kilwa, Lindi, Coastal Zone, Tanzania" office government 0.201 Tanzania FALSE
+environmental laboratory tz Africa Eastern Africa FALSE 1 2021-02-03 123904242 way "Environmental Laboratory, Makongo Road, Makongo, Dar es Salaam, Coastal Zone, 225, Tanzania" building school 0.201 Tanzania FALSE
+ifakara health institute tz Africa Eastern Africa FALSE 1 2021-02-03 168888993 way "Ifakara Health Institute, Bagamoyo Road, Mwanakalenge, Bagamoyo, Pwani, Coastal Zone, 66, Tanzania" building yes 0.301 Tanzania FALSE
+imi tz Africa Eastern Africa FALSE 1 2021-02-03 42593582 node "Ihemi, Iringa, Southern Highlands Zone, Tanzania" place village 0.275 Tanzania FALSE
+institute of medical research tz Africa Eastern Africa FALSE 1 2021-02-03 52660057 node "Institute of Rural Development Planning, Machinjioni-Bwiru, Kitangiri, Mihama, Ilemela, Mwanza, Lake Zone, +225, Tanzania" office educational_institution 0.201 Tanzania FALSE
+institute of meteorology tz Africa Eastern Africa FALSE 1 2021-02-03 54166158 node "Institute of Meteorology, Majengo Mwanga Street, Katubuka, Kigoma Rural, Kigoma, Western Zone, 47000, Tanzania" amenity school 0.301 Tanzania FALSE
+nhc tz Africa Eastern Africa FALSE 1 2021-02-03 80286627 node "Nhc, Muleba, Kagera, Lake Zone, Tanzania" place village 0.375 Tanzania FALSE
+obey as house tz Africa Eastern Africa FALSE 1 2021-02-03 46195275 node "Obey, T9, Kasulu, Kigoma, Western Zone, 35, Tanzania" shop stationery 0.201 Tanzania FALSE
+orbital tz Africa Eastern Africa FALSE 1 2021-02-03 202732260 way "Orbital, Babati, Manyara, Northern Zone, Tanzania" highway unclassified 0.2 Tanzania FALSE
+people's democratic party tz Africa Eastern Africa FALSE 1 2021-02-03 44502629 node "United People's Democratic Party (UPDP), 21, Kagera Street, Kagera, Makurumla, Dar es Salaam, Coastal Zone, P.O.BOX 22304, Tanzania" office political_party 0.401 Tanzania FALSE
+queensland institute of medical research tz Africa Eastern Africa FALSE 1 2021-02-03 52660057 node "Institute of Rural Development Planning, Machinjioni-Bwiru, Kitangiri, Mihama, Ilemela, Mwanza, Lake Zone, +225, Tanzania" office educational_institution 0.201 Tanzania FALSE
+saint joseph university tz Africa Eastern Africa FALSE 1 2021-02-03 225955760 way "St.Joseph University, Morogoro Road, Mbezi, Dar es Salaam, Coastal Zone, 11007, Tanzania" amenity university 0.201 Tanzania FALSE
+sstl tz Africa Eastern Africa FALSE 1 2021-02-03 175656650 way "SSTL Group, Bwawani, Mwananyamala, Dar es Salaam, Coastal Zone, 31537, Tanzania" office company 0.101 Tanzania FALSE
+tanzania national parks tz Africa Eastern Africa FALSE 1 2021-02-03 197453437 way "Simba A public campsite, T17, Kimba, Ngorongoro, Arusha, Northern Zone, Tanzania" tourism camp_site 0.101 Tanzania FALSE
+university of dar es salaam tz Africa Eastern Africa FALSE 1 2021-02-03 889510 node "University of Dar es Salaam, University Road, Chuo Kikuu, Ubungo, Dar es Salaam, Coastal Zone, 131, Tanzania" amenity university 0.896675389924706 Tanzania FALSE
+chiao tung university tw Asia Eastern Asia FALSE 1 2021-02-03 258760261 relation "國立交通大å¸å…‰å¾©æ ¡å<8d>€, 1001, 大å¸è·¯, 光明里, æ<9d>±å<8d>€, 新竹市, 30010, 臺ç<81>£" amenity university 0.438299554906152 臺ç<81>£ FALSE
+ctv tw Asia Eastern Asia FALSE 1 2021-02-03 108045711 way "ä¸åœ‹é›»è¦–å…¬å<8f>¸, 120, é‡<8d>陽路, 基河國宅三期, å<8d>—港å<8d>€, 三é‡<8d>埔, 臺北市, 11573, 臺ç<81>£" amenity studio 0.480565769794864 臺ç<81>£ FALSE
+democratic progressive party tw Asia Eastern Asia FALSE 1 2021-02-03 25178248 node "民主進æ¥é»¨, 30, 北平æ<9d>±è·¯, å…‰è<8f>¯å•†å ´, 梅花里, ä¸æ£å<8d>€, è<8f>¯å±±, 臺北市, 10049, 臺ç<81>£" office political_party 0.513806514981921 臺ç<81>£ FALSE
+executive yuan tw Asia Eastern Asia FALSE 1 2021-02-03 59877038 node "行政院, 1, å¿ å<9d>æ<9d>±è·¯ä¸€æ®µ, 梅花里, ä¸æ£å<8d>€, è<8f>¯å±±, 臺北市, 10058, 臺ç<81>£" office government 0.528630874953084 臺ç<81>£ FALSE
+hsus tw Asia Eastern Asia FALSE 1 2021-02-03 54120623 node "許金å<90>‰å©¦ç”¢ç§‘診所, 155, 繼光街, 繼光里, ä¸å<8d>€, 臺ä¸å¸‚, 40046, 臺ç<81>£" amenity clinic 0.001 臺ç<81>£ FALSE
+ministry of health and welfare tw Asia Eastern Asia FALSE 1 2021-02-03 14219486 node "å<81>¥ä¿<9d>局站, ä¹<9d>如二路, å¾·ä»<81>里, 三民å<8d>€, 高雄市, 807, 臺ç<81>£" highway bus_stop 0.001 臺ç<81>£ FALSE
+national central university tw Asia Eastern Asia FALSE 1 2021-02-03 133790181 way "國立ä¸å¤®å¤§å¸, 300, ä¸å¤§è·¯, 上三座屋, 五權里, ä¸å£¢å<8d>€, 桃園市, 320, 臺ç<81>£" amenity university 0.4530695196617 臺ç<81>£ FALSE
+national taiwan university of science and technology tw Asia Eastern Asia FALSE 1 2021-02-03 258700551 relation "國立臺ç<81>£ç§‘技大å¸, 43, 基隆路四段, å¸åºœé‡Œ, 大安å<8d>€, 公館, 臺北市, 10607, 臺ç<81>£" amenity university 0.403228244753236 臺ç<81>£ FALSE
+national tsing hua university tw Asia Eastern Asia FALSE 1 2021-02-03 258520993 relation "國立清è<8f>¯å¤§å¸, 101, 光復路二段, è»<8d>功里, æ<9d>±å<8d>€, 新竹市, 30013, 臺ç<81>£" amenity university 0.460442945520659 臺ç<81>£ FALSE
+ntust tw Asia Eastern Asia FALSE 1 2021-02-03 297907542 node "臺ç<81>£ç§‘技大å¸æ£é–€, 基隆路四段, å¸åºœé‡Œ, 大安å<8d>€, 公館, 臺北市, 10607, 臺ç<81>£" amenity bicycle_rental 0.001 臺ç<81>£ FALSE
+penghu tw Asia Eastern Asia FALSE 1 2021-02-03 258475315 relation "澎湖縣, 臺ç<81>£" boundary administrative 0.518098074053445 臺ç<81>£ FALSE
+shilin district court tw Asia Eastern Asia FALSE 1 2021-02-03 302352027 relation "ç¦<8f>德里, 士林å<8d>€, 臺北市, 臺ç<81>£" boundary administrative 0.450936419284163 臺ç<81>£ FALSE
+supreme administrative court tw Asia Eastern Asia FALSE 1 2021-02-03 25702443 node "最高行政法院, 1, é‡<8d>æ…¶å<8d>—路一段126å··, 建國里, ä¸æ£å<8d>€, 城內, 臺北市, 10048, 臺ç<81>£" amenity courthouse 0.26358119422997 臺ç<81>£ FALSE
+china computer federation tt Americas Caribbean FALSE 1 2021-02-03 38056389 node "The New China Palace Restaurant and Bar, Rapsey Street, Ellerslie Park, Federation Park, Port of Spain, 190130, Trinidad and Tobago" amenity restaurant 0.201 Trinidad and Tobago FALSE
+trinidad and tobago tt Americas Caribbean FALSE 1 2021-02-03 258485524 relation Trinidad and Tobago boundary administrative 0.975753620834238 Trinidad and Tobago FALSE
+bilkent university tr Asia Western Asia FALSE 1 2021-02-03 96394890 way "Bilkent Üniversitesi, 1598. Cadde, Bilkent, Üniversiteler Mahallesi, Çankaya, Ankara, İç Anadolu Bölgesi, 06800, Türkiye" amenity university 0.101 Türkiye FALSE
+istac tr Asia Western Asia FALSE 1 2021-02-03 103485000 way "ISTAC, Göktürk Merkez Mahallesi, Eyüpsultan, İstanbul, Marmara Bölgesi, 34077, Türkiye" highway unclassified 0.2 Türkiye FALSE
+istanbul technical university tr Asia Western Asia FALSE 1 2021-02-03 299541318 relation "İstanbul Teknik Üniversitesi, Hacı Sokağı, Reşitpaşa Mahallesi, Sarıyer, İstanbul, Marmara Bölgesi, 34467, Türkiye" amenity university 0.478845445337603 Türkiye FALSE
+koç university tr Asia Western Asia FALSE 1 2021-02-03 182910189 way "Koç Ãœniversitesi, Koç Meydanı, Rumeli Feneri Mahallesi, Sarıyer, Ä°stanbul, Marmara Bölgesi, 34450, Türkiye" amenity university 0.507183702790066 Türkiye FALSE
+nike tr Asia Western Asia FALSE 1 2021-02-03 116094096 way "NIKE, Datça, Ege Bölgesi, Türkiye" landuse military 0.445499031753052 Türkiye FALSE
+nişantaşı university tr Asia Western Asia FALSE 1 2021-02-03 76974025 node "NiÅŸantaşı Ãœniversitesi Kampüsü, Ergenekon Caddesi, Bozkurt Mahallesi, Cumhuriyet Mahallesi, ÅžiÅŸli, Ä°stanbul, Marmara Bölgesi, Türkiye" amenity university 0.101 Türkiye FALSE
+okeanos tr Asia Western Asia FALSE 1 2021-02-03 190826338 way "27, Okeanos, Selimiye, Manavgat, Antalya, Akdeniz Bölgesi, Türkiye" landuse residential 0.3 Türkiye FALSE
+onc tr Asia Western Asia FALSE 1 2021-02-03 61860502 node "Onc, Kamil Sokağı, Orhangazi, Orhangazi Mahallesi, Sultanbeyli, İstanbul, Marmara Bölgesi, 34925, Türkiye" shop furniture 0.101 Türkiye FALSE
+sabanci university tr Asia Western Asia FALSE 1 2021-02-03 112700587 way "Sabancı Üniversitesi, Yetkin Sokağı, Orta Mahallesi, Tuzla, İstanbul, Marmara Bölgesi, 34956, Türkiye" amenity university 0.40124284206117 Türkiye FALSE
+sabancı university tr Asia Western Asia FALSE 1 2021-02-03 112700587 way "Sabancı Ãœniversitesi, Yetkin Sokağı, Orta Mahallesi, Tuzla, Ä°stanbul, Marmara Bölgesi, 34956, Türkiye" amenity university 0.50124284206117 Türkiye FALSE
+hpa to Oceania Polynesia FALSE 1 2021-02-03 162568512 way "Mala'e Vakapuna Salote Pilolevu, Hala Holopeka, Niu a Kalo, Pangai, Vahe Lifuka, Haʻapai, Tonga" aeroway aerodrome 0.249182950422608 Tonga FALSE
+cme tn Africa Northern Africa FALSE 1 2021-02-03 248166891 way "CME, الزهروني, معتمدية الØرائرية, ØÙŠ السلامة, ولاية تونس, تونس" landuse commercial 0.3 تونس FALSE
+gfi tn Africa Northern Africa FALSE 1 2021-02-03 259231351 relation "القÙ<81>Ù‰, معتمدية السبيخة, ولاية القيروان, تونس" boundary administrative 0.45 تونس FALSE
+mida tn Africa Northern Africa FALSE 1 2021-02-03 259125031 relation "الميدة, معتمدية الميدة, ولاية نابل, تونس" boundary administrative 0.45 تونس FALSE
+ne syrtis tn Africa Northern Africa FALSE 1 2021-02-03 259313705 relation "خليج قابس, ولاية صÙ<81>اقس, تونس" natural bay 0.410111385609355 تونس FALSE
+sbi tn Africa Northern Africa FALSE 1 2021-02-03 258953939 relation "‫صبيØ‬, معتمدية الصخيرة, ولاية صÙ<81>اقس, 3073, تونس" boundary administrative 0.45 تونس FALSE
+world bank group tl Asia South-Eastern Asia FALSE 1 2021-02-03 191303191 way "World Bank Group, Avenida Marginal, Lecidere, Dili, 10, Timór Lorosa'e" building yes 0.301 Timór Lorosa'e FALSE
+chinese pla general hospital th Asia South-Eastern Asia FALSE 1 2021-02-03 207820505 way "Chinese shrine, ถ้ำปลา ซà¸à¸¢8, บ้านถ้ำสันติสุข, จังหวัดเชียงราย, ประเทศไทย" amenity place_of_worship 0.101 ประเทศไทย FALSE
+chulalongkorn university th Asia South-Eastern Asia FALSE 1 2021-02-03 258312812 relation "จุฬาลงà¸<81>รณ์มหาวิทยาลัย, 254, ถนนพà¸<8d>าไท, วังใหม่, à¹<81>ขวงวังใหม่, เขตปทุมวัน, à¸<81>รุงเทพมหานคร, 10330, ประเทศไทย" amenity university 0.460618187035857 ประเทศไทย FALSE
+cnt th Asia South-Eastern Asia FALSE 1 2021-02-03 258466185 relation "จังหวัดชัยนาท, ประเทศไทย" boundary administrative 0.466806566636269 ประเทศไทย FALSE
+institute of molecular biosciences th Asia South-Eastern Asia FALSE 1 2021-02-03 249564888 way "Institute of Molecular Biosciences, 25/25, ถนนพุทธมณฑล สาย 4, ศาลายา, จังหวัดนครปà¸<90>ม, 73170, ประเทศไทย" building yes 0.401 ประเทศไทย FALSE
+khon kaen university th Asia South-Eastern Asia FALSE 1 2021-02-03 207021071 way "Khon Kaen University, ถนนมิตรภาพ, บ้านหนà¸à¸‡à¹€à¸”ิ่น, จังหวัดหนà¸à¸‡à¸„าย, 43000, ประเทศไทย" amenity school 0.301 ประเทศไทย FALSE
+national research council of thailand th Asia South-Eastern Asia FALSE 1 2021-02-03 45408539 node "สำนัà¸<81>งานà¸<81>ารวิจัยà¹<81>ห่งชาติ (วช.), 196, ถนนพหลโยธิน, เà¸<81>ษตร, à¹<81>ขวงลาดยาว, เขตจตุจัà¸<81>ร, à¸<81>รุงเทพมหานคร, 10900, ประเทศไทย" office government 0.001 ประเทศไทย FALSE
+national science and technology development agency th Asia South-Eastern Asia FALSE 1 2021-02-03 154780568 way "NSTDA, ถนนยูงทà¸à¸‡, à¸à¸³à¹€à¸ à¸à¸„ลà¸à¸‡à¸«à¸¥à¸§à¸‡, จังหวัดปทุมธานี, 12121, ประเทศไทย" office government 0.001 ประเทศไทย FALSE
+pkk th Asia South-Eastern Asia FALSE 1 2021-02-03 298297451 node "สถานีรถไฟประจวบคีรีขันธ์, ถนนมหาราช 1, ประจวบคีรีขันธ์, จังหวัดประจวบคีรีขันธ์, 77000, ประเทศไทย" railway station 0.370639694209592 ประเทศไทย FALSE
+pna th Asia South-Eastern Asia FALSE 1 2021-02-03 258299298 relation "จังหวัดพังงา, ประเทศไทย" boundary administrative 0.473319178124722 ประเทศไทย FALSE
+sri th Asia South-Eastern Asia FALSE 1 2021-02-03 258233401 relation "จังหวัดสระบุรี, ประเทศไทย" boundary administrative 0.478610654960806 ประเทศไทย FALSE
+ubon ratchathani university th Asia South-Eastern Asia FALSE 1 2021-02-03 66929366 node "Ubon Ratchathani University, ถนนสถลมาร์ค, จังหวัดà¸à¸¸à¸šà¸¥à¸£à¸²à¸Šà¸˜à¸²à¸™à¸µ, ประเทศไทย" amenity university 0.301 ประเทศไทย FALSE
+un food and agriculture organization th Asia South-Eastern Asia FALSE 1 2021-02-03 139296121 way "UN Food & Agriculture Organization, ถนนพระà¸à¸²à¸—ิตย์, พระà¸à¸²à¸—ิตย์, à¹<81>ขวงชนะสงคราม, เขตพระนคร, à¸<81>รุงเทพมหานคร, 10200, ประเทศไทย" building office 0.401 ประเทศไทย FALSE
+cad td Africa Middle Africa FALSE 1 2021-02-03 258517069 relation Tchad تشاد boundary administrative 0.662462283081021 Tchad تشاد FALSE
+aafs sy Asia Western Asia FALSE 1 2021-02-03 4535189 node "جوار العÙ<81>ص, ناØية الناصرة, منطقة تلکلخ, Ù…ØاÙ<81>ظة Øمص, سوريا" place village 0.275 سوريا FALSE
+azizi sy Asia Western Asia FALSE 1 2021-02-03 4628756 node "عزيزة, ناØية جبل سمعان, منطقة جبل سمعان, Ù…ØاÙ<81>ظة Øلب, سوريا" place village 0.275 سوريا FALSE
+icarda sy Asia Western Asia FALSE 1 2021-02-03 181236548 way "Icarda, رسم عبود, ناØية رسم الØرمل الإمام, Ù…ØاÙ<81>ظة Øلب, سوريا" landuse farmland 0.3 سوريا FALSE
+iied sy Asia Western Asia FALSE 1 2021-02-03 4676615 node "جب عيد, ناØية السعن, منطقة سلمية, Ù…ØاÙ<81>ظة Øماة, سوريا" place village 0.275 سوريا FALSE
+military hospital sy Asia Western Asia FALSE 1 2021-02-03 166172527 way "Military hospital, طرطوس, Ù…ØاÙ<81>ظة طرطوس, سوريا" landuse military 0.4 سوريا FALSE
+rhdf sy Asia Western Asia FALSE 1 2021-02-03 4617427 node "الغدÙ<81>Ø©, ناØية معرة النعمان, منطقة معرة النعمان, Ù…ØاÙ<81>ظة إدلب, سوريا" place village 0.275 سوريا FALSE
+el salvador sv Americas Central America FALSE 1 2021-02-03 258136452 relation El Salvador boundary administrative 0.886510020381369 El Salvador FALSE
+parliamentary ss FALSE 1 2021-02-03 83093461 node "Parliamentary, Ministries Road, Hai Gonya, Juba, Central Equatoria, PRIVATE BAG, South Sudan" tourism apartment 0.101 South Sudan FALSE
+suriname sr Americas South America FALSE 1 2021-02-03 257419144 relation Suriname boundary administrative 0.761728642556969 Suriname FALSE
+aad so Africa Eastern Africa FALSE 1 2021-02-03 14855897 node "Cad, Taleex تلأ Ø, Sool سول, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال" place hamlet 0.25 Soomaaliya الصومال FALSE
+hamas so Africa Eastern Africa FALSE 1 2021-02-03 14960222 node "Xamaas, Ceerigaabo عيرجابو, سناج Sanaag, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال" place village 0.275 Soomaaliya الصومال FALSE
+jif so Africa Eastern Africa FALSE 1 2021-02-03 14854299 node "Jif, Borama بوراما, عدل Awdal, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال" place village 0.375 Soomaaliya الصومال FALSE
+shire so Africa Eastern Africa FALSE 1 2021-02-03 14757227 node "Shire, Qardho قرضو, Bariباري, Soomaaliya الصومال" place village 0.375 Soomaaliya الصومال FALSE
+san marino sm Europe Southern Europe FALSE 1 2021-02-03 257263712 relation San Marino boundary administrative 0.859326375658518 San Marino FALSE
+democracy and human rights sl Africa Western Africa FALSE 1 2021-02-03 157165773 way "Network Movement for Democracy and Human rights, 78, Kailahun, Kailahun District, Eastern Province, 232, Sierra Leone" amenity office 0.401 Sierra Leone FALSE
+global times sl Africa Western Africa FALSE 1 2021-02-03 52844722 node "global times, 15 Percival Street, Percival Street, GOVERNMENT WHARF, Tower Hill, Freetown, Western Area Urban, Western Area, 232, Sierra Leone" amenity cinema 0.201 Sierra Leone FALSE
+kenema government hospital sl Africa Western Africa FALSE 1 2021-02-03 161047442 way "Kenema Government Hospital, Combema Road, Kpayama, Kenema, Kenema District, Eastern Province, EASTERN, Sierra Leone" amenity hospital 0.301 Sierra Leone FALSE
+university of sierra leone sl Africa Western Africa FALSE 1 2021-02-03 209181703 way "Njala University Plantation Forest, Njala, Moyamba District, Southern Province, Sierra Leone" landuse forest 0.5 Sierra Leone FALSE
+green program sk Europe Eastern Europe FALSE 1 2021-02-03 119578034 way "PROGRAM, Brnianska, Zlatovce, TrenÄ<8d>Ãn, okres TrenÄ<8d>Ãn, TrenÄ<8d>iansky kraj, Západné Slovensko, 911 37, Slovensko" building commercial 0.101 Slovensko FALSE
+hdp sk Europe Eastern Europe FALSE 1 2021-02-03 185886235 way "HDP, Dúbrava, okres Liptovský Mikuláš, Žilinský kraj, Stredné Slovensko, Slovensko" highway path 0.175 Slovensko FALSE
+nepal program sk Europe Eastern Europe FALSE 1 2021-02-03 119578034 way "PROGRAM, Brnianska, Zlatovce, TrenÄ<8d>Ãn, okres TrenÄ<8d>Ãn, TrenÄ<8d>iansky kraj, Západné Slovensko, 911 37, Slovensko" building commercial 0.101 Slovensko FALSE
+nier sk Europe Eastern Europe FALSE 1 2021-02-03 127927 node "Nýrovce, okres Levice, Nitriansky kraj, Západné Slovensko, 935 67, Slovensko" place village 0.446214416898128 Slovensko FALSE
+siemens sk Europe Eastern Europe FALSE 1 2021-02-03 72187045 node "Siemens, Laborecká, Terasa, KoÅ¡ice - mestská Ä<8d>asÅ¥ Západ, okres KoÅ¡ice II, KoÅ¡ice, KoÅ¡ický kraj, Východné Slovensko, 04011, Slovensko" office company 0.685789819176952 Slovensko FALSE
+st helena sh Africa Western Africa FALSE 1 2021-02-03 258726181 relation "Saint Helena, Saint Helena, Ascension and Tristan da Cunha" place island 0.780564296027606 "Saint Helena, Ascension and Tristan da Cunha" FALSE
+asia-pacific economic cooperation sg Asia South-Eastern Asia FALSE 1 2021-02-03 296518551 way "Asia-Pacific Economic Cooperation, Heng Mui Keng Terrace, Queenstown, Southwest, 118654, Singapore" building yes 0.401 Singapore FALSE
+bioengineering institute sg Asia South-Eastern Asia FALSE 1 2021-02-03 50955646 node "Institute of Bioengineering and Nanotechnology, 31, Biopolis Way, Biopolis, Queenstown, Southwest, 138669, Singapore" office research 0.201 Singapore FALSE
+dbs sg Asia South-Eastern Asia FALSE 1 2021-02-03 72442407 node "DBS, 1, Maritime Square, Bukit Merah, Singapore, Central, 099253, Singapore" amenity bank 0.521335061990991 Singapore FALSE
+duke nus medical school sg Asia South-Eastern Asia FALSE 1 2021-02-03 131651364 way "Duke-NUS Medical School, 8, College Road, Bukit Merah, Singapore, Central, 169857, Singapore" building university 0.69350420583069 Singapore FALSE
+earth observatory of singapore sg Asia South-Eastern Asia FALSE 1 2021-02-03 68573497 node "Earth Observatory Singapore, Southwest, 637331, Singapore" natural peak 0.6 Singapore FALSE
+icbn sg Asia South-Eastern Asia FALSE 1 2021-02-03 55620813 node "ICBN, Upper Cross Street, Chinatown, Outram, Singapore, Central, 058353, Singapore" amenity bank 0.101 Singapore FALSE
+in-q-tel sg Asia South-Eastern Asia FALSE 1 2021-02-03 241136298 way "MRT Thomson–East Coast Line, North Woodlands Way, Woodlands, Northwest, 738343, Singapore" railway subway 0.505151681397098 Singapore FALSE
+institute of bioengineering and nanotechnology sg Asia South-Eastern Asia FALSE 1 2021-02-03 50955646 node "Institute of Bioengineering and Nanotechnology, 31, Biopolis Way, Biopolis, Queenstown, Southwest, 138669, Singapore" office research 0.501 Singapore FALSE
+international air transport association sg Asia South-Eastern Asia FALSE 1 2021-02-03 61626173 node "International Air Transport Association, 80, Pasir Panjang Road, Alexandra, Singapore, Southwest, 117372, Singapore" office company 0.401 Singapore FALSE
+iseas yusof ishak institute sg Asia South-Eastern Asia FALSE 1 2021-02-03 258638587 relation "ISEAS-Yusof Ishak Institute, 30, Heng Mui Keng Terrace, Pasir Panjang, Southwest, 119614, Singapore" building university 0.706728041583383 Singapore FALSE
+national action party sg Asia South-Eastern Asia FALSE 1 2021-02-03 174317745 way "People's Action Party Community Foundation, 57B, New Upper Changi Road, Bedok, Singapore, Southeast, 463057, Singapore" building yes 0.201 Singapore FALSE
+schering-plough sg Asia South-Eastern Asia FALSE 1 2021-02-03 3281068 node "Schering-Plough, Tuas West Drive, Tuas, Southwest, 638408, Singapore" highway bus_stop 0.201 Singapore FALSE
+singapore immunology network sg Asia South-Eastern Asia FALSE 1 2021-02-03 54912680 node "Singapore Immunology Network (SIgN), 8A, Biomedical Grove, Biopolis, Queenstown, Singapore, Southwest, 138648, Singapore" office research 0.301 Singapore FALSE
+starbucks sg Asia South-Eastern Asia FALSE 1 2021-02-03 71728372 node "Starbucks, 1, Maritime Square, Bukit Merah, Singapore, Central, 099253, Singapore" amenity cafe 0.665860646943562 Singapore FALSE
+temasek life sciences laboratory sg Asia South-Eastern Asia FALSE 1 2021-02-03 109850096 way "Temasek Life Sciences Laboratory, Prince George's Park, Queenstown, Southwest, 118411, Singapore" building yes 0.401 Singapore FALSE
+bmc se Europe Northern Europe FALSE 1 2021-02-03 134782082 way "Biomedicinskt centrum, 3, Husargatan, Polacksbacken, Uppsala, Uppsala kommun, Uppsala län, 75275, Sverige" amenity university 0.190508362962683 Sverige FALSE
+dalarna university in falun se Europe Northern Europe FALSE 1 2021-02-03 661089 node "Högskolan Dalarna, Högskolegatan, Lugnet, Falun, Falu kommun, Dalarnas län, 791 31, Sverige" amenity university 0.540546922258437 Sverige FALSE
+disease control and prevention se Europe Northern Europe FALSE 1 2021-02-03 95487742 way "Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige" office government 0.550936419284163 Sverige FALSE
+disease prevention and control se Europe Northern Europe FALSE 1 2021-02-03 95487742 way "Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige" office government 0.550936419284163 Sverige FALSE
+dow jones se Europe Northern Europe FALSE 1 2021-02-03 120411788 way "Dow Jones, Nacka, Nacka kommun, Stockholms län, 131 33, Sverige" highway path 0.275 Sverige FALSE
+european spallation source se Europe Northern Europe FALSE 1 2021-02-03 128920092 way "European Spallation Source, Öster, Lund, Lunds kommun, Skåne län, 224 84, Sverige" landuse construction 0.626855406087553 Sverige FALSE
+linköping university se Europe Northern Europe FALSE 1 2021-02-03 105800452 way "Linköpings universitet, Hans Meijers väg, Västra Valla, Linköpings domkyrkodistrikt, Linköping, Linköpings kommun, Östergötlands län, 581 17, Sverige" amenity university 0.551830836555001 Sverige FALSE
+mattias green se Europe Northern Europe FALSE 1 2021-02-03 171383634 way "Mattias, Sundby, Spånga-Tensta stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, Sverige" place city_block 0.225 Sverige FALSE
+oxo se Europe Northern Europe FALSE 1 2021-02-03 85642466 way "Oxö, Mora kommun, Dalarnas län, Sverige" place islet 0.25 Sverige FALSE
+regulus se Europe Northern Europe FALSE 1 2021-02-03 113402174 way "Regulus, Planetstaden, Stampelyckan, Söder, Lund, Lunds kommun, Skåne län, Sverige" place city_block 0.225 Sverige FALSE
+smhi se Europe Northern Europe FALSE 1 2021-02-03 55428577 node "Sveriges meteorologiska och hydrologiska institut, 1, Folkborgsvägen, Klockaretorpet, Norrköping, Norrköpings kommun, Östergötlands län, 60176, Sverige" office government 0.645620487724216 Sverige FALSE
+södertörn university library se Europe Northern Europe FALSE 1 2021-02-03 299483682 relation "Södertörns högskola, Hälsovägen, BRF. Grantorp, Visättra, Flemingsberg, Huddinge kommun, Stockholms län, 141 52, Sverige" amenity university 0.482401781952281 Sverige FALSE
+statoil se Europe Northern Europe FALSE 1 2021-02-03 258653712 relation "Statoil, Rönninge, Salems kommun, Stockholms län, Sverige" highway service 0.175 Sverige FALSE
+swedish academy se Europe Northern Europe FALSE 1 2021-02-03 64577899 node "Sjösportskolan, 22, Talattagatan, Långedrag, Västra Göteborg, Göteborg, Göteborgs Stad, Västra Götalands län, 42676, Sverige" amenity school 0.001 Sverige FALSE
+swedish museum of natural history in stockholm se Europe Northern Europe FALSE 1 2021-02-03 217046 node "Naturhistoriska riksmuseet, Frescativägen, Ekhagen, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 18, Sverige" tourism museum 0.531447409196647 Sverige FALSE
+swedish university of agricultural sciences se Europe Northern Europe FALSE 1 2021-02-03 193939119 way "Sveriges lantbruksuniversitet, Håkan Gullesons Väg, Lilljansberget, Universitets- och sjukhusområdet, Umeå, Umeå kommun, Västerbottens län, 90729, Sverige" amenity university 0.419996629384852 Sverige FALSE
+university of lund se Europe Northern Europe FALSE 1 2021-02-03 258273253 relation "Lunds Tekniska Högskola, Box 118, Professorsgatan, Olshög, Professorsstaden, Centrum, Lund, Lunds kommun, Skåne län, 22100, Sverige" amenity university 0.552959367524706 Sverige FALSE
+university of stockholm se Europe Northern Europe FALSE 1 2021-02-03 299483682 relation "Södertörns högskola, Hälsovägen, BRF. Grantorp, Visättra, Flemingsberg, Huddinge kommun, Stockholms län, 141 52, Sverige" amenity university 0.482401781952281 Sverige FALSE
+lmb sd Africa Northern Africa FALSE 1 2021-02-03 81909309 node "Al Lamab, جبرة جنوب, ولاية الخرطوم, السودان" place hamlet 0.25 السودان FALSE
+nimr sd Africa Northern Africa FALSE 1 2021-02-03 82567336 node "Nimr, Sheikan, ولاية شمال كردÙ<81>ان, السودان" place hamlet 0.35 السودان FALSE
+sese sd Africa Northern Africa FALSE 1 2021-02-03 82590645 node "Sese, دلقو, الولاية الشمالية, السودان" natural peak 0.4 السودان FALSE
+srs sd Africa Northern Africa FALSE 1 2021-02-03 82009778 node "Saras East, الولاية الشمالية, السودان" place hamlet 0.25 السودان FALSE
+rnl sb Oceania Melanesia FALSE 1 2021-02-03 10528826 node "Rennell, Tigoa, Rennell and Bellona, Solomon Islands" aeroway aerodrome 0.244698616841389 Solomon Islands FALSE
+salomon sb Oceania Melanesia FALSE 1 2021-02-03 258291922 relation Solomon Islands boundary administrative 0.648279405728165 Solomon Islands FALSE
+dmd sa Asia Western Asia FALSE 1 2021-02-03 12617190 node "ضمد, منطقة جازان, السعودية" place town 0.3 السعودية FALSE
+faculty of arts and sciences sa Asia Western Asia FALSE 1 2021-02-03 77665187 node "Faculty of Arts and Sciences, شارع الملك Ù<81>هد, الربوة, جدة, منطقة مكة المكرمة, 5305, السعودية" tourism museum 0.501 السعودية FALSE
+kaust sa Asia Western Asia FALSE 1 2021-02-03 259476065 relation "جامعة الملك عبد الله للعلوم و التقنية, King Abdullah Boulevard, منطقة مكة المكرمة, 23955, السعودية" amenity university 0.37358213360648 السعودية FALSE
+king saud university sa Asia Western Asia FALSE 1 2021-02-03 121097551 way "جامعة الملك سعود, 4545, الملك خالد, Al Khuzama District ØÙŠ الخزامى, الدرعية, منطقة الرياض, 145111, السعودية" amenity university 0.454167326792086 السعودية FALSE
+saudi geological survey sa Asia Western Asia FALSE 1 2021-02-03 51112840 node "Saudi Geological Survey, البدر القمني, As Sulaymaniyah District ØÙŠ السليمانية, الرياض, المالز, منطقة الرياض, 11525, السعودية" office government 0.301 السعودية FALSE
+saudia sa Asia Western Asia FALSE 1 2021-02-03 258074051 relation السعودية boundary administrative 0.735262517159872 السعودية FALSE
+scientific university of the south sa Asia Western Asia FALSE 1 2021-02-03 52416329 node "المعهد العلمي Ù<81>ÙŠ الاØساء, شارع الجامعة, الهÙ<81>ÙˆÙ<81>, المنطقة الشرقية, 36361-7365, السعودية" amenity school 0.001 السعودية FALSE
+nstc rw Africa Eastern Africa FALSE 1 2021-02-03 57789831 node "NSTC, KG 13 Avenue, Akarere ka Gasabo, Umujyi wa Kigali, PO BOX 2376 KIGALI-RWANDA, Rwanda" tourism hotel 0.101 Rwanda FALSE
+academy of social sciences ru Europe Eastern Europe FALSE 1 2021-02-03 63385307 node "ИнÑ<81>титут научной информации по общеÑ<81>твенным наукам Ð Ð<90>Ð<9d>, 3, улица ДмитриÑ<8f> УльÑ<8f>нова, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119333, РоÑ<81>Ñ<81>иÑ<8f>" amenity library 0.347505326784089 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+aesa ru Europe Eastern Europe FALSE 1 2021-02-03 99011756 way "Ð<90>ша, Ð<90>шинÑ<81>кое городÑ<81>кое поÑ<81>еление, Ð<90>шинÑ<81>кий район, ЧелÑ<8f>бинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place town 0.49201754214395 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+andra ru Europe Eastern Europe FALSE 1 2021-02-03 258614316 relation "городÑ<81>кое поÑ<81>еление Ð<90>ндра, ОктÑ<8f>брьÑ<81>кий район, Ханты-МанÑ<81>ийÑ<81>кий автономный округ — Югра, УральÑ<81>кий федеральный округ, 628125, РоÑ<81>Ñ<81>иÑ<8f>" boundary administrative 0.467153792339873 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+asa ru Europe Eastern Europe FALSE 1 2021-02-03 99011756 way "Ð<90>ша, Ð<90>шинÑ<81>кое городÑ<81>кое поÑ<81>еление, Ð<90>шинÑ<81>кий район, ЧелÑ<8f>бинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place town 0.49201754214395 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+beatles ru Europe Eastern Europe FALSE 1 2021-02-03 6433570 node "The Beatles, улица Горького, ÐвереÑ<81>Ñ‚, ЛенинÑ<81>кий район, Екатеринбург, городÑ<81>кой округ Екатеринбург, СвердловÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, 620219, РоÑ<81>Ñ<81>иÑ<8f>" historic memorial 0.325794094499978 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+budker institute of nuclear physics ru Europe Eastern Europe FALSE 1 2021-02-03 103148615 way "ИнÑ<81>титут Ñ<8f>дерной физики им. Г.И. Будкера, 11, проÑ<81>пект Ð<90>кадемика Лаврентьева, ВерхнÑ<8f>Ñ<8f> зона, СоветÑ<81>кий район, городÑ<81>кой округ Ð<9d>овоÑ<81>ибирÑ<81>к, Ð<9d>овоÑ<81>ибирÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 630090, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+cagi ru Europe Eastern Europe FALSE 1 2021-02-03 97889566 way "Центральный аÑ<8d>рогидродинамичеÑ<81>кий инÑ<81>титут, 1, улица ЖуковÑ<81>кого, Центр, ЖуковÑ<81>кий, городÑ<81>кой округ ЖуковÑ<81>кий, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 140181, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.399096455305557 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+chara ru Europe Eastern Europe FALSE 1 2021-02-03 25876864 node "Чара, КаларÑ<81>кий район, ЗабайкальÑ<81>кий край, ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" natural peak 0.3 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+csh ru Europe Eastern Europe FALSE 1 2021-02-03 107362163 way "Ð<90>Ñ<8d>ропорт Соловки, улица Ковалёва, Соловецкий, Соловецкое Ñ<81>ельÑ<81>кое поÑ<81>еление, ПриморÑ<81>кий район, Ð<90>рхангельÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Северо-Западный федеральный округ, 164070, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.41890455386909 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+dfo ru Europe Eastern Europe FALSE 1 2021-02-03 258365341 relation "ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" boundary administrative 0.551929848048128 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+educational exchange ru Europe Eastern Europe FALSE 1 2021-02-03 60365051 node "Совет по международным образовательным обменам, 24, набережнаÑ<8f> реки Мойки, Дворцовый округ, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" office ngo 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+french republic ru Europe Eastern Europe FALSE 1 2021-02-03 72441560 node "French Bakery, ФедоÑ<81>еевÑ<81>каÑ<8f> улица, ВахитовÑ<81>кий район, городÑ<81>кой округ Казань, ТатарÑ<81>тан, ПриволжÑ<81>кий федеральный округ, 420014, РоÑ<81>Ñ<81>иÑ<8f>" amenity cafe 0.101 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+fsb ru Europe Eastern Europe FALSE 1 2021-02-03 181819115 way "Управление ФСБ РоÑ<81>Ñ<81>ии по ЧелÑ<8f>бинÑ<81>кой облаÑ<81>ти, улица Коммуны, Центральный район, ЧелÑ<8f>бинÑ<81>к, ЧелÑ<8f>бинÑ<81>кий городÑ<81>кой округ, ЧелÑ<8f>бинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, 454091, РоÑ<81>Ñ<81>иÑ<8f>" amenity police 0.512538467361346 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+general motors ru Europe Eastern Europe FALSE 1 2021-02-03 125839046 way "General Motors, Шушары, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" landuse industrial 0.4 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+geo ru Europe Eastern Europe FALSE 1 2021-02-03 258503432 relation "МоÑ<81>ква, Центральный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place city 0.790819328283346 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+greenpeace russia ru Europe Eastern Europe FALSE 1 2021-02-03 57696006 node "ГринпиÑ<81> РоÑ<81>Ñ<81>ии, 26 к1, ЛенинградÑ<81>кий проÑ<81>пект, район Беговой, МоÑ<81>ква, Центральный федеральный округ, 125040, РоÑ<81>Ñ<81>иÑ<8f>" office ngo 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+gru ru Europe Eastern Europe FALSE 1 2021-02-03 258803084 relation "Главное разведывательное управление, ХодынÑ<81>кое поле, ХорошёвÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" landuse military 0.492353071516346 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+institute for scientific information ru Europe Eastern Europe FALSE 1 2021-02-03 63385307 node "ИнÑ<81>титут научной информации по общеÑ<81>твенным наукам Ð Ð<90>Ð<9d>, 3, улица ДмитриÑ<8f> УльÑ<8f>нова, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119333, РоÑ<81>Ñ<81>иÑ<8f>" amenity library 0.347505326784089 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+institute of biophysics ru Europe Eastern Europe FALSE 1 2021-02-03 115290807 way "ИнÑ<81>титут биофизики СО Ð Ð<90>Ð<9d>, 50/50, Ð<90>кадемгородок, ОктÑ<8f>брьÑ<81>кий район, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>к, городÑ<81>кой округ КраÑ<81>ноÑ<8f>Ñ€Ñ<81>к, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>кий край, СибирÑ<81>кий федеральный округ, 660036, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+institute of cytology and genetics ru Europe Eastern Europe FALSE 1 2021-02-03 103185653 way "ИнÑ<81>титут цитологии и генетики, проÑ<81>пект Ð<90>кадемика Коптюга, Ð<90>кадемгородок, СоветÑ<81>кий район, городÑ<81>кой округ Ð<9d>овоÑ<81>ибирÑ<81>к, Ð<9d>овоÑ<81>ибирÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 630090, РоÑ<81>Ñ<81>иÑ<8f>" amenity research_institute 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+institute of mineralogy ru Europe Eastern Europe FALSE 1 2021-02-03 72874514 node "ИнÑ<81>титут геологии, геофизики и минералогии им. Ð<90>.Ð<90>. Трофимука, 15, ДетÑ<81>кий проезд, ВерхнÑ<8f>Ñ<8f> зона, СоветÑ<81>кий район, городÑ<81>кой округ Ð<9d>овоÑ<81>ибирÑ<81>к, Ð<9d>овоÑ<81>ибирÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 630090, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+itar tass ru Europe Eastern Europe FALSE 1 2021-02-03 259420189 relation "ИТÐ<90>Ð -ТÐ<90>СС, 12 Ñ<81>1, ТверÑ<81>кой бульвар, 48, ПреÑ<81>ненÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119049, РоÑ<81>Ñ<81>иÑ<8f>" office news_agency 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+jinr ru Europe Eastern Europe FALSE 1 2021-02-03 97272121 way "Объединённый инÑ<81>титут Ñ<8f>дерных иÑ<81>Ñ<81>ледований, аллеÑ<8f> имени Ð<9d>. Сондома, ИнÑ<81>титутÑ<81>каÑ<8f> чаÑ<81>Ñ‚ÑŒ, Дубна, городÑ<81>кой округ Дубна, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 141980, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.352354134516624 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+kapitza institute for physical problems ru Europe Eastern Europe FALSE 1 2021-02-03 258586820 relation "ИнÑ<81>титут физичеÑ<81>ких проблем имени П. Л. Капицы Ð Ð<90>Ð<9d>, улица СергеÑ<8f> Капицы, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119334, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+kbo ru Europe Eastern Europe FALSE 1 2021-02-03 169242562 way "КБО, Козулька, городÑ<81>кое поÑ<81>еление Козулька, КозульÑ<81>кий район, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>кий край, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" landuse retail 0.2 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+kremlin ru Europe Eastern Europe FALSE 1 2021-02-03 258512367 relation "МоÑ<81>ковÑ<81>кий Кремль, БоровицкаÑ<8f> улица, 39, ТверÑ<81>кой район, МоÑ<81>ква, Центральный федеральный округ, 121019, РоÑ<81>Ñ<81>иÑ<8f>" tourism attraction 0.557769322264741 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+kurchatov institute ru Europe Eastern Europe FALSE 1 2021-02-03 258452658 relation "Ð<9d>ациональный иÑ<81>Ñ<81>ледовательÑ<81>кий центр «КурчатовÑ<81>кий инÑ<81>титут», район Щукино, МоÑ<81>ква, Центральный федеральный округ, 123098, РоÑ<81>Ñ<81>иÑ<8f>" landuse industrial 0.424370481866688 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lena ru Europe Eastern Europe FALSE 1 2021-02-03 258503631 relation "Лена, ЮбилейнинÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, КиренÑ<81>кий район, ИркутÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" natural water 0.461899716082039 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lmt ru Europe Eastern Europe FALSE 1 2021-02-03 258485345 relation "городÑ<81>кое поÑ<81>еление Ð<90>льметьевÑ<81>к, Ð<90>льметьевÑ<81>кий район, ТатарÑ<81>тан, ПриволжÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" boundary administrative 0.496007033040445 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lomonosov moscow state university ru Europe Eastern Europe FALSE 1 2021-02-03 155606811 way "1, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f>" place neighbourhood 0.589514102962792 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+lomonosov state university ru Europe Eastern Europe FALSE 1 2021-02-03 3649340 node "Михаил ВаÑ<81>ильевич ЛомоноÑ<81>ов, улица Колмогорова, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f>" historic memorial 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+mps ru Europe Eastern Europe FALSE 1 2021-02-03 1173456 node "МПС, Малаховка, городÑ<81>кой округ Люберцы, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 140033, РоÑ<81>Ñ<81>иÑ<8f>" place suburb 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+national museum of the palace ru Europe Eastern Europe FALSE 1 2021-02-03 59090230 node "Museum, 14, БольшаÑ<8f> МорÑ<81>каÑ<8f> улица, округ â„– 78, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" shop clothes 0.101 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+nbc ru Europe Eastern Europe FALSE 1 2021-02-03 258202613 relation "Ð<90>Ñ<8d>ропорт Бегишево, 16К-1563, БиклÑ<8f>нÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, ТукаевÑ<81>кий район, ТатарÑ<81>тан, ПриволжÑ<81>кий федеральный округ, 423878, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.443549060892257 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+osf ru Europe Eastern Europe FALSE 1 2021-02-03 258670824 relation "Ð<90>Ñ<8d>ропорт ОÑ<81>тафьево, СветлаÑ<8f> улица, поÑ<81>еление ВоÑ<81>креÑ<81>енÑ<81>кое, МоÑ<81>ква, Центральный федеральный округ, 117041, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.405666002039974 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+prl ru Europe Eastern Europe FALSE 1 2021-02-03 108260455 way "Ð<90>Ñ<8d>ропорт Елизово, Ð<90>-401, Елизово, ЕлизовÑ<81>кое городÑ<81>кое поÑ<81>еление, ЕлизовÑ<81>кий район, КамчатÑ<81>кий край, ДальневоÑ<81>точный федеральный округ, 684005, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.450772394172387 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+ria novosti ru Europe Eastern Europe FALSE 1 2021-02-03 174554396 way "ДетÑ<81>кий Ñ<81>ад â„– 1720 РИÐ<90> “Ð<9d>овоÑ<81>тиâ€<9d>, 50, КраÑ<81>ковÑ<81>кое шоÑ<81>Ñ<81>е, Малаховка, городÑ<81>кой округ Люберцы, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 140050, РоÑ<81>Ñ<81>иÑ<8f>" amenity kindergarten 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+roscosmos ru Europe Eastern Europe FALSE 1 2021-02-03 82532640 node "РоÑ<81>коÑ<81>моÑ<81>, 42 Ñ<81>2, улица Щепкина, Ð<9d>апрудное, МещанÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 129110, РоÑ<81>Ñ<81>иÑ<8f>" office government 0.001 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+russian navy ru Europe Eastern Europe FALSE 1 2021-02-03 259456418 relation "Главный штаб ВМФ РоÑ<81>Ñ<81>ии, Ð<90>дмиралтейÑ<81>кий округ, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f>" landuse military 0.2 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+school for oriental ru Europe Eastern Europe FALSE 1 2021-02-03 244630454 way "school, 08К-66, Ð<9d>овое УÑ<81>тье, Ñ<81>ельÑ<81>кое поÑ<81>еление Ð<9d>овое УÑ<81>тье, ОхотÑ<81>кий район, ХабаровÑ<81>кий край, ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" building yes 0.111 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+sgc ru Europe Eastern Europe FALSE 1 2021-02-03 258656849 relation "Ð<90>Ñ<8d>ропорт Сургут, Ð<90>Ñ<8d>ропорт, городÑ<81>кой округ Сургут, Ханты-МанÑ<81>ийÑ<81>кий автономный округ — Югра, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.445547633625325 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+sidor ru Europe Eastern Europe FALSE 1 2021-02-03 51700182 node "Сидор, ОмÑ<81>укчанÑ<81>кий городÑ<81>кой округ, МагаданÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" natural peak 0.3 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+sternberg astronomical institute at moscow state university ru Europe Eastern Europe FALSE 1 2021-02-03 258891687 relation "ГоÑ<81>ударÑ<81>твенный Ð<90>Ñ<81>трономичеÑ<81>кий ИнÑ<81>титут им. П.К. Штернберга МГУ, 13, УниверÑ<81>итетÑ<81>кий проÑ<81>пект, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119333, РоÑ<81>Ñ<81>иÑ<8f>" office research 0.353757209078785 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+tair ru Europe Eastern Europe FALSE 1 2021-02-03 258375362 relation "Таир, КокшайÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, ЗвениговÑ<81>кий район, Марий Ðл, ПриволжÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place village 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+tomsk state university ru Europe Eastern Europe FALSE 1 2021-02-03 108167321 way "ТомÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет. Центр культуры, 36, проÑ<81>пект Ленина, КировÑ<81>кий район, ТомÑ<81>к, городÑ<81>кой округ ТомÑ<81>к, ТомÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 634050, РоÑ<81>Ñ<81>иÑ<8f>" building university 0.36173885138595 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+ubs ru Europe Eastern Europe FALSE 1 2021-02-03 105310352 way "Ð<90>Ñ<8d>родром СмоленÑ<81>к-Северный, ПолоцкаÑ<8f> улица, Щёткино, СмоленÑ<81>к, ЗаднепровÑ<81>кий район, городÑ<81>кой округ СмоленÑ<81>к, СмоленÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 214006, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.351537799411788 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+uk home office ru Europe Eastern Europe FALSE 1 2021-02-03 259423169 relation "Ук, УковÑ<81>кое городÑ<81>кое поÑ<81>еление, Ð<9d>ижнеудинÑ<81>кий район, ИркутÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place village 0.275 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+university of moscow ru Europe Eastern Europe FALSE 1 2021-02-03 155606811 way "1, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f>" place neighbourhood 0.589514102962792 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+uts ru Europe Eastern Europe FALSE 1 2021-02-03 3463674 node "Ust-Tsylma Airport, улица Ð<90>виаторов, Чукчино, УÑ<81>Ñ‚ÑŒ-Цильма, Ñ<81>ельÑ<81>кое поÑ<81>еление Коровий Ручей, УÑ<81>Ñ‚ÑŒ-ЦилемÑ<81>кий район, РеÑ<81>публика Коми, Северо-Западный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" aeroway aerodrome 0.402513658204824 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+vimpelcom ru Europe Eastern Europe FALSE 1 2021-02-03 57284844 node "Vimpelcom, ТаманÑ<81>каÑ<8f> улица, СтароминÑ<81>каÑ<8f>, СтароминÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, СтароминÑ<81>кий район, КраÑ<81>нодарÑ<81>кий край, Южный федеральный округ, 353600, РоÑ<81>Ñ<81>иÑ<8f>" man_made mast 0.101 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+vostochny ru Europe Eastern Europe FALSE 1 2021-02-03 259275506 relation "ВоÑ<81>точный, СоÑ<81>ьвинÑ<81>кий городÑ<81>кой округ, СвердловÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f>" place village 0.465170637979749 РоÑ<81>Ñ<81>иÑ<8f> FALSE
+astronomical observatory of belgrade rs Europe Southern Europe FALSE 1 2021-02-03 135040458 way "Ð<90>Ñ<81>трономÑ<81>ка опÑ<81>ерваторија Београд, 7, Волгина, МЗ Звездара, Београд (Звездара), ГрадÑ<81>ка општина Звездара, Београд, Град Београд, Централна Србија, 11060, Србија" man_made observatory 0.30922699466609 Србија FALSE
+central veterinary institute rs Europe Southern Europe FALSE 1 2021-02-03 244179056 way "ВетеринарÑ<81>ки завод Земун, Београд (Земун), Београд, ГрадÑ<81>ка општина Земун, Град Београд, Централна Србија, Србија" landuse farmyard 0.2 Србија FALSE
+office for students rs Europe Southern Europe FALSE 1 2021-02-03 70834542 node "КомеÑ<81>аријат за избеглице и миграције, 4, Ð<9d>ародних хероја, СтудентÑ<81>ки град, Београд (Ð<9d>ови Београд), ГрадÑ<81>ка општина Ð<9d>ови Београд, Београд, Град Београд, Централна Србија, 11070, Србија" office government 0.001 Србија FALSE
+sinta rs Europe Southern Europe FALSE 1 2021-02-03 2337965 node "Сента, Општина Сента, СевернобанатÑ<81>ки управни округ, Војводина, 24400, Србија" place town 0.464681100859821 Србија FALSE
+university of belgrade rs Europe Southern Europe FALSE 1 2021-02-03 117305850 way "УниверзитетÑ<81>ка библиотека „Светозар Марковић“, 71, Булевар краља Ð<90>лекÑ<81>андра, Београд (Врачар), ГрадÑ<81>ка општина Врачар, Београд, Град Београд, Централна Србија, 11000, Србија" amenity library 0.4584091593896 Србија FALSE
+apa ro Europe Eastern Europe FALSE 1 2021-02-03 108306925 way "Apa, Satu Mare, 447015, România" place village 0.479859879460608 România FALSE
+babeș-bolyai university in cluj-napoca ro Europe Eastern Europe FALSE 1 2021-02-03 258406266 relation "Universitatea BabeÈ™-Bolyai, 1, Strada Mihail Kogălniceanu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400084, România" amenity university 0.893983489561696 România FALSE
+beer institute ro Europe Eastern Europe FALSE 1 2021-02-03 75163060 node "The Beer Institute, 111-113, Calea Floreasca, Floreasca, Sector 1, Municipiul București, 014463, România" amenity pub 0.201 România FALSE
+cerc ro Europe Eastern Europe FALSE 1 2021-02-03 3835281 node "Cerc, Cluj, 407586, România" place village 0.517932851769529 România FALSE
+diversitas ro Europe Eastern Europe FALSE 1 2021-02-03 45653317 node "Diversitas, Strada Timișul Sec, Est-Zizin, Brașov, 500246, România" highway bus_stop 0.101 România FALSE
+ifin-hh ro Europe Eastern Europe FALSE 1 2021-02-03 226902178 way "Institutul NaÈ›ional de Cercetare-Dezvoltare pentru Fizică È™i Inginerie Nucleară „Horia Hulubeiâ€<9d>, 30, Strada Reactorului, Extreme Light Infrastructure - Nuclear Physics (ELI-NP), Măgurele, Ilfov, 77125, România" amenity research_institute 0.001 România FALSE
+intervet ro Europe Eastern Europe FALSE 1 2021-02-03 82488353 node "Intervet, Strada Unirii, Delfinariu, Faleză Nord, Constanța, Zona Metropolitană Constanța, Constanța, 900545, România" shop pet 0.101 România FALSE
+ipp ro Europe Eastern Europe FALSE 1 2021-02-03 108543353 way "Ip, Sălaj, 457210, România" place village 0.393012981942171 România FALSE
+opticon ro Europe Eastern Europe FALSE 1 2021-02-03 58909939 node "Opticon, Strada Amurgului, Primăverii, Turda, Cluj, 401047, România" shop optician 0.101 România FALSE
+spri ro Europe Eastern Europe FALSE 1 2021-02-03 259351384 relation "Baia Sprie, Maramureș, România" boundary administrative 0.551669177709866 România FALSE
+technical university ro Europe Eastern Europe FALSE 1 2021-02-03 886677 node "Universitatea Tehnică, 15, Strada Constantin Daicoviciu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400020, România" amenity university 0.379076406206389 România FALSE
+technical university of ro Europe Eastern Europe FALSE 1 2021-02-03 886677 node "Universitatea Tehnică, 15, Strada Constantin Daicoviciu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400020, România" amenity university 0.379076406206389 România FALSE
+university of bucharest ro Europe Eastern Europe FALSE 1 2021-02-03 119914953 way "Universitatea din București, Piața Universității, Centrul Istoric, Sector 3, Municipiul București, 030018, România" amenity university 0.525450602170038 România FALSE
+university politehnica ro Europe Eastern Europe FALSE 1 2021-02-03 131359796 way "Facultatea de Electronică, Telecomunicații și Tehnologia Informației, 1-3, Bulevardul Iuliu Maniu, Militari, Sector 6, Municipiul București, 060117, România" amenity university 0.001 România FALSE
+voilà ro Europe Eastern Europe FALSE 1 2021-02-03 613559 node "Voila, BraÈ™ov, 507260, România" place village 0.40784642314719 România FALSE
+vulcan ro Europe Eastern Europe FALSE 1 2021-02-03 259305552 relation "Vulcan, Hunedoara, România" boundary administrative 0.557716038389343 România FALSE
+anatolian qa Asia Western Asia FALSE 1 2021-02-03 55991342 node "Anatolian, الطريق الدائري الثاني, الغانم القديم, الدوØØ©, 37109, قطر" amenity restaurant 0.101 قطر FALSE
+east anatolian qa Asia Western Asia FALSE 1 2021-02-03 55991342 node "Anatolian, الطريق الدائري الثاني, الغانم القديم, الدوØØ©, 37109, قطر" amenity restaurant 0.101 قطر FALSE
+ministry of public health qa Asia Western Asia FALSE 1 2021-02-03 126428404 way "Ministry of Public Health, شارع عنيزة, الرميلة, الدوØØ©, 875, قطر" amenity clinic 0.401 قطر FALSE
+world data center qa Asia Western Asia FALSE 1 2021-02-03 55939202 node "Data World, ام الدوم, Muaither North, الريان, 945, قطر" shop mobile_phone 0.201 قطر FALSE
+naoc py Americas South America FALSE 1 2021-02-03 56344922 node "Naoc, Loma Plata, Boquerón, Región Occidental, Paraguay" place village 0.375 Paraguay FALSE
+republic of palau pw Oceania Micronesia FALSE 1 2021-02-03 258530413 relation Belau boundary administrative 0.62710039879367 Belau FALSE
+adcs pt Europe Southern Europe FALSE 1 2021-02-03 16652252 node "ADCS Aldeia de S. Sebastião, CM 1080, Aldeia de São Sebastião, Castelo Bom, Almeida, Guarda, Beira Interior Norte, Centro, Portugal" leisure swimming_pool 0.101 Portugal FALSE
+agn pt Europe Southern Europe FALSE 1 2021-02-03 258957387 relation "Arganil, Coimbra, Pinhal Interior Norte, Centro, Portugal" boundary administrative 0.424872581583534 Portugal FALSE
+airc pt Europe Southern Europe FALSE 1 2021-02-03 196906120 way "AIRC, Lote 15, Avenida Joaquim Teixeira Santos, iParque - Parque Tecnológico de Coimbra, Antanhol, Assafarge e Antanhol, Coimbra, Baixo Mondego, Centro, 3040-540, Portugal" building commercial 0.101 Portugal FALSE
+amr pt Europe Southern Europe FALSE 1 2021-02-03 258828776 relation "Amares, Braga, Cávado, Norte, Portugal" boundary administrative 0.427682870549518 Portugal FALSE
+amr centre pt Europe Southern Europe FALSE 1 2021-02-03 258828776 relation "Amares, Braga, Cávado, Norte, Portugal" boundary administrative 0.427682870549518 Portugal FALSE
+avs pt Europe Southern Europe FALSE 1 2021-02-03 258957864 relation "Avis, Portalegre, Alto Alentejo, Alentejo, Portugal" boundary administrative 0.421268826198079 Portugal FALSE
+bnl pt Europe Southern Europe FALSE 1 2021-02-03 259237087 relation "Base Naval de Lisboa, Laranjeiro e Feijó, Almada, Setúbal, PenÃnsula de Setúbal, Ã<81>rea Metropolitana de Lisboa, 2810-001, Portugal" landuse military 0.357598476917669 Portugal FALSE
+cancer pt Europe Southern Europe FALSE 1 2021-02-03 44962803 node "Cancer, Granja, Mourão, Évora, Alentejo Central, Alentejo, Portugal" place farm 0.3 Portugal FALSE
+cbc pt Europe Southern Europe FALSE 1 2021-02-03 258695815 relation "Cabeceiras de Basto, Braga, Ave, Norte, Portugal" boundary administrative 0.426598401525427 Portugal FALSE
+chaves pt Europe Southern Europe FALSE 1 2021-02-03 258597847 relation "Chaves, Vila Real, Alto Tâmega, Norte, Portugal" boundary administrative 0.57494931380879 Portugal FALSE
+cml pt Europe Southern Europe FALSE 1 2021-02-03 259567502 relation "Câmara de Lobos, Madeira, Portugal" boundary administrative 0.42505981939652 Portugal FALSE
+cvd pt Europe Southern Europe FALSE 1 2021-02-03 258792832 relation "Castelo de Vide, Portalegre, Alto Alentejo, Alentejo, 7320-154, Portugal" boundary administrative 0.427443521124928 Portugal FALSE
+eu lisbon pt Europe Southern Europe FALSE 1 2021-02-03 60162212 node "FortÃssimos consórcios eu desejo, Rua Professor Santos Lucas, Benfica, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1500-613, Portugal" tourism artwork 0.101 Portugal FALSE
+european monitoring centre for drugs and drug addiction pt Europe Southern Europe FALSE 1 2021-02-03 258842269 relation "EMCDDA, 1, Praça Europa, Cais do Sodré, São Bento, Misericórdia, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1249-289, Portugal" office government 0.480889254526519 Portugal FALSE
+gödel pt Europe Southern Europe FALSE 1 2021-02-03 62622005 node "Godel, Turcifal, Torres Vedras, Lisboa, Oeste, Centro, 2565-814 TURCIFAL, Portugal" natural peak 0.3 Portugal FALSE
+iamb pt Europe Southern Europe FALSE 1 2021-02-03 259381515 relation "EMSA, 4, Praça Europa, Cais do Sodré, São Bento, Misericórdia, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1249-206, Portugal" office government 0.410586091930766 Portugal FALSE
+lisbon university institute pt Europe Southern Europe FALSE 1 2021-02-03 149301566 way "ISCTE - Instituto Universitário de Lisboa, Rua Branca Edmée Marques, Alvalade, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1649-026, Portugal" amenity university 0.303230229325644 Portugal FALSE
+mpower pt Europe Southern Europe FALSE 1 2021-02-03 50692696 node "MPower, EN 204, Monte de Fralães, Viatodos, Grimancelos, Minhotães e Monte de Fralães, Barcelos, Braga, Cávado, Norte, 4775-050, Portugal" shop car 0.101 Portugal FALSE
+mtl pt Europe Southern Europe FALSE 1 2021-02-03 258706967 relation "Mértola, Beja, Baixo Alentejo, Alentejo, Portugal" boundary administrative 0.446961485431396 Portugal FALSE
+new university of lisbon pt Europe Southern Europe FALSE 1 2021-02-03 194436086 way "Universidade de Lisboa - Cidade Universitária, Avenida das Forças Armadas, Sete Rios, Avenidas Novas, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1600-121, Portugal" amenity university 0.503005124858326 Portugal FALSE
+nova university of lisbon pt Europe Southern Europe FALSE 1 2021-02-03 126784870 way "Universidade Nova de Lisboa - Campus de Campolide, Rua de Campolide, Campolide, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1099-032 LISBOA, Portugal" amenity university 0.520803171748129 Portugal FALSE
+safina center pt Europe Southern Europe FALSE 1 2021-02-03 219483414 way "65, Safina, Cortegaça, Ovar, Aveiro, Baixo Vouga, Centro, 3886-908, Portugal" landuse industrial 0.3 Portugal FALSE
+tcs pt Europe Southern Europe FALSE 1 2021-02-03 258808501 relation "Trancoso, Guarda, Beira Interior Norte, Centro, Portugal" boundary administrative 0.437387966234636 Portugal FALSE
+university of aveiro pt Europe Southern Europe FALSE 1 2021-02-03 149748981 way "Universidade de Aveiro - Campus de Santiago, Rua do Sport Clube Beira-Mar, Glória, Glória e Vera Cruz, Aveiro, Baixo Vouga, Centro, 3810-193, Portugal" amenity university 0.101 Portugal FALSE
+university of porto pt Europe Southern Europe FALSE 1 2021-02-03 100343362 way "Faculdade de Engenharia da Universidade do Porto, s/n, Rua Doutor Roberto Frias, Lamas, Paranhos, Porto, Ã<81>rea Metropolitana do Porto, Norte, 4200-465, Portugal" amenity university 0.418669334531229 Portugal FALSE
+unl pt Europe Southern Europe FALSE 1 2021-02-03 126784870 way "Universidade Nova de Lisboa - Campus de Campolide, Rua de Campolide, Campolide, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1099-032 LISBOA, Portugal" amenity university 0.420803171748129 Portugal FALSE
+vbp pt Europe Southern Europe FALSE 1 2021-02-03 258706958 relation "Vila do Bispo, Faro, Algarve, Portugal" boundary administrative 0.425432597142074 Portugal FALSE
+ariel ps Asia Western Asia FALSE 1 2021-02-03 259276497 relation "×<90>רי×<90>ל, שטח C, الضÙ<81>Ø© الغربية, 4075419, Palestinian Territory" boundary administrative 0.452871408274879 Palestinian Territory FALSE
+basel university ps Asia Western Asia FALSE 1 2021-02-03 44957374 node "Basel Hadidoun, University Street, أبو ديس, منطقة ب, الضÙ<81>Ø© الغربية, Palestinian Territory" building house 0.201 Palestinian Territory FALSE
+beresheet ps Asia Western Asia FALSE 1 2021-02-03 235094607 way "× ×•×£ בר×<90>שית, כפר ×<90>דומי×<9d>, שטח C, יהודה ושומרון, Palestinian Territory" highway residential 0.1 Palestinian Territory FALSE
+clalit health services ps Asia Western Asia FALSE 1 2021-02-03 69773696 node "שירותי ברי×<90>ות כללית, ×”×‘× ×<90>×™, ×<90>רי×<90>ל, שטח C, יהודה ושומרון, 12345, Palestinian Territory" amenity clinic 0.001 Palestinian Territory FALSE
+health ministry ps Asia Western Asia FALSE 1 2021-02-03 3709061 node "Health Ministry, شارع جمال عبد الناصر / المØاÙ<81>ظة, نابلس, منطقة Ø£, יהודה ושומרון, 35214, Palestinian Territory" amenity public_building 0.201 Palestinian Territory FALSE
+ministry of antiquities ps Asia Western Asia FALSE 1 2021-02-03 134576075 way "Ministry of Tourism & Antiquities, شارع جمال عبد الناصر, Øارة الÙ<81>رØية, بيت Ù„ØÙ…, منطقة Ø£, الضÙ<81>Ø© الغربية, 9045634, Palestinian Territory" office government 0.301 Palestinian Territory FALSE
+national security ps Asia Western Asia FALSE 1 2021-02-03 3554333 node "National Security, As-Salam, Qalqilya, قلقيلية, منطقة أ, יהודה ושומרון, 342, Palestinian Territory" amenity police 0.201 Palestinian Territory FALSE
+united nations educational scientific and cultural organization ps Asia Western Asia FALSE 1 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 1.40816286930485 Palestinian Territory FALSE
+united nations' educational ps Asia Western Asia FALSE 1 2021-02-03 23404291 node "United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory" office UN 1.00816286930485 Palestinian Territory FALSE
+bc partners pl Europe Eastern Europe FALSE 1 2021-02-03 176794441 way "Partners, Czajki, Å<81>owicz, powiat Å‚owicki, województwo łódzkie, Polska" landuse commercial 0.3 Polska FALSE
+cipla pl Europe Eastern Europe FALSE 1 2021-02-03 258623051 relation "Ciepła, gmina Orońsko, powiat szydłowiecki, województwo mazowieckie, Polska" boundary administrative 0.286834742964615 Polska FALSE
+citi pl Europe Eastern Europe FALSE 1 2021-02-03 258863589 relation "Citibank, 16, Senatorska, Za Żelazną Bramą, Śródmieście Północne, Śródmieście, Warszawa, województwo mazowieckie, 00-082, Polska" amenity bank 0.386834742964615 Polska FALSE
+comex pl Europe Eastern Europe FALSE 1 2021-02-03 236397540 way "Comex, Osiedle Żerniki, Wrocław, województwo dolnośląskie, 54-516, Polska" landuse industrial 0.3 Polska FALSE
+euroimmun pl Europe Eastern Europe FALSE 1 2021-02-03 59855021 node "Euroimmun, 2a, Widna, Osiedle Huby, Wrocław, województwo dolnośląskie, 50-543, Polska" place house 0.101 Polska FALSE
+hcp pl Europe Eastern Europe FALSE 1 2021-02-03 169771922 way "HCP, Wilda, Poznań, województwo wielkopolskie, 61-485, Polska" highway platform 0.2 Polska FALSE
+icar pl Europe Eastern Europe FALSE 1 2021-02-03 80088131 node "ICAR, Droga G, Dzielnica Suchodół, Krosno, województwo podkarpackie, 38-400, Polska" office company 0.101 Polska FALSE
+nafta pl Europe Eastern Europe FALSE 1 2021-02-03 174307 node "Nafta, Wołomin, gmina Wołomin, powiat wołomiński, województwo mazowieckie, 05-200, Polska" place neighbourhood 0.35 Polska FALSE
+net power pl Europe Eastern Europe FALSE 1 2021-02-03 82888359 node "NET MARINE - Marine Power Service, 232D, Pułkownika Stanisława Dąbka, Stare Obłuże, Obłuże, Gdynia, województwo pomorskie, 81-167, Polska" office company 0.201 Polska FALSE
+nicolaus copernicus pl Europe Eastern Europe FALSE 1 2021-02-03 62194300 node "Mikolaj Kopernik, Rynek, Osiedle Słoneczne, Frombork, gmina Frombork, powiat braniewski, województwo warmińsko-mazurskie, 14-530, Polska" historic memorial 0.001 Polska FALSE
+radiometer pl Europe Eastern Europe FALSE 1 2021-02-03 137057564 way "Radiometer, 3, Podmiejska, Osiedle Mikołaja Kopernika, Przedmieście Szczecińskie, Stargard, powiat stargardzki, województwo zachodniopomorskie, 73-110, Polska" building yes 0.101 Polska FALSE
+socé fall pl Europe Eastern Europe FALSE 1 2021-02-03 258917009 relation "Soce, gmina Narew, powiat hajnowski, województwo podlaskie, Polska" boundary administrative 0.331005307834616 Polska FALSE
+stargardt pl Europe Eastern Europe FALSE 1 2021-02-03 14889255 node "Stargard Gubiński, gmina Gubin, powiat krośnieński, województwo lubuskie, 66-633, Polska" place village 0.258218474293395 Polska FALSE
+university of bialystok pl Europe Eastern Europe FALSE 1 2021-02-03 258648531 relation "Politechnika Białostocka - Wydział Mechaniczny, Prosta, Osiedle Tysiąclecia, Piaski, Białystok, województwo podlaskie, 15-351, Polska" building university 0.001 Polska FALSE
+warsaw university pl Europe Eastern Europe FALSE 1 2021-02-03 98622568 way "Uniwersytet Warszawski, Stawki, Osiedle Stawki, Muranów, Śródmieście, Warszawa, województwo mazowieckie, 00-183, Polska" amenity university 0.299521898980972 Polska FALSE
+abdullah gül university pk Asia Southern Asia FALSE 1 2021-02-03 97874378 way "Gul Mohar Road, Danish Abad, University Town, خیبر پښتونخوا, 2500, پاکستان" highway residential 0.2 پاکستان FALSE
+cecos university pk Asia Southern Asia FALSE 1 2021-02-03 157527902 way "Cecos University, اسٹریٹ 1, Hayatabad, خیبر پښتونخوا, پاکستان" amenity university 0.201 پاکستان FALSE
+council and commission pk Asia Southern Asia FALSE 1 2021-02-03 59604170 node "British Council Library, British Council, Shahrah-e-Iran, Five Star Complex, Ú©Ù„Ù<81>ٹن, کراچی, سنڌ, 75600, پاکستان" amenity library 0.101 پاکستان FALSE
+educational foundation pk Asia Southern Asia FALSE 1 2021-02-03 58387964 node "Family Educational Services Foundation, Johar Road, Block 13 Gulistan-e-Johar, Gulistan e Johar, Gulistan-e-Johar, کراچی, سنڌ, 75300, پاکستان" office educational_institution 0.201 پاکستان FALSE
+faisal islam pk Asia Southern Asia FALSE 1 2021-02-03 64354761 node "SADIQUE-E- AQBAR MOSQUE KNOW AS FAISAL MASJID, سڑک منڈی بÛ<81>اؤالدین, گوجرÛ<81>‬‎ قینچی, Khai, پنجاب, 50400, پاکستان" amenity place_of_worship 0.101 پاکستان FALSE
+forman christian college pk Asia Southern Asia FALSE 1 2021-02-03 43029428 node "Forman Christian College University, East Canal Bank Road, Zaildar Park, Muslim Town, Ichhra, پنجاب, 57760, پاکستان" amenity university 0.301 پاکستان FALSE
+government college university pk Asia Southern Asia FALSE 1 2021-02-03 167220711 way "Government College University, Chatterjee Road, Government Printing Press, Old Anarkali, لاÛ<81>ور, پنجاب, 531, پاکستان" amenity university 0.301 پاکستان FALSE
+mach pk Asia Southern Asia FALSE 1 2021-02-03 169738285 way "Mach, Railway Station RD, Mach, بلوچستان, پاکستان" railway station 0.535994792823483 پاکستان FALSE
+medical advancement pk Asia Southern Asia FALSE 1 2021-02-03 59158684 node "Pakistan Institute of Medical Advancement, Shahrah-e-Pakistan, FB Area Block 10, FB Area, Gulberg, کراچی, سنڌ, 75950, پاکستان" amenity hospital 0.201 پاکستان FALSE
+national institute of oceanography pk Asia Southern Asia FALSE 1 2021-02-03 234104875 way "National Institute of Oceanography, Sikandarabad, Keamari, کراچی, سنڌ, پاکستان" landuse commercial 0.6 پاکستان FALSE
+office of higher education commission pk Asia Southern Asia FALSE 1 2021-02-03 57649548 node "Higher Education Commission, Maqboolabad Road 11, Dawood Society, بÛ<81>ادر آباد, کراچی, سنڌ, 75460, پاکستان" office government 0.301 پاکستان FALSE
+optical society pk Asia Southern Asia FALSE 1 2021-02-03 58951925 node "Eastern Optical, Alamgir Road, Bahadurabad Commercial Area, Pakistan Employee Co-operative Housing Society, کراچی, سنڌ, 75460, پاکستان" shop optician 0.201 پاکستان FALSE
+pakistan institute of engineering and applied sciences pk Asia Southern Asia FALSE 1 2021-02-03 126357678 way "Pakistan Institute of Engineering and Applied Sciences (PIEAS), Market Road, ÙˆÙ<81>اقی دارالØکومت اسلام آباد, 44000, پاکستان" amenity university 0.701 پاکستان FALSE
+pakistan irrigation and power department pk Asia Southern Asia FALSE 1 2021-02-03 59500801 node "Irrigation & Power Department, سرکلر روڈ, Ù<81>یصل آباد, پنجاب, 041, پاکستان" office government 0.301 پاکستان FALSE
+people royal society pk Asia Southern Asia FALSE 1 2021-02-03 56507289 node "Sharmila Farooqi People Party Parliament, Shahzad Khalil Road, Dawood Society, بÛ<81>ادر آباد, کراچی, سنڌ, 75460, پاکستان" tourism motel 0.201 پاکستان FALSE
+quaid-i-azam university pk Asia Southern Asia FALSE 1 2021-02-03 173086495 way "Quaid e azam Commerce College, Electrical Lawn, Danish Abad, University Town, خیبر پښتونخوا, پاکستان" office educational_institution 0.401 پاکستان FALSE
+research satellite pk Asia Southern Asia FALSE 1 2021-02-03 57603280 node "Poultry Research Institute, Murree Road, Gulistan-e-Jinnah, Gulshan Dadan Khan, Asghar Mall Scheme, راولپنڈی سٹی, ضلع راولپنڈی, پنجاب, 46300, پاکستان" office research 0.101 پاکستان FALSE
+technology and society pk Asia Southern Asia FALSE 1 2021-02-03 224764336 way "Usman Institute of Technology, ST-13, Abul Hassan Isphani Road, Metroville 3, Memon Nagar, کراچی, سنڌ, 75300, پاکستان" amenity university 0.43855055665356 پاکستان FALSE
+university of engineering & technology pk Asia Southern Asia FALSE 1 2021-02-03 161352903 way "University of Engineering and Technology, Kot Khwaja Saeed Rd, Kot Khwaja Saeed, لاÛ<81>ور, پنجاب, 54010, پاکستان" amenity university 0.401 پاکستان FALSE
+university of engineering and technology pk Asia Southern Asia FALSE 1 2021-02-03 161352903 way "University of Engineering and Technology, Kot Khwaja Saeed Rd, Kot Khwaja Saeed, لاÛ<81>ور, پنجاب, 54010, پاکستان" amenity university 0.501 پاکستان FALSE
+university of guanajuato pk Asia Southern Asia FALSE 1 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان FALSE
+university of istanbul pk Asia Southern Asia FALSE 1 2021-02-03 152401459 way "University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان" amenity university 0.201 پاکستان FALSE
+university of karachi pk Asia Southern Asia FALSE 1 2021-02-03 228965756 way "University of Karachi, Abul Hassan Isphani Road, Metroville 3, Memon Nagar, کراچی, سنڌ, 75300, پاکستان" amenity university 0.301 پاکستان FALSE
+wns pk Asia Southern Asia FALSE 1 2021-02-03 2678292 node "Nawabshah Airport, ایئرپورٹ روڈ, Haqqani Town, نوابشاÛ<81>‎, سنڌ, پاکستان" aeroway aerodrome 0.325302870611459 پاکستان FALSE
+aav ph Asia South-Eastern Asia FALSE 1 2021-02-03 240979680 way "Allah Valley Airport, Surallah - T'boli Road, Veterans, South Cotabato, Soccsksargen, 9512, Luzon" aeroway aerodrome 0.328965278593994 Luzon FALSE
+academy of science ph Asia South-Eastern Asia FALSE 1 2021-02-03 224316912 way "National Academy of Science and Technology Philippines, Saliksik, Department of Science and Technology, Taguig, Fourth District, Metro Manila, 1631, Luzon" building yes 0.301 Luzon FALSE
+air and energy ph Asia South-Eastern Asia FALSE 1 2021-02-03 158638457 way "Concepcion Carrier Air-Conditioning Co., Energy, Light Industry and Science Park I, Cabuyao, Laguna, Calabarzon, 4025, Luzon" building industrial 0.301 Luzon FALSE
+alibaba ph Asia South-Eastern Asia FALSE 1 2021-02-03 300971258 node "Alibaba, Calbayog, Samar, Eastern Visayas, 6710, Luzon" place village 0.375 Luzon FALSE
+application of technology ph Asia South-Eastern Asia FALSE 1 2021-02-03 160457126 way "Technology Application and Promotion Institute, Upao, Pendatum Village, Central Bicutan, Taguig, Fourth District, Metro Manila, 1631, Luzon" building yes 0.201 Luzon FALSE
+asian development bank ph Asia South-Eastern Asia FALSE 1 2021-02-03 96144607 way "6, Asian Development Bank, Mandaluyong, Metro Manila, 1550, Luzon" landuse commercial 0.818276858334084 Luzon FALSE
+bloomberg l.p. ph Asia South-Eastern Asia FALSE 1 2021-02-03 113997147 way "Bloom Burg, Muntindilaw, Antipolo, Rizal, Calabarzon, 1870, Luzon" highway residential 0.3 Luzon FALSE
+bmc infectious diseases ph Asia South-Eastern Asia FALSE 1 2021-02-03 123804219 way "Infectious Diseases, BGH Driveway, Montinola Subdivision, Phil-Am, Benguet, Cordillera Administrative Region, 30101, Luzon" building hospital 0.201 Luzon FALSE
+cleantech ph Asia South-Eastern Asia FALSE 1 2021-02-03 256929799 way "Cleantech, Jose Abad Santos Avenue, Zone 4, Arayat, Pampanga, Central Luzon, 2012, Luzon" amenity fuel 0.101 Luzon FALSE
+court of appeals ph Asia South-Eastern Asia FALSE 1 2021-02-03 258754444 relation "Court of Appeals, Maria Orosa Street, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" office government 0.301 Luzon FALSE
+department of science technology ph Asia South-Eastern Asia FALSE 1 2021-02-03 99532466 way "Department of Science and Technology, Taguig, Fourth District, Metro Manila, Luzon" landuse commercial 0.762603275084388 Luzon FALSE
+doj ph Asia South-Eastern Asia FALSE 1 2021-02-03 53180869 node "DOJ, Lino Chatto Drive, Tagbilaran, Bohol, Central Visayas, 6300, Luzon" office government 0.101 Luzon FALSE
+el rosario university ph Asia South-Eastern Asia FALSE 1 2021-02-03 14118625 node "Sto Rosario Montessori, Road 3, San Miguel Heights, Valenzuela, Third District, Metro Manila, 1476, Luzon" amenity school 0.201 Luzon FALSE
+freedom of information ph Asia South-Eastern Asia FALSE 1 2021-02-03 66528974 node "Freedom of Information, 1575, Room 3, Jose P. Laurel Street, San Miguel, Sixth District, Manila, First District, Metro Manila, 1005, Luzon" office government 0.301 Luzon FALSE
+georgia college ph Asia South-Eastern Asia FALSE 1 2021-02-03 254844845 way "Georgia College, Psalms Street, Phase 6a, San Jose del Monte, Bulacan, Central Luzon, 3023, Luzon" amenity school 0.201 Luzon FALSE
+greenpeace east asia ph Asia South-Eastern Asia FALSE 1 2021-02-03 27258345 node "Greenpeace Southeast Asia, 30, Dr. Lazcano Street, Laging Handa, Sacred Heart, Scout Area, 4th District, Quezon City, Metro Manila, 1103, Luzon" office ngo 0.301 Luzon FALSE
+healing foundation ph Asia South-Eastern Asia FALSE 1 2021-02-03 12798005 node "Healing Hand Center Foundation, Don Julian Rodriguez Avenue, Purok 7, Datu Loho Village, Metroville Subdivision, Davao City, Davao Region, 8000, Luzon" amenity community_centre 0.201 Luzon FALSE
+heritage ph Asia South-Eastern Asia FALSE 1 2021-02-03 196554341 way "The Heritage, Cebu, Central Visayas, 6001, Luzon" place village 0.375 Luzon FALSE
+institute of biology ph Asia South-Eastern Asia FALSE 1 2021-02-03 259072446 relation "Institute of Biology, Ma. Regidor, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" building yes 0.301 Luzon FALSE
+institute of technology ph Asia South-Eastern Asia FALSE 1 2021-02-03 238492689 way "institute of technology, Marcos Highway, Cabading, Antipolo, Rizal, Calabarzon, 1870, Luzon" amenity college 0.301 Luzon FALSE
+international coalition ph Asia South-Eastern Asia FALSE 1 2021-02-03 164385165 way "Yamato International School, Coalition Street, Lambunao, Iloilo, Western Visayas, 6108, Luzon" amenity school 0.201 Luzon FALSE
+international science and technology center ph Asia South-Eastern Asia FALSE 1 2021-02-03 83192846 node "Eastwood International Institute of Science and Technology, Calle Rizal, Santo Niño, Guagua, Pampanga, Central Luzon, 2003, Luzon" amenity college 0.401 Luzon FALSE
+iqc ph Asia South-Eastern Asia FALSE 1 2021-02-03 301753277 node "IQC TRADING, Pennsylvania Avenue, San Agustin, San Fernando, La Union, Ilocos, 2500, Luzon" shop hardware 0.101 Luzon FALSE
+macarthur ph Asia South-Eastern Asia FALSE 1 2021-02-03 258711621 relation "MacArthur, Leyte 2nd District, Leyte, Eastern Visayas, 6509, Luzon" boundary administrative 0.464463378933884 Luzon FALSE
+manhattan project ph Asia South-Eastern Asia FALSE 1 2021-02-03 113359528 way "Manhattan Townhomes, Project 4, 3rd District, Quezon City, Metro Manila, Luzon" landuse residential 0.4 Luzon FALSE
+marina biotech ph Asia South-Eastern Asia FALSE 1 2021-02-03 55241914 node "Biotech, Narra Road, San Antonio, San Antonio Zone 3, San Pedro, Laguna, Calabarzon, 4023, Luzon" highway bus_stop 0.101 Luzon FALSE
+national journal ph Asia South-Eastern Asia FALSE 1 2021-02-03 57508627 node "Journal, Cuta, Poblacion, Batangas City, Batangas, Calabarzon, 4200, Luzon" place neighbourhood 0.35 Luzon FALSE
+national school of statistics ph Asia South-Eastern Asia FALSE 1 2021-02-03 199594389 way "School of Statistics, Pardo de Tavera Street, Village B, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" building yes 0.301 Luzon FALSE
+national science ph Asia South-Eastern Asia FALSE 1 2021-02-03 151393273 way "Science, Teachers' Village Balong Bato, Balintawak, 6th District, Quezon City, Metro Manila, 1476, Luzon" highway residential 0.2 Luzon FALSE
+national university of general san martín ph Asia South-Eastern Asia FALSE 1 2021-02-03 127228015 way "National University, 551, Mansanas, Sampaloc, 4th District, Manila, First District, Metro Manila, 1008, Luzon" amenity university 0.70242374951 Luzon FALSE
+nccp ph Asia South-Eastern Asia FALSE 1 2021-02-03 132164413 way "National Council of Churches of the Philippines, EDSA, West Triangle, 1st District, Quezon City, Metro Manila, 1104, Luzon" office religion 0.001 Luzon FALSE
+ninoy aquino parks and wildlife center ph Asia South-Eastern Asia FALSE 1 2021-02-03 100214475 way "Ninoy Aquino Parks & Wildlife Center, 1st District, Quezon City, Metro Manila, 1100, Luzon" leisure park 0.65 Luzon FALSE
+odysseus ph Asia South-Eastern Asia FALSE 1 2021-02-03 94252118 way "Odysseus, North Olympus 3, 5th District, Quezon City, Metro Manila, 1124, Luzon" highway residential 0.2 Luzon FALSE
+office of resource development ph Asia South-Eastern Asia FALSE 1 2021-02-03 187766554 way "Cagayan Valley Research, Resource and Development, Maharlika Highway, Apanay, Isabela, Cagayan Valley, 3309, Luzon" office research 0.201 Luzon FALSE
+office of the president ph Asia South-Eastern Asia FALSE 1 2021-02-03 657592 node "Office of the President, Jose P. Laurel Street, San Miguel, Sixth District, Manila, First District, Metro Manila, 1005, Luzon" office government 0.66851441835616 Luzon FALSE
+office of the united nations ph Asia South-Eastern Asia FALSE 1 2021-02-03 159967172 way "United Nations, Taft Avenue, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon" railway station 0.529847857867275 Luzon FALSE
+pallas ph Asia South-Eastern Asia FALSE 1 2021-02-03 52259714 node "Pallas, Nueva Vizcaya, Cagayan Valley, Luzon" place village 0.375 Luzon FALSE
+philippine institute of volcanology ph Asia South-Eastern Asia FALSE 1 2021-02-03 112883420 way "Philippine Institute of Volcanology and Seismology, Carlos P. Garcia Avenue, Village B, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" office government 0.74030088440925 Luzon FALSE
+phivolcs ph Asia South-Eastern Asia FALSE 1 2021-02-03 112883420 way "Philippine Institute of Volcanology and Seismology, Carlos P. Garcia Avenue, Village B, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" office government 0.34030088440925 Luzon FALSE
+research center ph Asia South-Eastern Asia FALSE 1 2021-02-03 226223945 way "Research Center, R. Jeciel, Kaytapos, Indang, Cavite, Calabarzon, 4122, Luzon" building university 0.201 Luzon FALSE
+san francisco department of health ph Asia South-Eastern Asia FALSE 1 2021-02-03 674851 node "Department Of Health, Rizal Avenue, Barangay 335, Santa Cruz, Third District, Manila, First District, Metro Manila, 1003, Luzon" amenity public_building 0.401 Luzon FALSE
+securities and exchange commission ph Asia South-Eastern Asia FALSE 1 2021-02-03 165198298 way "Securities and Exchange Commission, Gen Hughes Street, City Proper, Iloilo City, Iloilo, Western Visayas, 5000, Luzon" office government 0.401 Luzon FALSE
+stm association ph Asia South-Eastern Asia FALSE 1 2021-02-03 116275447 way "STM Avenue, Santiago Villas, San Pedro, Davao City, Davao Region, 8023, Luzon" highway residential 0.2 Luzon FALSE
+uk cabinet office ph Asia South-Eastern Asia FALSE 1 2021-02-03 76783411 node "PRU Life UK, Session Road, Court of Appeals Compound, Session Road Area, Benguet, Cordillera Administrative Region, 2600, Luzon" office insurance 0.101 Luzon FALSE
+un world food programme ph Asia South-Eastern Asia FALSE 1 2021-02-03 71056715 node "UN World Food Programme, Sheridan Street, Buayang Bato, Mandaluyong, Metro Manila, 1605, Luzon" office ngo 0.401 Luzon FALSE
+university of el rosario ph Asia South-Eastern Asia FALSE 1 2021-02-03 136114820 way "University of the Philippines Baguio, Governor Pack Road, Montinola Subdivision, Prieto Compound, Baguio, Benguet, Cordillera Administrative Region, 2600, Luzon" amenity university 0.531005307834616 Luzon FALSE
+university of la laguna ph Asia South-Eastern Asia FALSE 1 2021-02-03 203735425 way "University of the Philippines Los Baños, Valentin Sajor, Makiling Heights Housing, Batong Malake, Los Baños, Laguna, Calabarzon, 4031, Luzon" amenity university 0.77788219964298 Luzon FALSE
+university of the philippines diliman ph Asia South-Eastern Asia FALSE 1 2021-02-03 176421389 way "University of the Philippines Diliman, Maginoo, Pinyahan, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon" amenity university 0.933110254645355 Luzon FALSE
+us department of education ph Asia South-Eastern Asia FALSE 1 2021-02-03 97691861 way "Department of Education, Meralco Avenue, Oranbo, Pasig, Metro Manila, 1604, Luzon" office government 0.708010995739962 Luzon FALSE
+us treasury ph Asia South-Eastern Asia FALSE 1 2021-02-03 97459657 way "Treasury, SSS Employees Housing Project, North Fairview, 5th District, Quezon City, Metro Manila, 1118, Luzon" highway residential 0.3 Luzon FALSE
+namura pg Oceania Melanesia FALSE 1 2021-02-03 83853387 node "Namura, Eastern Highlands, Highlands Region, Papua Niugini" place village 0.375 Papua Niugini FALSE
+us mineral management service pg Oceania Melanesia FALSE 1 2021-02-03 34369968 node "Department of Mineral Policy and Geohazards Management & Dept. Of Mineral and Energy, Elanese Street, Konedobu, Port Moresby, National Capital District, Papua Region, 111, Papua Niugini" building office 0.201 Papua Niugini FALSE
+atto pe Americas South America FALSE 1 2021-02-03 45780652 node "Atto, Paras, Cangallo, Ayacucho, Perú" place hamlet 0.35 Perú FALSE
+bio farma pe Americas South America FALSE 1 2021-02-03 188369775 way "Bio Farma, Avenida Gaston Garcia Rada, Punta Hermosa, Lima, 15846, Perú" amenity pharmacy 0.201 Perú FALSE
+conida pe Americas South America FALSE 1 2021-02-03 81730105 node "Agencia Espacial del Perú - CONIDA, 1069, Luis Felipe Villaran, San Isidro, Lima, 15046, Perú" office government 0.101 Perú FALSE
+department of interior pe Americas South America FALSE 1 2021-02-03 182000790 way "Ministerio del Interior, Calle 21, Corpac, San Isidro, Lima, AN ISIDRO 15036, Perú" office government 0.33461374284578 Perú FALSE
+etac pe Americas South America FALSE 1 2021-02-03 193236562 way "Etac Perú, Villa El Salvador, Lima, Perú" landuse industrial 0.3 Perú FALSE
+farvet pe Americas South America FALSE 1 2021-02-03 202442899 way "Farvet, Antigua Carretera Panamericana Sur, Antarica, Cruz de La Molina, Chincha Alta, Chincha, Ica, Perú" shop yes 0.101 Perú FALSE
+ica pe Americas South America FALSE 1 2021-02-03 12549210 node "Ica, Perú" place province 0.65 Perú FALSE
+lal pe Americas South America FALSE 1 2021-02-03 258444597 relation "La Libertad, Perú" boundary administrative 0.489309406949894 Perú FALSE
+lam pe Americas South America FALSE 1 2021-02-03 258687618 relation "Lambayeque, Perú" boundary administrative 0.572574193515447 Perú FALSE
+madre de dios pe Americas South America FALSE 1 2021-02-03 258281731 relation "Madre de Dios, Perú" boundary administrative 0.762716953241034 Perú FALSE
+posco pe Americas South America FALSE 1 2021-02-03 44735208 node "Posco, Mariano Nicolás Valcárcel, Camaná, Arequipa, Perú" place village 0.375 Perú FALSE
+spbc pe Americas South America FALSE 1 2021-02-03 10555244 node "Caballococha Airport, Caballococha, Ramón Castilla, Mariscal Ramón Castilla, Loreto, Perú" aeroway aerodrome 0.110430435186894 Perú FALSE
+tnt pe Americas South America FALSE 1 2021-02-03 53869877 node "TNT, Calle Lizardo Alzamora Oeste, San Isidro, Lima, 15073, Perú" amenity post_office 0.495377817800873 Perú FALSE
+unap pe Americas South America FALSE 1 2021-02-03 105022664 way "Unap, Pueblo Libre, Lima, L32, Perú" highway residential 0.2 Perú FALSE
+unas pe Americas South America FALSE 1 2021-02-03 77540241 node "Uñas, Huancayo, JunÃn, 12002, Perú" place suburb 0.275 Perú FALSE
+cte pa Americas Central America FALSE 1 2021-02-03 65786091 node "Aeropuerto de CartÃ, VÃa Nusagandi, CartÃ, Narganá, Distrito Gaigirgordub, Comarca Guna Yala, Panamá" aeroway aerodrome 0.235968355602442 Panamá FALSE
+oma om Asia Western Asia FALSE 1 2021-02-03 258236468 relation عمان boundary administrative 0.680326025870515 عمان FALSE
+agresearch nz Oceania Australia and New Zealand FALSE 1 2021-02-03 134392218 way "Agresearch, Gerald Street, Lincoln, Selwyn District, Canterbury, 7608, New Zealand / Aotearoa" building yes 0.101 New Zealand / Aotearoa FALSE
+antarctic program nz Oceania Australia and New Zealand FALSE 1 2021-02-03 299195494 relation "United States Antarctic Program, Harewood, Christchurch, Christchurch City, Canterbury, New Zealand / Aotearoa" landuse military 0.4 New Zealand / Aotearoa FALSE
+daily telegraph nz Oceania Australia and New Zealand FALSE 1 2021-02-03 68991583 node "The Daily Telegraph building, 49, Tennyson Street, Bluff Hill, Napier City, Hawke's Bay, 4110, New Zealand / Aotearoa" tourism attraction 0.201 New Zealand / Aotearoa FALSE
+defence technology agency nz Oceania Australia and New Zealand FALSE 1 2021-02-03 298049383 way "Defence Technology Agency Naval Field Station, Aotea Great Barrier, Auckland, New Zealand / Aotearoa" landuse military 0.5 New Zealand / Aotearoa FALSE
+gns science in lower hutt nz Oceania Australia and New Zealand FALSE 1 2021-02-03 156362879 way "GNS Science, 1, Fairway Drive, Avalon, Lower Hutt City, Wellington, 5040, New Zealand / Aotearoa" office research 0.821073131097349 New Zealand / Aotearoa FALSE
+institute of environmental science and research nz Oceania Australia and New Zealand FALSE 1 2021-02-03 246653320 way "Institute of Environmental Science and Research, Ambulance Drive, Kenepuru, Porirua City, Wellington, 5022, New Zealand / Aotearoa" amenity research_institute 0.601 New Zealand / Aotearoa FALSE
+landcare research nz Oceania Australia and New Zealand FALSE 1 2021-02-03 144804093 way "Landcare Research - Manaaki Whenua, Riddet Road, Fitzherbert, Palmerston North City, Manawatū-Whanganui, 4118, New Zealand / Aotearoa" building yes 0.201 New Zealand / Aotearoa FALSE
+le maho nz Oceania Australia and New Zealand FALSE 1 2021-02-03 64971060 node "Mahoe, Tararua District, Manawatū-Whanganui, New Zealand / Aotearoa" natural peak 0.4 New Zealand / Aotearoa FALSE
+national institute of water and atmospheric research nz Oceania Australia and New Zealand FALSE 1 2021-02-03 157336573 way "National Institute of Water and Atmospheric Research, Evans Bay Parade, Hataitai, Wellington, Wellington City, Wellington, 6011, New Zealand / Aotearoa" amenity research_institute 0.701 New Zealand / Aotearoa FALSE
+otago museum nz Oceania Australia and New Zealand FALSE 1 2021-02-03 128177149 way "Otago Museum, Great King Street, North Dunedin, Dunedin, Dunedin City, Otago, 9016, New Zealand / Aotearoa" tourism museum 0.501865618613023 New Zealand / Aotearoa FALSE
+pacific islanders nz Oceania Australia and New Zealand FALSE 1 2021-02-03 209280117 way "Pacific Islanders' Presbyterian Church, Corner, Daniell Street, Newtown, Wellington, Wellington City, Wellington, 6021, New Zealand / Aotearoa" amenity place_of_worship 0.201 New Zealand / Aotearoa FALSE
+toi ohomai institute of technology nz Oceania Australia and New Zealand FALSE 1 2021-02-03 172831289 way "Toi Ohomai Institute of Technology, Ashworth Street, Tokoroa Central, Tokoroa, South Waikato District, Waikato, 3444, New Zealand / Aotearoa" amenity university 0.501 New Zealand / Aotearoa FALSE
+university of canterbury nz Oceania Australia and New Zealand FALSE 1 2021-02-03 120801912 way "University of Canterbury, Balgay Street, Halswell-Hornby-Riccarton Community, Christchurch, Christchurch City, Canterbury, 8041, New Zealand / Aotearoa" amenity university 0.77064161791144 New Zealand / Aotearoa FALSE
+university of waikato nz Oceania Australia and New Zealand FALSE 1 2021-02-03 98803266 way "University of Waikato, Greensboro Street, Hamilton East, Hamilton City, Waikato, 3216, New Zealand / Aotearoa" amenity university 0.719453010430519 New Zealand / Aotearoa FALSE
+ccrc np Asia Southern Asia FALSE 1 2021-02-03 143860199 way "CCRC, Kot Devi Marg, ठà¥<81>लोधारा, Jadibuti, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, WARD TBD, नेपाल" amenity college 0.101 नेपाल FALSE
+department of hydrology and meteorology np Asia Southern Asia FALSE 1 2021-02-03 67792541 node "Department of Hydrology and Meteorology, Bhagwati marg, Kamalpokhari, Narayan Chaur, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 1201, नेपाल" office government 0.501 नेपाल FALSE
+forum pharmaceuticals np Asia Southern Asia FALSE 1 2021-02-03 18726884 node "Pharmaceuticals, New Plaza Marg, Bansh Ghari, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, KATHMANDU - 32, नेपाल" amenity pharmacy 0.101 नेपाल FALSE
+gene drive research np Asia Southern Asia FALSE 1 2021-02-03 45860468 node "Gene Bank, F102, Tutepani, Satdobato, Patan, Lalitpur, वागà¥<8d>मती पà¥<8d>रदेश, 44702, नेपाल" office government 0.101 नेपाल FALSE
+national academy np Asia Southern Asia FALSE 1 2021-02-03 143931274 way "National Academy, Pancha Buddha Galli, Shankhamul Chok, Buddha Nagar, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 44617, नेपाल" amenity school 0.201 नेपाल FALSE
+national academy of science and technology np Asia Southern Asia FALSE 1 2021-02-03 187375163 way "National Academy Of Science And Technology(NAST), Main Road, Chauraha, Dhangadi, Dhangadi Sub Metropolitan, Dhanhadhi, सà¥<81>दà¥<81>र पशà¥<8d>चिमाञà¥<8d>चल विकास कà¥<8d>षेतà¥<8d>र, 091, नेपाल" amenity school 0.601 नेपाल FALSE
+national society for earthquake technology np Asia Southern Asia FALSE 1 2021-02-03 135924284 way "National Society for Earthquake Technology (NSET), F103, Bhaisepati, Sainbu, Lalitpur, ललितपà¥<81>र, वागà¥<8d>मती पà¥<8d>रदेश, 13775, नेपाल" building office 0.501 नेपाल FALSE
+ndrc np Asia Southern Asia FALSE 1 2021-02-03 140439984 way "NDRC Nepal, Radha Mohan Marga, सिरà¥<8d>जना टोल, Naya Baneshwar, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 34, नेपाल" building yes 0.101 नेपाल FALSE
+taliban np Asia Southern Asia FALSE 1 2021-02-03 14527782 node "Taliban, Bhadaure Tamagi, Annapurna, कासà¥<8d>की, गणà¥<8d>डकी पà¥<8d>रदेश, 009755, नेपाल" place village 0.375 नेपाल FALSE
+'black hole sun NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+2013 association for molecular pathology v. myriad genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+21st century cures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+60-strong association of american universities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+68th world health assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+8th global summit of national bioethics advisory bodies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+a. e. lalonde accelerator mass spectrometry laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+a. n. belozersky institute of physico-chemical biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aaas center for science diplomacy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aaas council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aaas science policy fellow NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aajc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aas committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aas data NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aas open research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aaup NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+abdus salam international centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aboriginal heritage project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+abpi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+abraxis bioscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academia sinica's genomics research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of experiments NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of military science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of military sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of motion picture arts and sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy of sciences leopoldina NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+academy's research institute for soils science and agricultural chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+accountability in research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aclu first amendment working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acorda therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"acquisition, technology and logistics agency" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acs chemical biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acs publications division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acta crystallographica section e NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acta genetica sinica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+acta zoologica sinica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ada lovelace institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+adam mickiewicz university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+adaptive biotechnologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+addex therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+administration for community living NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced immunization technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced international joint stock company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced maui optical and space surveillance technologies conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced research projects agency—energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advanced science institute in saitama NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advaxis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advisory committee on human radiation experiments and the national institutes of health's human embryo research panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advisory committee on pesticides NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advisory council on underwater archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+advocacy center for democratic culture NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aedes genome working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aerial photography field office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aeronautical research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aerosol robotic network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+affordable clean energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+affordable energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+affymetrix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+afghan taliban NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+africa carbon forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+africa labs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+africa regional certification commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african biotechnology stakeholders forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african center of excellence for genomics of infectious diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african centres for disease control and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african elephant coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african health research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african network for drugs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african network for drugs and diagnostics innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african physical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african population and health research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african science academy development initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african studies university of london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+african union commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency for evaluation of research and higher education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency for science technology and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"agency for science, technology and research" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agency of quality assurance in education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agricultural research cooperation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agu board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agu council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+agu ethics committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ahrq NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aids program of research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+air resources laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+air university's china aerospace studies institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+airborne snow observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+airfinity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+airlines for america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ajol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+akershus university college of applied sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+akin gump NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alain aspect NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alamogordo primate facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alaska public radio on 13 march NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alaska regional research vessel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alaska supreme court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+albert einstein college of medicine of yeshiva university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alberta energy regulator NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alberta environment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alberta newsprint company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alberta wilderness association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alder hey children's nhs foundation trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aleph farms NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alexander von humboldt biological resources research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred p. sloan foundation and foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alfred wegener institute helmholtz centre for polar and marine research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alistair reid venom research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alkahest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+all india institutes of medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+all india people's science network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+all-russian scientific research institute of experimental physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allen brain observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allen coral atlas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allen institute and cold spring harbor laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance for accelerating excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance for climate education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alliance of democratic forces NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allied democratic forces NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+allsky meteor surveillance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+altacorp capital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+alternative energies and atomic energy commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+altius institute for biomedical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+altona diagnostics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amarakaeri indigenous reserve NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazon conservation association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazon tree diversity network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amazonian tall tower observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american academy of forensic sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american academy of pediatrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association for public opinion research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association for the advancement of science and fens NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association for the advancement of science and the association of american universities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association for the study of liver diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association of physical anthropology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american association of variable star observers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american astronautical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american astronomical society and american geophysical union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american astronomical society's committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american astronomical society's division for planetary science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american beverage institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american bird conservancy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american cancer society cancer action network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american chemical council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american climber science program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of cardiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of medical genetics and genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of obstetrics and gynecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of rheumatology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american college of veterinary internal medicine forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american counterinsurgency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american economic review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american federation for aging research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american federation of government employees NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american fisheries society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american geophysical union fall meeting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american geosciences institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american immigration reform NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american institute of aeronautics and astronautics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american institutes for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of botany NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of clinical nutrition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of human genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of kidney diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american journal of primatology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american mathematical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american medical association's council on science and public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american meterological society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american physical society division of plasma physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american physiological society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american school of oriental research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american schools of oriental research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for clinical investigation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for human genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society for virology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of clinical oncologists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of gene and cell therapy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of microbiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of plant biologists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american society of tropical medicine & hygiene NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american sociological association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american sociological review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american spinal injury association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+american wind energy association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+americans for medical advancement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amflora NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amoy diagnostics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+amsterdam university of applied sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anatomy and genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ancora pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+andrés bello university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+andrew fire of stanford university school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anglo-american press association of paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal advocacy group humane society international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal behaviour NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal biotechnology innovation action plan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal defenders international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+animal physiological ecology department NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+antarctic climate and ecosystem cooperative research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+antarctic ocean alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+antarctic support contract NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anthropological society of paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anti-vivisection league NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+antioquia school of engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+anvur NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aosis publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+apco worldwide NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aplu NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+appec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+appropriate energy laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aptimmune biologics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aptl NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aquabounty technologies of maynard NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arab gulf states institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arab union of astronomy and space sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arabidopsis information resource NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aratana therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arch coal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+archaeology museum of cantabria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+archives of internal medicine and annals of internal medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arctic monitoring and assessment programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arctic oscillation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arden ahnell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arecibo observatory as the world NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argentine museum of natural sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argentinian institute of snow NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argentinian national university of la plata NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argentinian physical association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+argos therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arid regions environmental and engineering research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arizona board of regents NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"arizona state university's consortium for science, policy and outcomes" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+art world congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aruna biomedical NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+arxiv.org NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ashvin vishwanath NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asia pacific movement on debt & development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asian cancer research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asian cities climate change resilience network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aspen global change institute in basalt NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+aspen pharmacare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asset owners disclosure project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for american universities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for assessment and accreditation of laboratory animal care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for computing machinery NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for molecular pathology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for research in vision NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for the accreditation of human research protection programs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association for women in science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association international conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of clinical trials organizations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of imaging producers and equipment suppliers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of internet researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of universities and colleges of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of university councils NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of university export control officers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of women in science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+association of zoos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+asthma health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrogenetix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astronomical journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astronomical observatory of padua NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astronomy allies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astroparticle physics european consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrophysical multimessenger observatory network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrophysical observatory of turin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrophysics journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+astrosat NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+athena dinar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+athena swan charter NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+atlantic plaza towers tenants association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+atmospheric dynamic mission aeolus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+atomic energy of canada limited NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+attestation commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+attosecond science lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+attosecond science laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+auriane egal of the paris observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australasian neuroscience society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australasian virology society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australia institute think-tank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian academy of the humanities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian centre for space engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian criminal intelligence commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian department of agriculture and water resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian greens NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian greens party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian institute of marine sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian mountain research facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian nuclear science and technology organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian parliament NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian renewable energy agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+australian research centre for urban ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+austrian academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autism research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autobio diagnostics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autonomous university of campeche NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autonomous university of madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autonomous university of of yucatán NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+autonomous university of zacatecas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+avandia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+avogadro project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+axiom international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+axion dark matter experiment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+axios review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+azure hermes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+baby biome study NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ball aerospace and technologies corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+balseiro institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+baltimore ecosystem study NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bangabandhu sheikh mujib medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bangladesh rural advancement committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barcelona institute for global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barcelona institute of global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barcelona institute of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barcode of life NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+baring private equity asia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barnett shale NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+barrick gold corporation of toronto NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basel action network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basel declaration society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basic income earth network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basque centre for climate change in bilbao NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+basque nationalist party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bates linear accelerator center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+batthyány society of professors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+baylor university's institute of archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bbc news sound NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bcse NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beam therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bear specialist group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beckman research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+behavioral pharmacology research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing institute of biological products NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing institute of biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing institute of transfusion medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing national laboratory for condensed matter physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing national laboratory for molecular sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing normal university's school of systems science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing proteome research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beijing wuzi university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+belgian maritime company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bell burnell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+belmont report NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+belozersky institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+benefit people and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bentz whaley flessner NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berkeley geochronology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berkeley global science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berkeley open infrastructure for network computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berkeley's museum of vertebrate zoology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bernhard nocht institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bernhard nocht institute for tropical medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bernhard nocht institute for tropical medicine in hamburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+berry consultants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+beth strain of the university of melbourne NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bgi americas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bhartiya janata party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bhartiya kisan union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bibsam consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bilbao crystallographic server NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bilgi university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+binney street project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioacademy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biobricks foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biodesign institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biodiversity and ecosystem services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioeconomy capital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioethics international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biofab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioglobe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioindustry association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioinformatics and systems engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"bioinformatics institute of the agency for science, technology and research" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biologics consulting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomarkers consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomed research international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomedical and environmental research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biomedical basis of elite performance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bionano interactions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biooncology consultants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biophysical chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biophysical journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bioprocess capital ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biosafety council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biosimilar medicinal products NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biospecimen governance committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biospheric sciences laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotech news NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology center of the technical university of dresden NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+biotechnology journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bipartisan policy center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bittorrent NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bjarke ingels group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+black justice league NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blackpak of san francisco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blaise pascal university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blood systems research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg europe pharmaceutical index NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bloomberg nef NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blue plains advanced wastewater treatment plant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+blue ribbon commission on america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bluebird bio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bnef NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+board for investigation of misconduct in research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boeing aerospace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boldly go institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bologna astronomical observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bonanza creek long term ecological research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+borlaug global rust initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+borneo futures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+borneo nature foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+borneo orangutan survival foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bosch research and technology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston biopharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston chemical data corp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston company life biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+boston health care for the homeless program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bowie medal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian agricultural research corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian development bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian federal agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian institute of museums NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian renewable energy company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian science academy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian social democracy party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian society of genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian society of zoology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brazilian synchrotron light laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+breakthrough prize foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+breakthrough starshot NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+breast cancer laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british association for psychopharmacology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british atmospheric data centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british columbia centre for aquatic health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british columbia society for the prevention of cruelty to animals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british ecological society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british go association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british journal of psychiatry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british medical association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british navy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british science association media NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+british science association media fellow NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brooklyn criminal court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brotman baty institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brotman baty institute for precision medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+brown university school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bruno kessler foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bryan cave llp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+buck institute for age research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bureau of investigative journalism NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bureau of ocean energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bureau of ocean energy management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+burke medical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+burnham institute for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+business council for sustainable energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bvdv NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+caddo nation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cadi ayyad university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+caixin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california blueprint for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california climate science and solutions institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california cooperative oceanic fisheries investigations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california department of corrections and rehabilitation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california department of pesticide regulation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california digital library NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california geological survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california health care facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california initiative for advancing precision medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california institute for biomedical research (calibr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california institute for regenerative medicine in oakland NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california national primate research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+california strategic growth council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+calnex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+calorimetric electron telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+caltech msw NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+camagüey meteorological center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambodia vulture conservation project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge analytica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge antibody technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge healthtech institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge institute for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cambridge university hospitals nhs foundation trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+campaign against torture NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+campaign for access to essential medicines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+campaign for social science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada excellence research chairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada first research excellence fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada research chair NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada research chair in interfacial phenomena NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canada research chairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian association of postdoctoral scholars NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian astronomical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian carbon program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian centre for alternatives to animal methods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian centre for climate modelling and analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian council of research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian council on animal care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian environmental assessment agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian institute for advanced research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian institute for theoretical astrophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian institute for theoretical astrophysics in toronto NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canadian journal of zoology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+canberra deep space communication complex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cancer genome atlas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cancer research uk cambridge institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cancer voices australia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cape wind associates NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+care quality commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carelife medical NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+caribou biosciences of berkeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carlos iii health institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carlos iii institute of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie climate geoengineering governance initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie institution for science in stanford university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie institution for science's department of global ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie institution for science's department of global ecology in stanford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie institution in stanford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+carnegie mellon's robotics institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas research centre for eco-environmental sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas) institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cas) institute of zoology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+casa sollievo della sofferenza research hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catalan institute of palaeontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catalina sky survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic climate covenant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of brasilia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+catholic university of dom bosco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cavu biotherapies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cayman trough NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cb insights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cbc news NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cbrain NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdiac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdm watch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdmsii NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdsco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cdu/spd coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ceew NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+celator pharmaceuticals of ewing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cell biology of infectious pathogens NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cell signaling technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cell therapy group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+celldex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+celldex therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cellular dynamics international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+census of marine life NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for a new american security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for amazonian science and innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for amazonian scientific innovation at wake forest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for american progress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for astrophysics and space science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for axion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for biodefense NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for biomedical informatics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for biosecurity of upmc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for cancer genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for carbon removal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for chemical toxicology research and pharmacokinetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate and security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate change and energy solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for climate change impacts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for clinical precision medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for conservation biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for desert agriculture NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for development of advanced medicine for dementia in obu NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for devices and radiological health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for disease control's division of tuberculosis elimination NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for disease dynamics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"center for disease dynamics, economics & policy" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for drug development science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for economic and social research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for ethics in health care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for genetic engineering and biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for global health science and security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for global tobacco control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for health equity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for health security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for high impact philanthropy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for human reproduction NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for infection and immunity at columbia university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for infectious disease research and policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for intelligent systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international climate and energy policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international earth science information network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for international environmental law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for life science technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for macroecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for marine biodiversity and conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for marine research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for mass spectrometry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for medical education and clinical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for medical progress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for mexican american studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for negative emissions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for neuroregeneration research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for prevention of preterm birth NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for public integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for responsible research and innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for responsive politics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for science and environment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for science communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for science diplomacy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for science in the public interest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for shark research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for stem cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for systems science and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for technology innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for the management of medical technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for underground physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for vaccine development and global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for vulnerable populations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+center for worklife law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central caribbean marine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central committee of sudan doctors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central comprehensively deepening reforms commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central design bureau for machine building NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central drug research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central drugs standard control organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central european institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central european standard time NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central pacific fisheries commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+central zagros archaeological project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for agricultural research basile caramia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for agriculture and bioscience international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for antimicrobial resistance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for arctic gas hydrate NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for climate modelling and analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for climate risk and opportunity management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for climate services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for earth observation and digital earth NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for evidence-based medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for eye research australia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for genetics and society in berkeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for genomic regulation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for geographic medicine research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for integrated quantum science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for interdisciplinary computational and dynamical analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for longitudinal studies at university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for microbial ecology and genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for minerals research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for non-timber resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for observation and modelling of earthquakes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for proteomic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for quantum computation and communication technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for reproduction and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for research on adaptive nanostructures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for research on energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre for the aids program of research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre of excellence for climate system science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre of excellence for invasion biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+centre of study for the promotion of peace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ceshe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cgiar consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cgpm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+charité university hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+charity equality challenge unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chemical & engineering news NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chemical forensics international technical working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chemical sciences division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chemistry and metallurgy research replacement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chengdu medgencell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cherenkov array telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chesapeake bay program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chesapeake energy corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chicago bears nfl NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chicago community trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chico mendes institute for biodiversity conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+children's cancer institute australia for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+children's cause for cancer advocacy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+children's choir of île-de-france NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chilean navy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chilean society for cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chimerix of durham NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china american psychoanalytic alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china animal health and epidemiology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china biodiversity conservation and green development foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china building materials academy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china cdc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china clean energy research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china manned space agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china mobile laboratory testing team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china national accreditation service for conformity assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china national nuclear corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china national renewable energy centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china olympic committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+china tribunal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinabio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of science's institute of geology and geophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences institute of biophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences institute of neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences key laboratory of mental health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences key laboratory of pathogenic microbiology and immunology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences national astronomical observatories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences national astronomical observatory of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences wuhan institute of virology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences xishuangbanna tropical botanical garden NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' institute of policy management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' key laboratory of aerosol chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' national space science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' shanghai institute of plant physiology and ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' shanghai institutes for biological sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences' strategic priority program on space science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of sciences's institute of genetics and developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese academy of social science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese association for science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese association of traditional chinese medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese cdc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese groundwater science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese institute for brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese journal citation report NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese ministry of education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese national astronomical observatories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese national health commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese neuroscience society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese olympic committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese science publishing and media NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chinese state forestry administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chintan environmental research and action group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+christian abee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+christian democrat and social democrat NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chronic fatigue and immune dysfunction syndrome association of america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+chuv university hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cicero center for international climate research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ciencia en el parlamento NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cihr institute of health services and policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cihr's institute of gender health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cinergi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+circuit court of appeals for the district of columbia circuit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cities climate leadership group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+citizens' council for health freedom in st paul NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+citizens' nuclear information center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+civic alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+civil movement for support of bulgarian science and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+civil protection agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clack paper NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clalit research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clarke & esposito NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean air action group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean air safety advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean energy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clean water institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clemson university restoration institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clermont-ferrand physics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate absolute radiance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate and atmosphere department of the norwegian institute for air research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate and clean energy program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate change and atmospheric research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate change and coffee forest forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate change authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate justice programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate outreach NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate protection partnerships division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climate science centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+climateworks foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+clinical trials cooperative group program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr institute for neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr institute for protein biochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr's institute of genetic and biomedical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnr's institute of geosciences and earth resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs centre for cognitive neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs institute of nuclear physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs laboratory for archaeomaterials NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs theoretical physics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cnrs unit of neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition against childhood cancer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for epidemic preparedness innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for gm free india NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition for national science funding NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coalition of epidemic preparedness NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coastal protection and restoration authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coastal research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cochrane collaboration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cochrane database syst NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cognitive neuroscience society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cognitive science society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coin sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cold atom laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+collaboration for research excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+collaborative network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+college of medicine and veterinary medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+college of oceanic and atmospheric sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+collider detector NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombia agricultural institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombian academy of exact NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombian academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombian association of scientific journalism NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colombian supreme court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colorado scientific society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+colorado state university libraries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia cancer agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia center for children's environmental health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia centre for excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia dogfish hook and line industry association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university vagelos college of physicians NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's earth institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's international research institute for climate and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's kreitchman pet center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+columbia university's mailman school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commercial aircraft corporation of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commercial lunar payload services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commission for the conservation of antarctic marine living resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commission for the geological map of the world NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee for ethics in science and higher education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee for medicinal products for human use NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee for the universities of palestine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on carcinogenicity of chemicals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on energy and commerce NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on environment and public works NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on human rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+committee on human rights of the us national academies of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commonwealth fusion systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commonwealth scientific and industrial research organisation's health and biosecurity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commonwealth scientific and industrial research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+commonweath scientific and industrial research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+community association for psychosocial services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+comparative medicine and animal resources centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+complexity science hub NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+complexity science hub vienna NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+computational life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+concytec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+confederation of british industry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+conference of italian university rectors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+congo research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+congolese national biomedical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"congress, press" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+congress's house of representatives NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+congressional asian pacific american caucus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+conhecimento sem cortes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortia advancing standards in research administration information NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortium for higher education and research performance assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consortium of universities for global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+constellation observing system for meteorology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consultative committee for units NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consumer healthcare products association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+consumer watchdog in santa monica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+convergent science physical oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cooperative institute for meteorological satellite studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coordinated universal time NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+copernicus atmospheric monitoring service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+copernicus climate change service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coral reef airborne laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coral reef laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+corgenix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cornell university center for advanced computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cornell university college of veterinary medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+corrupt public health research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cortical networks NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+corvelva NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cosmochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+costa rica institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cotec foundation for innovation in madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+coulston foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for british archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for higher education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for mainland affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council for science and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"council for science, technology and innovation" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of canadian academies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of science editors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council of scientific societies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council on animal care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council on bioethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council on energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+council on government relations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+court of appeals for the district of columbia circuit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covax NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid-19 clinical research coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid-19 genomics uk consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid-19 prevention trials network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+covid-19 research coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cpc analytics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+crbn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cretaceous research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+crick worldwide influenza centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+criminal justice information services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+critical assessment of genome interpretation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+crop engineering consortium workshop NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cross river gorilla landscape project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cross-strait policy association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+crowell & moring NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cryogenic laser interferometer observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+csic institute of public goods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ctnbio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cubist pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cwts leiden ranking NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+cyberspace administration of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+d.e. shaw research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dalla lana school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dama/libra NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+danish ministry of energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+danish society for nature conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+darwin biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+darwin tree of life project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+data environnement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+data for health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+data science journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dc circuit court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dcsd NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+debasis sengupta NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+debye institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+decadal survey implementation advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+decision resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep fault drilling project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep space network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deep-sea research and earth systems science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepmind health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepsea challenger NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepstack NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deepwater horizon unified command NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deeu NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+defense meteorological satellite program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+defense threat reduction agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+delhi dialogue commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+delhi pollution control committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+democratic unionist party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dendreon corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+denka seiken NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"department for business, innovation & skills" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department for energy and climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"department for environment, food & rural affairs" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of bioethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of civil rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of commerce.over NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of economic development and commerce NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of energy and climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of energy's high energy physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of environment and resource management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of food safety NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of global ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of health studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of higher education and training NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of immunization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of marketing and consumer studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of neurodegenerative disease at university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of quantum matter at hiroshima university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+department of science and technology and department of biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deployable tower assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+desmog canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+deutsch williams brooks derensis & holland NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+devore & demarco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dewpoint therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dhs domestic nuclear detection office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+diaprep systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+digital curation centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+digital life summit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+digital reconstruction of axonal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dinama NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dinosaur institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+directorate general for nature conservation and national parks NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+disaster prevention research institute of kyoto university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+disciplinary board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+discrete analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+disease foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+disruptive technologies program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+distilled spirits council of the united states NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ditsong national museum of cultural history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+division of molecular and cellular biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+division of public health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dna doe project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe's office of nuclear physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe's pacific northwest national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+doe) office of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dokuz eylül university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+donald w. reynolds foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dornsife college of letters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dr. lucy jones center for science and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drc health research and training program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drexlin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drosophila board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drosophila genetic reference panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+drosophila species stock center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dryden research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dscovr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke canine cognition center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke center for applied genomics and precision medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke global health innovation center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke institute for brain sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+duke institute for genome sciences & policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dundee drug discovery unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+durrell institute of conservation and ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch association of innovative medicines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch general intelligence and security service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch institute for public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch ministry of education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch petroleum society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dutch research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+dylan morris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+e. s. grant mental health hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+e.on global commodities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth biogenome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth microbiome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth science women's network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth system physics section NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earth system science data NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earthcube NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earthrise alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+earthwatch institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ebola diagnostics for partners in health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ebola research and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ebrs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eclamc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecohealth alliance malaysia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecole nationale supérieure de chimie de montpellier NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecological research network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecological society of australia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecology and island conservation group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ecosystem services for poverty alleviation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+edcarn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+editas biotechnologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+edition diffusion press sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+education analytics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+education policy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+egidio feruglio palaeontological museum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eighth framework programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eighth framework programme of research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+einstein college of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eisai pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+el niño/southern oscillation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+elea phoenix laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+electric reliability coordinating council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+electron microscopy data bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+electronic medical records and genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+electronics takeback coalition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eli consortium's international scientific and technical advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eli eric NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eli-eric NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eliminate dengue program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+elon musk of spacex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+embl european bioinformatics institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emile cartailhac prehistoric art research and study center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emirates lunar mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emissions database for global atmospheric research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emory centre for ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+emory universitycompeting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+encyclopaedia britannica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+endocrine society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and climate change committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and commerce committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy and sustainable development analysis centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy biosciences institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy department's carbon dioxide information analysis center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy frontier research centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+energy policy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+engine biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+engineering fracture mechanics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+engines and energy conversion laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+entasis therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+entomological society of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environment agency austria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environment at imperial college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environment research agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental dynamics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental grantmakers association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental health committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental influences on child health outcomes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental molecular sciences laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental observation and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+environmental risk management authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eötvös loránd research network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epa science advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epa science advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epa's office of air NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epa's office of air and radiation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epidiolex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+epiphany biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+equality challenge unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+equity advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+equity task force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+erc science council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+erc scientific council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+erwin schrödinger institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa coordination office for the scientific programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa ecological monographs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's clean space NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's european space astronomy centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's rosetta NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's science programme committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's space situational awareness programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esa's xmm-newton NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+escro NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+esrc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+essential medicines campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eswi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eta car NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eta carinae NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eth bioenergia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ethics commission on automated NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eu erasmus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eu general affairs council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eunice kennedy shriver national institute of child health and human development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eurasia group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eurogroup for animals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european academies' science advisory council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european academy bozen/bolzano NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european association of archaeologists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european association of research and technology organisations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european biological rhythms society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european biomedical research association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european brain council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european centre for geoscience research and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european citizens NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european commission joint research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european competitiveness council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european congress on tropical medicine and international health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european consortium of taxonomic facilities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european cooperation in science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european defence fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european economic area NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european education area NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european federation of academies of sciences and humanities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european food information council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european green deal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european grid infrastructure federated cloud NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european human brain project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european infravec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european journal of human genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european mathematical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european mobile laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european molecular biology organization installation grant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european parliament and council of ministers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european parliament intergroup NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"european parliament's industry, research and energy" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european patent forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european people's party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european project for ice coring NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european public health alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european repository development organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european research and innovation at university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european scientific working group on influenza NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european sentinel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european society for medical oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european society of human genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european strategy for particle physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european strategy for particle physics update NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european strategy forum on research infrastructures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european telecommunications standards institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european timber regulation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european union clinical trials register NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european union's copernicus climate change service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european university institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+european very long baseline interferometry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+eutr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ev-k2-cnr association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+evaluation of graduate education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+event horizon telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+evidence for democracy in ottawa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+evidence-based medicine datalab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+excellence commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exelon corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exoanalytic solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exoplanet characterization observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exoplanet exploration program analysis group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+extremes sustainability research network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+exxon valdez oil spill trustee council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+f1000 research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+face2gene NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fahlgren NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fall meeting of the american geophysical union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fao conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+farallon institute for advanced ecosystem research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fausto llerena breeding center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fbi houston NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fbi houston division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fda's office of device evaluation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+february us department of energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal bureau of investigation's bioterrorism protection team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal emergency management agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal energy regulatory commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal environment agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal institute for risk assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal institute of physical and technical affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal interagency solutions group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal ministry of labour and social affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal pell grant program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federal polytechnic school of lausanne NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of archaeological managers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+federation of young scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+femto-st institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fermilab center for particle astrophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fermilab's physics advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fifth ministerial conference on environment and health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+financial oversight and management board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+finlay institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+finless foods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+first affiliated hospital of nanchang university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+first conference of ministers responsible for meteorology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+first institute of oceanography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fisheries and aquaculture policy and resources division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fisheries research and development corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fisheries trade programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+flanders institute of biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+flanders marine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+flatiron institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+flexible solutions international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+florida atlantic university's harbor branch oceanographic institute in fort pierce NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+florida institute for conservation science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+florida state university's coastal and marine laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+focac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foldrx NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fondazione telethon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+food and drug adminstration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foping nature reserve NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forest products association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forest products association of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forth biomedical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forum for biotechnology and food security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forum for responsible research metrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+forum of european neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for aids research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for biotechnology awareness and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for polish science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for strategic research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+foundation for the national institutes of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frank & delaney NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frankfurt kurnit klein & selz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fraunhofer institute for wind energy and energy system technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french academy of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"french agency for food, environmental and occupational health & safety" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french alternative energies and atomic energy commision NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french association of academics for the respect of international law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french atomic energy commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french committee for research and independent information on genetic engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french institute for development research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french institute for research in computer science and automation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french institute of health and medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french institute of oriental archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french labour force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french league for the protection of birds NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"french ministry of higher education, research and innovation" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national higher institute of aeronautics and space NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national institute for agricultural research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national radioactive waste management agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french national research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french office of research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french polar institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+french society of developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+friedrich schiller university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fritz haber institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers and of nature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers in psychology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers media NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontiers research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+frontline research excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fsc development services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fudan university's institute of science and technology for brain-inspired intelligence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+fundación ciencia & vida NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+funding authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+future meat technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+future of humanity institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gamaleya national research centre for epidemiology and microbiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gamaleya research institute of epidemiology and microbiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gcrf NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ge free new zealand NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ge free nz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ge healthcare of chalfont st giles NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ge hitachi nuclear energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geel electron linear accelerator NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geisinger health system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gene biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gene campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gene editing technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gene therapy catapult NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+general administration of press and publications NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+general automation lab technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+general public license NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+general secretariat for research and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+generic pharmaceutical association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genes & development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genes genomes genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic biocontrol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetic immunity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geneticist george church of harvard medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geneticist george church of harvard university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genetics and public policy center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genexpert ebola assay NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genome research limited NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genome sequencing center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genomic data commons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genomics and bioinformatics research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+genomics institute of the novartis research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gensight biologics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geohazards international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geological institute of hungary NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geometric intelligence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geooptics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+george church of harvard university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+george institute for international health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+george mason center for climate communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+george mason university's mercatus center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+georgetown university's climate center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+georgia public health association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+geos institute in ashland NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german animal welfare federation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german association of research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german cancer research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german centre for cardiovascular research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german federal criminal police office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german federal institute for geosciences and natural resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german federal institute for risk assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german federal office of radiation protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german press agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german research funding council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+german science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+germany max planck digital library NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+giraffe conservation foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gitwilgyoots first nations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+given google NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gladstone institute of cardiovascular disease NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+glaxosmithkline NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+glioblastoma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global academy of young scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global alliance for vaccines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global biodiversity outlook NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global campaign for microbicides NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global change & ecosystem services at conservation international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global change biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global change research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global conference on agricultural research for development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global coral reef monitoring network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global environmental model NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global forest resources assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global gas flaring reduction partnership NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global genome initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global green growth institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global health group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global health security agenda NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global human development program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global influenza surveillance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global lake temperature collaboration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global lunar conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global malaria eradication programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global malaria programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global oceanographic data archaeology and rescue project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global open data for agriculture and nutrition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global partnership for sustainable development data NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global policy research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global polio eradication initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global positioning system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global positioning systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global preparedness monitoring board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global relay of observatories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global research report africa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global sea mineral resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global security at los alamos national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global telecommunications system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global wildlife conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+global wind energy council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gloucester resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+glxp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+glyphosate task force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gmo laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+goddard spaceflight center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+golden state killer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gondwana research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+good food institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+goodwin procter NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google earth engine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google images NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google mail NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google news lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+google ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gordon life science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+government revitalization unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gpmb NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+graduate institute of international and development studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+graduate research fellowship program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+graduate school of science and technology policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grain for green program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gran sasso science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+granite capital international group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grantham foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grantham institute for climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gravitational-wave observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+great lakes bioenergy research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+great lakes fishery commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+great ormond street hospital institute of child health at university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greater atlantic regional fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greek foundation for research and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+green algal tree of life NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+green bank hydrogen telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+green ecologist party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greenhouse gas management institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greenpeace china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+greens party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grfp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+griffiths university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grinnell resurvey project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gritstone oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+grl board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+group sunspot number NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gruber foundation cosmology prize NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gryphon investors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gryphon scientific NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gsa today NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guam department of public health and social services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangdong academy of medical sciences and guangdong general hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangdong institute of applied biological resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guanghua school of management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangzhou general pharmaceutical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guangzhou institute of geochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guilin pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulbenkian science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf coast research lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf coast research laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf cooperation countries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf ecology division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf of lions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf of mexico studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gulf's flower garden banks national marine sanctuary NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gundersen medical foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+guttmacher institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gw pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+gwg energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hadassah-hebrew university medical center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hadley centre for climate prediction and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hadley centre for climate science and services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+haereticus environmental laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+haitian mines and energy bureau NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hambantota port to china merchants port holdings NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hamburg university of applied sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harrogate autumn flower show NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harte institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hartebeeshoek radio astronomy observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard injury control research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard medical school's infectious disease institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard medical school's joslin diabetes center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard pilgrim NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard pilgrim health care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard stem cell institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard stem cell institute for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university center for the environment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university herbaria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university on cambridge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard university's wyss institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard's edmond j. safra center for ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harvard's office for scholarly communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+harwell science and innovation campus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+has alfred renyi institute for mathematics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+has biological research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+has institute for literary studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+has institute of experimental medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hawaiʻi institute of marine biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hawaii institute of marine biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hawaii unity and liberation institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hawaiian supreme court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hbcu excellence in research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hbp board of directors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hdp assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health and environment alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health and human services alex azar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health and human services tom price NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health effects institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health protection agency of pavia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+health research council of new zealand NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+healthpartners institute for education and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+healthtell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+healthy lifespan institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hebei association of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hefei national laboratory for physical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heffter research institute in santa fe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heinrich heine university of d NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heinrich pette institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+helicos biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heliophysics division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heliospheric observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hellenic foundation for research and innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz association of german research centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz association of german research centres NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+helmholtz society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hematology research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hennepin healthcare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+henrietta lacks foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hepap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+herald shoal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hercules chemical company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heritage action for america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+heritage innovation preservation institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hertie institute for clinical brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+herzberg astronomy and astrophysics research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hess deep NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hfri NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hfsp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hhs office for human research protections NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+higgs hunting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+high court of eastern denmark NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+high energy physics advisory panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+high-altitude water cherenkov observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+high-consequence pathogens and pathology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education and science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher education research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+higher institute of industrial physics and chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+highwire press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hinxton group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hitachi advanced research laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hiv vaccine trials network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hmgc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hodge jones & allen solicitors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+holtzbrinck group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+honeywell quantum solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hong kong university's school of chinese medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hongmao liquor NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hongmao pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+honolulu civil beat newspaper NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+horia hulubei national institute for physics and nuclear engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+horizon quantum computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+host genetics initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house appropriations subcommittee on energy and water development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house armed services committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house committee on energy and commerce NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house energy and commerce committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of commons inquiry committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of commons science and technology select committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of representatives newt gingrich NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of representatives' energy & commerce committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house of representatives' judiciary committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+house science and technology committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"house science, space and technology committee" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+howard florey institute for brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+howard hughes medical institute's janelia farm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hubble space telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hubert curien multidisciplinary institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hubrecht organoid technology of utrecht NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hudson institute for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hudsonalpha institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hudsonalpha institute for biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human betterment foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human cell atlas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human connectome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human embryology and fertilisation authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human frontier science program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genetic diversity project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genetics advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genetics commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genome diversity project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human genomics program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human intestinal tract NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"human longevity, inc." NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human microbiome jumpstart reference strains consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human microbiome program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human mortality database NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human proteome organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human rights campaign foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human rights foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human subject research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+human wildlife solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+humanitas research hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hungarian academy of science's institute of materials and environmental chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hungarian academy of sciences's institute for nuclear research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hungarian brain research programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hunter college of the city university of new york NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+huntsman cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hust-suzhou institute for brainsmatics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hvri NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hyasynth bio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+hyung chun of yale university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iaea research reactor section NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iaph NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iatap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iau general assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibcm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iberoamerican network of science and technology indicators NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibm watson health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibs center for quantum nanoscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ibs center for rna research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icahn institute for genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icar central potato research station NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icelandic meteorological office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icemag NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ices journal of marine science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iceye NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iclr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+icrp NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ifo center for the economics of education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+igm biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ihu institute of image-guided surgery of strasbourg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iltoo pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imaging platform NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imazon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imbb NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"immunochemistry, pharmacology and emergency response institute" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+immunotherapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imperial college covid-19 response team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imperial college london's grantham institute for climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+impossible foods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+imr international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+independent advisory committee on applied climate assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian central civil services rules NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institute for science education and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institute of horticultural research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institute of rice research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian institutes of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian network for climate change assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian science congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian science congress association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian society for clinical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indian space research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indiana university lilly school of philanthropy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indiana university school of informatics and computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indiana university-purdue university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indiebio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesia endowment fund for education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian democratic party of struggle NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian institute of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian research institute for biotechnology and bioindustry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian science fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+indonesian young academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious disease genomics and global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious disease society of america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious disease surveillance center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious diseases data observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infectious diseases' vaccine research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+influenza virus research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+infn frascati national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+informetrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inge lehmann medal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iniciativa amotocodie NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+initiative for science and technology in parliament NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inivata NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+innocentive NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+innovation and industry fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+innovative genomics institute at berkeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+innsbruck medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inra's scientific advisory board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+insect research and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+instex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institut polytechnique de paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for applied ethology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for bioengineering of catalonia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for catastrophic loss reduction NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for cetacean research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for climate and global change research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for computational health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for critical infrastructure technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for defence studies and analyses NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for digital archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for economics and peace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for environmental protection and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for evidence-based healthcare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for global health & infectious diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for health and unification studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for health technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for higher education law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for human evolution NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for innovation law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for integrated cell-material sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for marine-earth exploration and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for microelectronics and microsystems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for molecular biology and biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for new economic thinking NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for nuclear physics in milan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for nuclear research of the russian academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for oneworld health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for quantum computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for quantum optics and quantum information NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for safe medication practices in horsham NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for science policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"institute for science, innovation and society" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for sea fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for space astrophysics and planetology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for space sciences-csic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for statistics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for sustainable energy policies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for the research and history of texts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for translational medicine and therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute for war documentation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute laue-langevin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of aboriginal peoples' health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of american prehistory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of archaeology and ethnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of artificial intelligence and robotics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of biology paris-seine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of catalysis and petroleochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of earth physics of paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of emerging infections NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of endemic diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of functional genomics of lyon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of genetics and molecular and cellular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of genomics & integrative biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of geological and nuclear science in lower hutt NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of health carlos iii NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of history of the academy of sciences of moldova NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of infection and immunity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of infectious disease and molecular medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of materials science of madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of medical research and studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of microelectronics and microsystems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of molecular and cellular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of molecular and clinical ophthalmology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of molecular biology & biophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of neuroinformatics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of nuclear and energy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of occupational and environmental medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of primate translational medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of psychiatry at king's college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of public and environmental affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of quantum computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of science technology and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of sustainability and technology policy at murdoch university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of technology bandung NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute of water resources and hydropower research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institute pierre-simon laplace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institutional animal care NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institutional review board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+institutional revolutionary party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+instrument context camera NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+insulin mitigation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integral molecular NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated carbon observation system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated disease surveillance programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated ocean drilling program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated quantum science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrated vessel tracking decision support tool NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrating data for analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrative and comparative biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+integrative biodiversity research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intellectual property scholars conference in stanford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intellia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intelligence advanced research projects agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inter-academy panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inter-american development bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+inter-university center for terrorism studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interacademy panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interacademy partnership NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interagency alternative technology assessment program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interagency coordinating committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interagency working group on harmful algal blooms NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interamerican network of academies of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intercultural center for the study of deserts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interferometry centre of excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intergovernmental group on earth observations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intergovernmental oceanographic commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+intermediate palomar transient factory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international alliance for cancer early detection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international arctic research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association for chronic fatigue syndrome/myalgic encephalomyelitis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association for cryptologic research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"international association for scientific, technical and medical publishers" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of animal behavior consultants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of egyptologists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"international association of scientific, technical and medical" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of volcanology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international association of wood anatomists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international behavioral neuroscience society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international brain observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cancer gene consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international center for agricultural research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international center for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international center for technology assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for primate brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international centre for trade and sustainable development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission for the certification of dracunculiasis eradication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on missing persons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on non-ionizing radiation protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on radiological protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international commission on zoological nomenclature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international conference on quantum communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international congress for conservation biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international congress of mathematics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international congress on drug therapy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international congress on peer review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international consortium of investigative journalists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international cotton advisory council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international council for harmonisation of technical requirements for pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international crime science conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international crisis group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international dark-sky association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international data rescue NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international development cooperation agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international federation of pharmaceutical manufacturers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international federation of pharmaceutical manufacturers and associations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international fertilizer development centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international finance facility for immunisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international gamma-ray astrophysics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international geological congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international gerontology research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international health management associates NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international human epigenome consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international initiative for impact evaluation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international institute of molecular and cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of cancer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of epidemiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international journal of surgery NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international lter network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international lunar network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international maize and wheat improvement centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international meeting for autism research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international meteor organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international mouse phenotyping consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international network for government science advice NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international ocean discovery program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international oceanographic commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international plant molecular biology congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international primate research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international research institute for climate and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international research on permanent authentic records in electronic systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international scientific committee for tuna NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for biological and environmental repositories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for cellular therapy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for scientometrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for the psychology of science & technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international society for transgenic technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international soil moisture network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international solar alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international space exploration coordination group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international standard archival description NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international stem cell corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international student and scholar services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international sunspot number NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international symposium on biomolecular archaeology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international system of units NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international trade in endangered species NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union for conservation of nature red list NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union for conservation of nature water programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union for conservation of nature's species survival commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union for conservation of nature's world conservation congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union of geodesy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international union of geological sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+international wheat genome sequencing consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+interplanetary observation network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+investigation panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+invizyne technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ioffe physico-technical institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ion pgm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ionis pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iop publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iop publishing of bristol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ipcc working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ireg observatory on academic rankings and excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+irena's innovation and technology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+irish centre for vascular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+isi foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+islam for dummies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+island conservation in santa cruz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+island digital ecosystem avatars NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+islas marías federal penal colony NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+israel defence forces NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+israel innovation authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+israel science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iss) research & development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+istanbul seismic risk mitigation and emergency preparedness project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+isterre institute of earth sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian association for huntington NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian association of cancer research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian association of scientific societies in agriculture NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian data protection authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian health authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+italian research council cnr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iter council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iter council working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iter organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+itmat NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+itzhak fried of the university of california NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iucn shark specialist group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+iucn species survival commission cetacean specialist group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ivy kupec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+izmir biomedicine & genome center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+izmir biomedicine and genome center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+j. craig venter institute's global ocean sampling expedition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jackson laboratory for genomic medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jaids NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jama network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+james madison program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+james martin 21st century school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jamestown rediscovery foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+janssen pharmaceutical companies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+janssen vaccines & prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+janssen vaccines and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan aerospace exploration agency institute of space NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan aerospace exploration agency's institute for space and aeronautical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan aerospace exploration agency's institute of space and astronautical science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan association of high energy physicists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan geosciences union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan international research center for agricultural sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japan renewable energy foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japanese cancer association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japanese high energy accelerator research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japanese national institute of infectious diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+japanese nuclear safety commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jaxa) institute of space NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jcap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jcbfm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jcvi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jean frézal centre of medical genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jefferson national laboratory in newport news NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jeffries international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jetzon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jezero crater NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jiangnan graphene research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jiangsu provincial center for disease control and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jilin agricultural university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jinggangshan university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jinggangshang university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jinko solar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johann wolfgang goethe university hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johannes gutenberg university of mainz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+john muir institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+john wesley powell center for analysis and synthesis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins berman institute of bioethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins center for health security NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins lyme disease clinical research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johns hopkins university kimmel cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+johnson & johnson pharmaceutical research & development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint bioenergy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint center for artificial photosynthesis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint center for research and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint institute for laboratory astrophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint institute for very long baseline interferometry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint institute for very long baseline interferometry european research infrastructure consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint investigation group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint medical command NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint prevention and control mechanism NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint research centres NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+joint space operations center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jonsson comprehensive cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jordan water project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jordanian scientific research fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal citation reports NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal impact factor NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of agricultural and food chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of agriculture and food chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of archaeological science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of genetics and genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of informetrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of medicinal chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of modern physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of morphology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of neurochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of ovarian research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of psychopharmacology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of urban ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of urology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of vertebrate palaeontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal of zhejiang university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+journal publishing practices NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jrc's institute for health and consumer protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+julius kühn institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+junjiu huang at sun yat-sen university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+jx nippon oil NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaelin groom NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaiser wilhelm institute for physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kaist graduate school of science and technology policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kalahari minerals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kandilli observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+karisma foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+karlsruhe tritium neutrino NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+karolinska staff disciplinary board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+katrina brandon of conservation international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"katz, marshall & banks" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli foundation of los angeles NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kavli institute for particle astrophysics and cosmology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kbrwyle NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+keck school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+keeling center for comparative medicine and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kemri-wellcome trust research programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kentucky geological survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kenya medical research institute–wellcome trust research programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kepler cheuvreux NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ketamine treatment centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+keygene NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kichwa community of doce de octubre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kids research institute of the children's hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kimmel center for archaeological science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kinetx aerospace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kingston general health research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kintama research corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kite pharma of santa monica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+klemens störtkuhl of ruhr university in bochum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+knome NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+knowledge ecology international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+koala ai technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kolka glacier NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kommersant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea centers for disease control and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea environment corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea food and drug administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korea ocean research & development institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korean advanced institute of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korean baduk association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korean federation for environmental movements NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+korean institute of ocean science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kosciuszko science accord NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kosovo education center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kreitchman center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kreitchman pet center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kristianstad university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ksar akil NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kuban state medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kuiper airborne observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kulakov national medical research center for obstetrics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kumamoto sanctuary NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kumasi centre for collaborative research in tropical medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kunming institute of botany NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kunming institute of botany of the chinese academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kurdistan workers' party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kustom group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kwazulu-natal research institute for tuberculosis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kwr water research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kyoto university's primate research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+kyung-sik choi of seoul national university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+l'oréal's research & innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+la molina national agrarian university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratorio elea phoenix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory for climate sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory for dynamic meteorology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory for molecular medicine at partners healthcare personalized medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laboratory of cellular and molecular neurobiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+labour and conservative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lakeview campus medical facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laser interferometer gravitational wave observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laser interferometer gravitational-wave observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laser interferometer gravitational-wave observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+laser interferometer space antenna NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+latin american and caribbean society of medical oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+latin american collaborative study of congenital malformations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+latin american council of social sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+latin american school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lawrence berkeley national laboratory's joint bioenergy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lawrence livermore national laboratory's forensic science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lawson & weitzen NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lcross NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ldeo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+league of conservation voters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leatherback trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lebedev physical institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leerink partners NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leerink swann & company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+left party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+legacy heritage fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lehman brothers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute for neuro-biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute for primate research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute for solid state NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute for the social sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute of agricultural development in transition economies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute of freshwater ecology and inland fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute of marine science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz institute on ageing-fritz lipmann institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leibniz-institute of freshwater ecology and inland fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leiden ranking NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leigh marine laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leloir institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leloir institute foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leonids NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leuphana university of lüneburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+leverhulme centre for the future of intelligence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+levin institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lgbq NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lhaaso NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+libel reform campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+liberal democrat party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+libertarian party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+liberty korea party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+libgen NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lieber institute for brain development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+life science steering group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+life sciences of branford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lifecare innovations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lilly asia ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lilly asian ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+linear collider board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+linear collider collaboration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lineberger comprehensive cancer center of the university of north carolina NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lingacom NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lion biotechnologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lisbon treaty NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+livingston ripley waterfowl conservancy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lockheed martin's space systems advanced technology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london institute of space policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london mathematical society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london school of economics' grantham research institute on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london universities purchasing consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+london's royal society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+long range research aircraft NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+long term ecological research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+long term educational reform and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+long-baseline neutrino facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+louis malardé institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+louisiana sea grant college program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+louisiana state university museum of natural science in baton rouge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+louisiana state university school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+low carbon economy trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+low carbon fuel standard NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lowy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+loxo oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ltern NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lucella biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ludwig maximilians university of munich NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ludwig maximillian university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ludwig-maximilians university of munich NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lulucf NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+luminosity lhc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+luna incognita NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunar exploration analysis group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunar flashlight NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunar palace NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunar science forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lunenfeld–tanenbaum research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lurie children's hospital and northwestern university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lusara foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+luxembourg agency for research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lyncean technologies of fremont NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+lynkeos technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ma'arra mosaic museum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+macrauchenia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+macrolide pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+madmax NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+magellan telescopes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+magenta therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+magiq technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maharashtra hybrid seed company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maharashtra hybrid seeds NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mahyco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mail & guardian NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maine medical center research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mainland affairs council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+major research instrumentation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+major risks committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+malaysian society of parasitology and tropical medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+manchester institute of innovation research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+manila trench NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mapk NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marcell experimental forest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+march for science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+march of dimes foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+margaret torn of california's lawrence berkeley national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marie curie university - paris NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marina cavazzana-calvo of university paris-descartes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine environmental research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine fisheries review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine mammal commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine mammal institute of oregon state university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marine sciences institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maritime studies program of williams college NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marjan centre for the study of conflict & conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mars exploration program assessment group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mars society australia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+marseille observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+martian surface NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maryland psychiatric research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maryland trump NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts biotechnology council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institute of technology and boston university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institute of technology's haystack observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institute of technology's plasma science and fusion center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institute of technology's sloan school of management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachusetts institution of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+massachussetts institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+matrix chambers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max born institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck digital library NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for brain research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for cell biology and genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for evolutionary biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for experimental medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for marine microbiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for neurobiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for radioastronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for social anthropology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for solid state research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute for the science of light NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of animal behaviour NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of experimental medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institute of molecular plant physiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck institutes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max planck society's fritz haber institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max plank institute for infection biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+max telford of university college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maxar technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+maxwell biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mayo clinic college of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"mayo collaborative services v. prometheus laboratories, inc." NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcdermott international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mcgill centre of genomics and policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mclaughlin-rotman center for global health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+md anderson's keeling center for comparative medicine and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mdi biological laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mds nordion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mectizan donation program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+med biotech laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medan institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical academic staff committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical products agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical publishers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council biostatistics unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council centre for regenerative medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council laboratory for molecular cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research council of zimbabwe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical research future fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical technology & practice patterns institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medical university of lublin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medicines control council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+medrec NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mega rice project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meiji institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mekentosj NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+melbourne energy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mellon foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+memphis meats NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+menafrivac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mendeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meningitis vaccine project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mental health center of west china hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+menzies school of health research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+merck institute for therapeutic research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mersana therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mesoamerican society for biology and conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+met office hadley centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+met office hadley centre for climate science and services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+met office's facility for airborne atmospheric measurements NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+met office's london volcanic ash advisory centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meta-research innovation center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+metabolic syndrome and related disorders NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meteor network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+meteorological applications for development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+metrics of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mexican national academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mexican society for stem cell research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+michael diamond at washington university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+michalski hüttermann & partner NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+michigan memorial phoenix energy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+michoacan university of san nicolás de hidalgo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+micius foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+microbiological diagnostic unit public health laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+microscale NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+middle east studies association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+migration advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+milbank quarterly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+milken institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+millennium institute of oceanography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+million veteran program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mimar sinan university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mimetas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mind research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+minecraft NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry for innovation and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of civil affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of environment and forestry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of health of the russian federation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of higher education, research and innovation" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of human resource development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of industry and information technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of land and resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of marine affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ministry of new and renewable energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of research, technology and higher education" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of science,technology" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"ministry of trade, industry and energy" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+minor planet center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+missouri breaks industries research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mit alliance for research and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mit energy conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mithril capital management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mitogenome therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mitsubishi h-iia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mitsubishi tanabe pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mixed research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mizuho securities usa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mmwr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moderna therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+molecular genetics and cardiac regeneration laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+molecular libraries program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+molr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+momenta pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monash energy materials and systems institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monash institute of medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monash obesity and diabetes institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monash university's biomedicine discovery institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monrepos archaeological research centre and museum for human behavioural evolution NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monterrey institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+monterrey institute of technology and higher education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+montreal neurological institute and hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+montreal protocol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+montreal protocol's technical and economic assessment panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moon express of cape canaveral NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moonshot task force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moorea biocode project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+moral machine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+morningside group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+morphotrak NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+morris kahn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mosa meat NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+motojima NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+motu economic and public policy research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+movement for the university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mozilla corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mozilla online NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mozilla science lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mpi-biocyb NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc centre for inflammation research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc functional genomics unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc harwell institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc harwell institute's mammalian genetics unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc national institute for medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc national institute of medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mrc network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mstn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mtb/rif NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mtc forensics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+multiscale biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+murchison radio-astronomy observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+musashi-murayama NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+museum for natural history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+museum of eastern carpathians NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+museum of natural history victor-brun NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+museum of paleontology egidio feruglio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mycetoma research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+mygn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nalco energy services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanjing institute of geology and paleontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanjing medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nankai trough NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanometrics inc. NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nanosolar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nansen initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa advisory council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa astrobiology research fellow NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa deep space network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa global hawk NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa goddard space center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa marshall space flight center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa solar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa swift NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasa-operated fermi gamma-ray space telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasawatch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasonia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasonia genome working group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasu institute of molecular biology and genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nasu's institute of mathematics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academies of science usa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academies press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academies' human embryonic stem cell research advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national advisory council on innovation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agency for new technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agricultural imagery program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agricultural research laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national agriculture and food research organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national aids research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national alliance for life and health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national amazonian university of madre de dios NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national archaeological museum in cagliari NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of ebola survivors NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of people NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of ramón y cajal researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of student financial aid administrators NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national association of student personnel administrators NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national autonomous university of nicaragua NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national banana research programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national bio-safety laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national bioethics advisory commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national biotechnology development strategy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national board of wildlife NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national cancer institute of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national cancer institute's neuro oncology branch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national cancer moonshot NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national carp control plan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for injury prevention and control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for lesbian rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for monitoring NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for professional and research ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center for research resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national center of scientific research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for atmospheric sciences in reading NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for biotechnology in madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for cell science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for diabetes research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for monitoring NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national centre for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national climate assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national climatological databank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national coalition against censorship NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national collaborative on gun violence research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national commission for aerospace research and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national coral reef institute at nova southeastern university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"national council for science, technology and technological innovation" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council of foundations supporting institutions of higher education and scientific and technological research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national council of universities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national deep submergence facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national department of mineral production NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national earthquake information center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national electronic injury surveillance system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national energy guarantee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national engineering research center for the emergence drugs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national geographic channel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national geoheritage authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national graduate research institute for policy studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national health and family planning commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national health and nutrition examination survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national high magnetic field laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national highway traffic safety administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national human rights commission of korea NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national incident command NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national independent scientific research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for agricultural research in jouy en josas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for agricultural research in nancy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for agricultural research in rennes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for allergy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for basic biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for biomedical research in kinshasa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for communicable diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for environmental health sciences in research triangle park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for geophysics and volcanology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for geophysics and vulcanology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for health and clinical excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for laser NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for nuclear NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for physics and nuclear engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for research on glaciers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for respiratory diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute for undersea science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of anthropology and history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of astrophysics in bologna NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of bioethanol science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of child health and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of child health and human development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of disability NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of ecology and climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of environmental research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of human rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of metrological research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of metrology research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of optics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of perinatology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of plant genome research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of science and technology policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of statistical sciences in research triangle park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of statistics and information NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute of traumatology and orthopedics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on aging NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institute on aging's laboratory of neurosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institutes of health guidelines for human stem cell research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national institution for transforming india NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national key laboratory of medical immunology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national knowledge network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national laboratory of genomics for biodiversity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national malaria control programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national marine mammal foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national marine mammal laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national medical products administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national microbiome initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national mission for clean ganga NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national mission on interdisciplinary cyber-physical systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national nagpra NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national nanotechnology initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national natural science foundation and china geological survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national new generation of artificial intelligence governance committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national non-human primate breeding and research facility board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national nurses united NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national observatory on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national oceanic and atmospheric administration's national marine fisheries service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national oceanic and atmospheric administration's space environment center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national oceanographic and atmospheric administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national oceanographic and atmospheric agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national organization of gay and lesbian scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national organization on fetal alcohol syndrome NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national parks agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national primate research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national public health institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national quantum technologies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national radio astronomy observatory green bank telescope NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national renewable energy action plan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research and development institute in forestry marin dracea NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research center for human evolution NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research centre for plant biotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research council of the swiss national science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research council's institute of cognitive sciences and technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research council's institute of molecular genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research ethics service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research funds NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research institute for science policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research institute of far seas fisheries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national research mentoring network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science and technology council committee on science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science and technology foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science foundation of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science foundation rapid response research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national science technology and innovation policy office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national seismological service of mexico NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national snow and ice data center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national society of black physicists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national space development program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national stem cell bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national toxicology program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national trade union of scientific researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national treasury employees union NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of cuyo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of distance learning NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national university of quilmes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+national veterinary school of alfort NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural history museum schloss bertholdsburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural history museum's department of palaeontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural machines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural resource analysis center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural resources institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural science foundation of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+natural sciences and engineering research council of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature and science translational medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature and scientific american NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature biomedical engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature cell biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature commun NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature geosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature immunology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature mater NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature structural & molecular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nature's scientific reports NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+naurex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nautilus minerals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nautilus minerals of toronto NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+navajo nation council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+navdeep bains NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+navigation technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncats NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncipc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncle NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncrr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ncvc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+near space corporation of tillamook NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+near-earth object camera NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nebular gas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neil gehrels swift observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nejm group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nektar therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nelson mandela african institute for science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nemours/alfred i. dupont hospital for children NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neo sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neowise NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nepal climate observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nepal climate observatory at pyramid station NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nepal climate observatory-pyramid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands institute for radio astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands institute for space research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands interdisciplinary demographic institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands national institute for public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+netherlands organization of scientific research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+network of spanish researchers abroad NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+network-forum for biodiversity research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neural correlate society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neural enhancement laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neural-processing research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neurodegenerative diseases NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neurologix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neuronano research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neurotech network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+neurotechnology center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new dynamics of ageing programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new energy and industrial technology development organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new england anti-vivisection society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new enterprise associates NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new frontiers program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new haven as mirror worlds technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new iberia research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new jersey legislature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new phytologist NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new south wales department of primary industries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new south wales land and environment court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york city department of health and mental hygiene NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york medical college NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university institute for the study of the ancient world NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university stern school of business NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university's courant institute of mathematical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new york university's winthrop hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+new zealand institute for plant & food research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+newcastle fertility centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+newlink genetics of ames NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+news feature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+news of philae NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ngee tropics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ngo iran human rights NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nhlbi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nhmrc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nia-sponsored interventions testing program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+niaid-supported nicaraguan pediatric influenza cohort study NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nicaraguan academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nichd NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nicholas institute for environmental policy solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nicolaus copernicus astronomical center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nigeria cdc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nigerian academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nigms NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih fogarty international center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih human embryo research panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih human microbiome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih national institute of general medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih office of portfolio analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih office of strategic coordination NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's office for portfolio analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's office of management assessment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's office of science policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's office of strategic coordination NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's scientific management review board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nih's tribal health research office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nik-zainal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+niprd NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nips twitter NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nitinol NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+niust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nixon peabody NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nmnh NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+noaa arctic research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel commitee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel committee for chemistry 2018 NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nobel committee for physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nordic institute for theoretical physics in stockholm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norris comprehensive cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+north atlantic treaty organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+north hessian society of prehistory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+north-east pacific time-series NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+northeast structural genomics consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+northern and southern hemisphere NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+northern hemisphere NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+northshore research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian institute for nature research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian institute for water research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+norwegian veterinary institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novartis institutes for developing world medical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novartis's institutes for biomedical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novavax NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novo nordisk foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+novocell of san diego NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+noxxon pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nrda NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsduh NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsf budget division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsf division of biological infrastructure NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsf office of diversity and inclusion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsf's office of inspector general NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nsidc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear energy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear energy steering committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear posture review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear regulatory commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear research and consultancy group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear science and technology organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuclear sciences institute of the national autonomous university of mexico NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+numonyx of rolle NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nustart energy development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nuziveedu seeds NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+nyu) cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obama executive order NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obi pharma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obokata NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+observer research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obstetrics and gynecology hospital of fudan university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+obvious ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocata therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean biogeographic information system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean conservancy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean exploration trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean giants program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean observing and modeling group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean preservation society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean research & conservation association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean salinity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean salinity mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ocean therapy solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos environ-mental solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos environmental solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos environmental solutions of vancouver NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceaneos marine research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceanic preservation society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oceanographic institute of the university of são paulo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oecd science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office for cancer genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office for human research protections NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office for research integrity at northwestern university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of children's health protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of energy efficiency and renewable energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of extramural research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of foreign assets control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of hawaiian affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of health economics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of human research protection NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of inspector general for the department of health and human services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of international science and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of laboratory animal welfare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of mauna kea management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of national marine sanctuaries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of ocean exploration and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of population genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of research integrity at the national institutes of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of science for orela NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of science policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of the gene technology regulator NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of the legislative auditor NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+office of the principal scientific adviser NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ogtr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ohio sleep medicine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ohsu knight cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oie reference laboratory for rabies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oil change international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oil spill recovery institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+okazaki institute for integrative biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+okeanos explorer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+okinawa institute for science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+okjökull NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oklahoma geological survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+olympic winter games bid committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+omega supplies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+omics group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+omics international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+omrf NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oncolytics biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ondřejov observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+onex corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ontario cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+open access scholarly publishers association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+open-access publishing equity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+operation warp speed NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+operational environmental satellites NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ophirex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+optical infrared coordination network for astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+optical institute graduate school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+optical society of america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orangutan foundation international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orangutan tropical peatland project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oraquick NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orbit beyond of edison NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orbital sciences atk NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oregon health & science university knight cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oregon health and sciences university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+orexigen therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organ preservation alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organ solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organ-on-a-chip world congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organigram NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organisation of islamic cooperation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organization for economic co-operation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organization for economic cooperation and development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+organovo of san diego NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+origen power NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osaka university graduate school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oscillation project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osdd NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osf preprints NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osi pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oskar klein centre for cosmoparticle physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oslo university hospital institute for cancer research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+osnap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+otago palaeogenetics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+our children's trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+outbreak science rapid prereview NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+outer planets assessment group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+outsell NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford institute of population ageing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford nanopore of oxford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford uehiro centre for practical ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford university herbaria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford university press and nature publishing group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford vaccine group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+oxford's mathematical institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific bluefin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific centre for environmental law and litigation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific fishery management council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific institute for climate solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific research group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pacific salmon commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+padua astronomical observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pak-austria institute of applied sciences and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palaeoanthropologist bernard wood of george washington university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palaeobiologist simon conway morris of cambridge university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palaeogeography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palaeontological association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palatino linotype NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paleoresearch institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+palomar transient factory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pamphilos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pan american games NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+panchromatic hubble andromeda treasury NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paracelsus medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paradoxopoda NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parco genos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paris institute of geophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paris-saclay institute of neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliament for oxford west NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliament's committee on science and education NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliament's house of commons science and technology select committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliamentary and scientific committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+parliamentary assembly of the council of europe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+particles for justice NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+partners healthcare personalized medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+partnership for biomedical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+partnership group for science and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pasteur institute of iran NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+patagonian institute of social sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+patent public advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pathmark genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pathway genomics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pathway genomics of san diego NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+patient-centered outcomes research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+patricia gruber foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paul drude institute for solid state electronics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+paulson institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pavement coatings technology council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pawsey supercomputing centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pbmr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pebble bed modular reactor NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pedro kourí tropical medicine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peerj NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peking university health science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peking university health science center school of basic medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peking university institute of mental health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peking university's school of life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+penn vet working dog centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pennington biomedical research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pennsylvania NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+people yale NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+people's court of nanshan district of shenzhen NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+people's solidarity for participatory democracy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+percy fitzpatrick institute of african ornithology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+perlan project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+permanent court of arbitration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+perseverance airlines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+persian wildlife heritage foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peruvian academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peruvian amazon research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+peruvian ministry of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+petrie-flom center for health law policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew center for global climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew charitable trusts' global penguin conservation campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew environment group's arctic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pew environment group's international boreal conservation campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pfizer/biontech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pharmaceutical association committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pharmaventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pharming nv NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+phd doctors' association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+phg foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philippine negritos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philippine space agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philipps university of marburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philosophical magazine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philosophical transactions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+philosophical transactions of the royal society b NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+phoenix cardinals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+physical review physics education research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+phytoceutica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pierre simon laplace institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pink bollworm rearing facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+piramal healthcare solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pirogov russian national research medical university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pla air force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plague of justinian NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plan s. cell press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary defense coordination office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary protection coordination office NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary response network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary science decadal survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planetary sciences division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planktos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+planning and strategic initiatives NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plant & animal genome NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plant genome research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plate boundary observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plga NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+plymouth university peninsula schools of medicine and dentistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pohang accelerator laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pohang egs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polar continental shelf program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polaris partners NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy bandwidth NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy nuclear NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy sciences center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+policy solutions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polish academy of sciences institute of geophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polish academy of sciences' institute of physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polytechnic university of catalonia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polytechnic university of marche NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polytechnic university of turin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+polytechnic university of valencia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pontifical academy for life NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pontifical catholic university of paraná NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pontifical xavierian university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+potsdam institute for climate impact NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+power development authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ppco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pprv NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+predpol of santa cruz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+preventive medicine & diagnosis innovation program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+preventive medicine and public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+primate research ( kyoto university primate research institute disease control committee primate res NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+primatological society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+princess sumaya university for technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+princeton policy school demands NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+princeton university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+principal investigators association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+prodigy biosystems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+program for promotion of research integrity at academia sinica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+program on energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+prometheus laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+prometheus labs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+promotion of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+proskauer rose NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+prostate cancer foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+protein data bank NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+protein sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+psl research university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+psychencode consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+psychiatric genomics consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+psychological science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ptwc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public health and prevention fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public health foundation of india NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public health preparedness and response program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public knowledge project's preservation network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+public's health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+publons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pubmed central and google NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pubmed commons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pubmed health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+puerto rican electric power authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+puerto rico institute of statistics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+pujol university hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+purna sulastya putra NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+qikiqtani inuit association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+qs world university rankings NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum circuits NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum encryption and science satellite NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum europe conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum internet alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum moves NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum photovoltaics group at imperial college london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum technologies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quantum technology flagship NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quark pharmaceuticals of fremont NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quaternary international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quaternary science reviews NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quebec research fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+queen mary university london NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+queensland alliance for environmental health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+queensland health forensic and scientific services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+questrom school of business at boston university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+quirin schiermeier trying NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+r. c. patel institute of pharmaceutical education and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+r. poplin preprint NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radarsat constellation mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radiation budget instrument NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radiation studies board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radioactive drug research committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+radiowave transmission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ragon institute for hiv NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ragon institute of massachusetts general hospital NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rand corporation for the wellcome trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rapid assistance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rapid climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rapid response research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rapid support forces NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+raptorex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute for information transmission problems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute for nuclear research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute of cytology and genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute of molecular genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ras institute of world history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+raven aerostar of sioux falls NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+razavi neuroscience research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rbc capital markets NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+real time system for detection of deforestation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+recolzika NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+recombinant dna research advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reddie & grose NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+redfield consulting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reducing intake of energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reduction of animals in research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+redwood coast watersheds alliance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+regenerative sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+regional development agencies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+regional research center for scientific investigation and technology transfer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+regulatory authority for tissue and embryos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rencontres de moriond NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+renewable fuels association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+renmin ribao NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reproducibility project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+reprogenetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+republican national convention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rescue global NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rescuing biomedical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research center borstel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research center for molecular medicine of the austrian academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research center for quantum information of the slovak academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research centre for natural sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research centre on animal cognition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research ethics and integrity program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research fortnight NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research frontiers programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research infrastructures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research institute and natural history museum of senckenberg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research institute for development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research integrity committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research libraries uk NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research misconduct board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research policy institute at lund university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research roaming gm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research support program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research tax credit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research-doctorate programs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+research!america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+researchkit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+respondent NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+retina society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+retrosense therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+retrovirology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rfbr NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rigel pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken centre for developmental biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+riken interdisciplinary theoretical and mathematical sciences program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ringling brothers and barnum & bailey circus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rna biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rnl bio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rnl life science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rnl sunrise regenerative medical center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+roadmap epigenomics program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+roadmap epigenomics project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rock art institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rockefeller university press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rockland immunochemicals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rocky mountain tree-ring research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rollins school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rome international center for materials science superstripes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rooibos council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+roque de los muchachos observatory on la palma NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rosetta orbiter spectrometer for ion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rosetta orbiter spectrometer for ion and neutral analysis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ross island wind farm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ross mpa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ross sea mpa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rotem sorek NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rowland kao NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal astronomical society letters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal astronomical society of canada edmonton centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal college of obstetricians NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal commission on environmental pollution NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal danish academy of fine arts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal danish academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal free london nhs foundation trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal new zealand air force NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal observatory of belgium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal photographic society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society journal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society journals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society of south africa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society open science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society's biological science awards committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+royal society's rapid assistance NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rubin observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russia direct investment fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian academy of science's institute of bioorganic chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian academy of science's institutes of molecular genetics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian academy of sciences institute of archeology and ethnography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian academy of sciences space research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian foundation for basic research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian space agency roscosmos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+russian venture company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rutgers aaup-american federation of teachers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rutgers cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rutgers cancer institute of new jersey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+rxi pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sabin vaccine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+saclay research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sae consulting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"safer chemicals, healthy families" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+safety of medicines and health products NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+saga investments NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salk board of trustees NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salk institute for biological sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salmonella paratyphi c NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salton sea authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+salvador zubirán national institute of medical sciences and nutrition NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+samsung advanced institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san council of south africa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san diego school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san diego zoo global NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san diego zoo institute for conservation research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san ignacio de loyola university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+san raffaele telethon institute for gene therapy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sanford c. bernstein & co. NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sanford-burnham medical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+são paulo state university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sarang jeil church NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sars international centre for marine molecular biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sassan saatchi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sativex NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+save the elephants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+schistosomiasis control initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scholar rescue fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scholarly publishing roundtable NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school for advanced studies in social sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of civil and construction engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of earth and atmospheric sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of history and sociology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of informatics and computing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+school of medicine at washington university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science & policy exchange NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science advances NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and environmental health network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and public policy institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and technology argentina NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and technology commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and technology innovation program at the woodrow wilson international center for scholars NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science and technology policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science bulletin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science china press NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science for technological innovation national science challenge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science in australia gender equity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+science-metrix NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sciencedebate.org NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific advisory council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific centre of monaco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific method (cambridge univ NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific publication information retrieval and evaluation system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific research journal psychology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific research publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientific research's journal of biophysical chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientists for global responsibility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientists for labour NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scientists for palestine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scripps glaciology group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+scripps institute of oceanography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sea mammal research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sea shepherd conservation society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sea turtle restoration project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sean n. parker centre for allergy & asthma research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seattle biomedical research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seattle coronavirus assessment network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seattle flu study NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+second institute of oceanography NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"secretary's advisory committee on genetics, health" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seismological research letters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seita emori NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate appropriations committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate environment and public works committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senate judiciary committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senckenberg biodiversity and climate research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senckenberg research station of quaternary palaeontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senckenberg world of biodiversity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sens research foundation mountain view NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+senseable city lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+serbian progressive party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+serrapilheira institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sesame scientific advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seven sons university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+seventh framework programme for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+severo ochoa centre for molecular biology in madrid NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sex differences and implications for translational neuroscience research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sg biofuels of encinitas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shaanxi provincial engineering and technology research center for shaanbei cashmere goats NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shahid beheshti university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai institute of applied physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai institute of materia medica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanghai mental health center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shanshui conservation center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shardna life science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shark specialist group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shark spotters NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sharonann lynch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shaw prize foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shaw prize in astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shefa neuroscience research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shenzhen hepalink pharmaceutical company NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shenzhen international biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shenzhen international biotech leaders summit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sheppard mullin richter & hampton NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sherlock bioscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sherlock biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sherry marts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shinji toda of tohoku university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shiraz university of medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+shonan maru NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sibley heart center cardiology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sidley austin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sidney centre for plant health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+siem offshore NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sigma pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+similarity check NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+simons center for geometry and physics at stony brook university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sinergium biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+singapore' national research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sinovac biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sirna therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sisters of immaculate health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skagit county public health in mount vernon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skeenawild conservation trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skin sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skolkovo institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+skoltech center for translational biomedicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sloan digital sky survey at apache point observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sloan school of management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+slow food international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+small research grant NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smithsonian institute's national museum of natural history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smithsonian institution's museum conservation institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smithsonian institution's sackler gallery NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smoke model evaluation experiment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+smoke-free alternatives trade association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+snakebite healing and education society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+soas china institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social media and democracy research grants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social psychological and personality science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social science citation index NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social science electronic publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social science research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+social sciences and humanities research council of canada NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for arab neuroscientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for immunotherapy of cancer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for research in child development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for scholarly publishing NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for scholarly publishing in wheat ridge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for the history of astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for the study of inborn errors of metabolism NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society for the study of reproduction NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of biological psychiatry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of chinese bioscientists in america NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of earth scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of entrepreneurs and ecology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of primatology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+society of spanish researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+socio-environmental institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+software carpentry foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+software sustainability institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+soko tierschutz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solar orbiter NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solar system exploration research virtual institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solazyme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+soleil securities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solenopsis invicta NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solidarity vaccine trial NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solstice mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+solyndra NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sony pictures entertainment NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sooam biotech research foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south africa radio astronomy observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south africa's kwazulu-natal research institute for tuberculosis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south african department of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south china sea institute of oceanology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+south korean navy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern african human genome programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern african science service centre for climate and land management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern astrophysical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern california seismic network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern ocean carbon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern ocean carbon and climate observations NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+southern owl nebula NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space application services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space carbon observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space development fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space interferometry mission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space radiation health project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+space studies board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spanish royal academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spark therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spero therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spherical tokamak for energy production NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+spirit cave mummy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sprenke NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+springer india NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+springer nature and taylor & francis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+springer science+business media NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+springernature NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sputnik planitia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+square kilometre array organisation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+st lawrence river institute of environmental sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+st petersburg university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+st. jude children's NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+staff disciplinary board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+standard biological parts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+standing committee on plants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford eugenics history project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford university school of medicine in stanford NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanford university's program on energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanley price NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stanley qi of stanford university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+star collaboration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+starlight initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state council for nature conservation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state council of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state key laboratory of agrobiotechnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state key laboratory of molecular oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state key laboratory of pathogen and biosecurity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state university of campinas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+state university of new jersey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+statens serum insitut NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+statistics collaborative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+status of women in astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+steac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stem cell network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stencila desktop NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stern review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sternberg museum in hays NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stockholm environment institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stockholm environmental institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stony brook cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+strategic planning committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stratospheric particle injection for climate engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stuart henrys NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+stuttgart state museum of natural history NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+suborbital research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+subpolar north atlantic program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sudanese national academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+suffolk university law school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sughrue mion NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sukachev institute of forest NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+supercomputing centre of galicia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+superior high arbitration court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+superior technical institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+support research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+supreme arbitration court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+supreme leader ayatollah NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+supreme people's court of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+surface heat budget NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+surgisphere corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+suzuka university of medical science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+sw/niger delta forest project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish association of university teachers and researchers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish institute of space physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish medical products agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish meteorological and hydrological institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish national council on medical ethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swedish research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swift observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss federal institute of technology of lausanne NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss institute for experimental cancer research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss mummy project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss ornithological institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swiss state secretariat for education and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+swog cancer research network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+symyx NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+symyx technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+synaptic leap NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+synthesis philosophica NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+synthetic biology standards consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+syros pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+system for publication and evaluation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+systematic entomology lab NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+t.h. chan school of public health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+taconic biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tahija foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tanzania academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+target malaria NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+targeted proteins research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tarveda therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tasmanian seed conservation centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tass russian news agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tata institute for genetics and society NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tata trusts NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tauri group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tdcs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+teamindus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tech inquiry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical institute of physics and chemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical review panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of braunschweig NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of chemnitz NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of darmstadt NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of dortmund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technical university of kaiserslautern NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technological university of el chocó NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology & education advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology and economic assessment panel NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology and innovation committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+technology and innovation endowment fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+teconomy partners NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tectonophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tehran university to ayatollah khamenei NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+telecommunication standardization bureau NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+terravision exploration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+terry fox laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tetralogic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+teva pharmaceuticals industries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+texas a&m university's harte research institute in corpus christi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+texas tech university health science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+texas water development board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thai academy of science and technology foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thai young scientists academy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thailand research fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the american psychiatric association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the association of american medical colleges NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the chicago community trust NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the five star movement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the foundation fighting blindness NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the george institute for international health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the research department of moët & chandon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the south china sea institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+the university of north carolina school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+themis bioscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+theoretical astrophysics center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+theoretical physics of condensed matter laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+therapeutics accelerator NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thermo fisher scientific of waltham NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+third rock ventures NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thirty meter telescope international observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+three-north shelter forest program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thünen institute of wood research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thuringian state observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+thwaites glacier offshore research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tianjin university of traditional chinese medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tibotec pharmaceuticals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+time-space reference systems NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tissue culture core facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tiziana life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tokamak energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tor vergata university of rome NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+toronto science policy network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trait biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+transatlantic trade and investment partnership NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+transgenic technology meeting NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+transition military council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+translational medicine division NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+translational research informatics center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+transplantation of human organs and tissues NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+treatment action campaign NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trichanalytics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trinity partners NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+troitsk institute of innovative and thermonuclear research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropic biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical fisheries research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical forest and climate initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical melhoramento & genética NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropical trump NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tropospheric monitoring instrument NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trump the world health organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+trust for america's health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tsinghua university's institute of low carbon economy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tsinghua university's school of life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tsingua university's institute of climate change and sustainable development NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ttip NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tuba city regional health care corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tucson gem NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tumor biology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+turkish aerospace industries NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+turkish higher education board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+turku centre for quantum physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+turning technologies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+twilight zone ocean network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+twist bioscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+tychonic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+u r rao satellite centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+u.s. foundation response NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+u.s. national academies of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+u.s.-china economic and security review commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uae space agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucl centre for biodiversity and environment research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucl council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucl great ormond street institute of child health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucl's institute of child health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucs center for science and democracy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ucsd health system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uct institutional reconciliation and transformation commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uct's black academic caucus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ufrj institute of medical biochemistry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ufrj's laboratory of elementary particles NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uganda national academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk association of medical research charities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk bioindustry association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk biotechnology and biological sciences research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk civil service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk clinical research collaboration tissue directory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk court of appeal NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk dementia research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk food and environment research agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk independence party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk institute for public policy research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk labour force survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk labour member of parliament NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk national institute for health and care excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk national institute for health and clinical excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk national quantum technologies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk natural environment research council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk nuclear industry association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk office of national statistics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk strategic defence and security review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uk universities purchasing consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukcmri NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukraine international airlines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukrainian association of reproductive medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukrainian science club NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ukrio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+umeå centre for microbial research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un environment assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un framework convention on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un intergovernmental panel on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un mission for ebola emergency response NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+un population fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unclos NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unfcc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unicode consortium NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unión de nativos ayoreos de paraguay NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+union of concern scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uniqorn NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unistellar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united campus workers of georgia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united kingdom atomic energy authority NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations climate summit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations environment assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations human rights committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations international civil aviation organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations office for disaster risk reduction NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations office for outer space affairs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations sustainable development solutions network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations university institute of advanced studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations world heritage NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations world meteorological organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' general assembly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' green climate fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+united nations' world meteorological organization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+universal quantum and alpine quantum technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+universities allied for essential medicines NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university college london's institute for sustainable resources NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university college london's institute of cognitive neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university hospital for psychiatry zurich NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university museum of zoology, university of cambridge" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of 'roma tre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of a coruña NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of aix-marseille NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of arizona's lunar and planetary laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of arkansas for medical sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of british columbia fisheries centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of british columbia okanagan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of british columbia's fisheries centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california and nature publishing group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california board of regents NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california curation center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california irvine school of medicine and school of law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california museum of paleontology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california observatories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california to cambridge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california union of postdocs NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of california, berkeley if trump" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california's berkeley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of california's lick observatory on mount hamilton NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of cambridge NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of cambridge, imperial college london" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of cambridge, university college london" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of cambridge's institute of astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of catanzaro magna graecia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of chile school of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of colorado boulder's natural history museum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of colorado's center for bioethics and humanities NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of colorado's laboratory for atmospheric and space physics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of cote d'azur in nice NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of delaware's school of marine science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of delhi's centre for genetic manipulation of crop plants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of duisburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of east anglia's climatic research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of edinburgh's roslin institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of erlangen-nuremberg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of geneva medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of halle-wittenberg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of hawaii's institute for astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of hawaii's institute for astronomy in manoa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of indonesia in depok NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of ioannina school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of malawi's college of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of manchester's national graphene institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of marburg NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland center for environmental science in solomons NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland in college park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland's chesapeake biological laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland's horn point laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of maryland's joint global change research institute in college park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of massachusetts, amherst" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of melbourne's school of botany NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of michigan geriatrics center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of michigan law school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of michigan medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of michigan museum of anthropology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of minnesota in saint paul NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of minnesota stem cell institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of minnesota, twin cities" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of minnesota's center for infectious diseases research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of nairobi's kenya aids vaccine initiative institute for clinical research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of naples federico ii NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of new caledonia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of new south wales' climate-change research centre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of nice sophia antipolis NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of north carolina chapel hill center for aids research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of north carolina school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of nottingham medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of nottingham's school of biosciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of oxford's wildlife conservation research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of paraíba valley NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of paris dauphine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of paris-south NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pennsylvania medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pennsylvania's institute for translational medicine and therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pittsburgh cancer institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pittsburgh center for vaccine research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of pretoria's genomics research institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of puerto rico humacao NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of quebec trois-rivières NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of roma tre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of rome tre NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of são paulo school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of são paulo's museum of archaeology and ethnology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of sciences and technology of china NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of south florida college of marine science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southampton's institute of maritime law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southern california dornsife/ los angeles times NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southern california's longevity institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southern mississippi's gulf coast research laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of southern texas medical center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of sydney michael spence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of texas at austin marine science institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of texas at austin school of law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of texas m. d. anderson cancer center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of texas southwestern NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+"university of the ryukyus, niigata university" NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of toronto mississauga NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of toronto scarborough NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of toulouse-jean jaurès NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of toulouse-paul sabatier NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of utah college of law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of utah health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of versailles saint quentin NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of veterinary medicine hannover NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of virginia school of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington medical school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington school of law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington's friday harbor laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of washington's national primate research center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university of wisconsin's cooperative institute for meteorological satellite studies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university-national oceanographic laboratory system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+university-of-hawaii-built NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unmanned aircraft systems program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unols) council NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unoosa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unpaywall NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unsilo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unsilo of aarhus NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unsw centre for quantum computation and communication technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+unum therapeutics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+uppsala astronomical observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+urban dynamics institute at oak ridge national laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+urban emissions NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+urban wildlands group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+urologic oncology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us advanced research projects agency-energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us air force's national security space institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us antarctic research programmes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us arctic research commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us army training and doctrine command NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us association for women in science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us association of research integrity officers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us bureau of labor statistics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us bureau of labour statistics and wikipedia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us bureau of ocean energy management NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us centers for disease control and prevention and national institutes of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us centers for disease prevention and control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us centers for diseases control and prevention NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us chemical safety board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us chimpanzee health improvement NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us court of appeals for the district of columbia circuit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us deep space climate observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department for health and human services NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of defense's defense advanced research projects agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of energy and national science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of energy's joint genome institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us department of health and human services's office of research integrity NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us district court for the district of columbia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us district court for the southern district of new york NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us district court of the district of columbia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us eastern standard time NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us energy department's office of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us equal opportunity commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us federal emergency management agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us food and drug association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us forest service's forest inventory and analysis program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us forest service's national genomics center for wildlife NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us geological survey's alaska science center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us geological survey's national wildlife health center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us house committee on science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us human microbiome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us ice drilling program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us institute of medicine's forum on neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us intelligence advanced research projects agency NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us joint space operations center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academics of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academy of sciences and national academy of medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national academy of sciences decadal survey of astronomy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national cancer institute at the national institutes of health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national center on advancing translational sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national climatic data center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national cmv foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national health and nutrition examination NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national high magnetic field laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national incident command's flow rate technical group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national insitute of allergies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of allergies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of diabetes NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of environmental health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of environmental health sciences in research triangle park NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of health's human microbiome project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of neurological disorders NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of neurological disorders and stroke NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute of nursing research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute on aging NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institute on drug abuse NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national institutes of health and national science foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national lgbt cancer network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national longitudinal study of adolescent health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national medal of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national nanotechnology initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national nuclear security administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration's cooperative institute for climate and satellites NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration's coral reef watch NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration's national climatic data center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national oceanic and atmospheric administration's pacific marine environmental laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national optical-infrared astronomy research laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national plant genome initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national renewable energy laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national science foundation gulfstream NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national science foundation survey of graduate students NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us national toxicology program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us naval war college NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us nuclear posture review NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us office for human research protections NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us office of naval research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us precision medicine initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us right to know NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us small business innovation research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us society for neuroscience NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us treasury department's office of foreign assets control NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us-ireland research and development partnership NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+us–china energy cooperation program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+usda-ars bee biology and systematics laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+usgs earthquake hazards program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+usgs interagency grizzly bear study team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+usgs volcano hazards program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+utility solutions group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vaccine research initiative NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+valeant pharmaceuticals of laval NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+validation of alternative methods NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vaquita express NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vatican secret archives NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vavilov research institute of plant industry NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+veneto institute of molecular medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+venezuelan amazon NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+venice time machine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+venter group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+venus exploration analysis group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+verenium corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+verification research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+verily life sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+veterinary medicine advisory committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vexag international workshop NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vibrant clean energy llc NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+victims of communism memorial foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vienna science and technology fund NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vietnam academy of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+viiv healthcare NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+violence prevention research program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+virgin galactic NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+virtual physiological human network of excellence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+virus identification laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+visiopharm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vital strategies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+vmac NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+voilà foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+voinnet NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+voit & mayer NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+volcano disaster assistance program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+volkswagen foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wageningen agricultural university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wake county superior court NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+walt de heer of georgia institute of technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+walther schücking institute of international law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+warren p. knowles professor of law & bioethics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+warsaw university observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+washington state hospital association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+water task team NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+watson health cloud NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+waymo NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wayne state university's institute of environmental health sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+weill cornell brain tumor center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+weill cornell medicine institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+welfare and conservation of animals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome centre for infectious diseases research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wellcome trust centre for mitochondrial research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wenchang space launch center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wentworth group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wentworth group of concerned scientists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+were santa cruz biotech NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+western kenya network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wharton risk center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+whereas labour NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white coat waste project NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house council on environmental quality NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house office of energy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house office of science and technology policy's joint committee NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+white house office of trade and manufacturing policy NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who collaborating center on public health law and human rights at georgetown university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who collaborating centre for reference and research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who global malaria programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who stop tb department NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who strategic advisory group NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who world mental health survey consortium j. am NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who-affiliated centers for law NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who's executive board NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who's health emergencies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who's strategic advisory group of experts on immunization NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+who) health emergencies programme NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wikipedia NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wikipedia science conference NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wild nature institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wildlife conservation research unit NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wilkinson microwave anisotropy probe NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+william alanson white institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+william and flora hewlett foundation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+william davidson institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wilson international center for scholars NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wimar witoelar NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+windpower monthly NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wohlers associates NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+women's hospital heart and vascular center NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+woods canyon archaeological consultants NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+woods hole oceanographic institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+woranso-mille NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+working group of indigenous minorities in southern africa NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+working group on himalayan glaciology of the international commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+working party NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world conference of science journalists NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world energy congress NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world energy outlook NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world glacier monitoring service NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world health organization global plan NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world health organization's international agency for research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world heritage committee of the united nations educational NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world medical association NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world meteorological organization's integrated global observing system NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world ocean atlas NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world organization for animal health NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world premier international research centers NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world privacy forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world register of marine species NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world science forum NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world society for the protection of animals NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world surf league NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world university rankings NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+world wide lightning location network NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuhan municipal health commission NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuhan national laboratory of electronics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuhan university of bioengineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuhan university of technology's international school of materials science and engineering NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wuzhen institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wwf international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wyle laboratories NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+wyss center for bio NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+xechem international NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+xl catlin seaview survey NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yaguará panama NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale center for astronomy and astrophysics NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale program on climate change communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale project on climate change NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yale project on climate change communication NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yalu aboriginal corporation NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yanan sun NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yangyang underground laboratory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+ybco NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yellowstone grizzlies NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yerevan physics institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yizhi liu of sun yat-sen university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yokohama science frontier high school NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+young academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+young scientists exchange program NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+yunnan agricultural university NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zaira resource management area NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zapata swamp captive breeding farm NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zayed university of artificial intelligence NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zeta ophiuchi NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zewail city of science and technology NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zhejiang university institute for social medicine NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zhejiang university-university of edinburgh institute NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zimbabwe academy of science NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zimbabwe academy of sciences NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zurich observatory NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zwicky transient facility NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+zymo research NONE NA NA FALSE 1 2021-02-03 NA NA NA NA NA NA NA FALSE
+bi norwegian business school no Europe Northern Europe FALSE 1 2021-02-03 125421139 way "Norwegian Air Shuttle, 3, Oksenøyveien, Fornebu, Bærum, Viken, 1366, Norge" office company 0.59515363245564 Norge FALSE
+eit no Europe Northern Europe FALSE 1 2021-02-03 23054719 node "Eiet, Flesberg, Viken, Norge" place farm 0.2 Norge FALSE
+oslo metropolitan university no Europe Northern Europe FALSE 1 2021-02-03 257701514 way "OsloMet – storbyuniversitetet, Falbes gate, Pilestredet park, St. Hanshaugen, Oslo, 0170, Norge" amenity university 0.451332014915526 Norge FALSE
+oslo university hospital no Europe Northern Europe FALSE 1 2021-02-03 182954962 way "Oslo universitetssykehus (Rikshospitalet), Sognsvannsveien, Gaustad, Nordre Aker, Oslo, 0372, Norge" amenity hospital 0.599096455305557 Norge FALSE
+sputnik v no Europe Northern Europe FALSE 1 2021-02-03 126372392 way "Sputnikveien, Kjellberg, Sandefjord, Vestfold og Telemark, 3224, Norge" highway residential 0.3 Norge FALSE
+university of oslo's natural history museum no Europe Northern Europe FALSE 1 2021-02-03 84983285 way "Botanisk hage, 1, Sars' gate, Sofienberg, Grünerløkka, Oslo, 0562, Norge" tourism attraction 0.628069876897978 Norge FALSE
+university of tromsø no Europe Northern Europe FALSE 1 2021-02-03 95993572 way "Universitetet i Tromsø - Norges arktiske universitet, Gimlevegen, Breivika, Tromsø, Troms og Finnmark, 9019, Norge" amenity university 0.534301779265404 Norge FALSE
+vae no Europe Northern Europe FALSE 1 2021-02-03 258997285 relation "Vae, Gamvik, Troms og Finnmark, Norge" natural water 0.3 Norge FALSE
+acta nl Europe Western Europe FALSE 1 2021-02-03 96616441 way "ACTA, 3004, Gustav Mahlerlaan, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland, 1081LA, Nederland" amenity college 0.290508362962683 Nederland FALSE
+aeolus nl Europe Western Europe FALSE 1 2021-02-03 144931633 way "Aeolus, Westlandseweg, Vlaardingen, Zuid-Holland, Nederland, 3134JC, Nederland" man_made windmill 0.26265143530573 Nederland FALSE
+ambix nl Europe Western Europe FALSE 1 2021-02-03 54117879 node "BENU Apotheek Ambix, 1a, Chopinstraat, Bunschoten-Spakenburg, Bunschoten, Utrecht, Nederland, 3752HR, Nederland" amenity pharmacy 0.101 Nederland FALSE
+ams nl Europe Western Europe FALSE 1 2021-02-03 95519693 way "Luchthaven Schiphol, Badhoevedorp, Haarlemmermeer, Noord-Holland, Nederland" aeroway aerodrome 0.53820282267208 Nederland FALSE
+best nl Europe Western Europe FALSE 1 2021-02-03 258000671 relation "Best, Oirschot, Noord-Brabant, Nederland" boundary administrative 0.556605514662107 Nederland FALSE
+bosch nl Europe Western Europe FALSE 1 2021-02-03 258171058 relation "'s-Hertogenbosch, Noord-Brabant, Nederland" boundary administrative 0.667476382537589 Nederland FALSE
+centocor nl Europe Western Europe FALSE 1 2021-02-03 158634721 way "Centocor, Einsteinweg, Leiden Bio Science Park, Leiden, Zuid-Holland, Nederland, 2333CD, Nederland" building commercial 0.101 Nederland FALSE
+cosine nl Europe Western Europe FALSE 1 2021-02-03 46849085 node "Cosine, 36, Oosteinde, Warmond, Teylingen, Zuid-Holland, Nederland, 2361HE, Nederland" office company 0.101 Nederland FALSE
+dunkin' donuts nl Europe Western Europe FALSE 1 2021-02-03 186353233 way "Dunkin' Donuts, Amstelpassage, Centrum, Amsterdam, Noord-Holland, Nederland, 1012AB, Nederland" amenity fast_food 0.660723093272883 Nederland FALSE
+estec nl Europe Western Europe FALSE 1 2021-02-03 296384894 way "European Space Research and Technology Centre, Noordwijk, Zuid-Holland, Nederland, 2201AZ, Nederland" landuse commercial 0.415797566639606 Nederland FALSE
+greenpeace international nl Europe Western Europe FALSE 1 2021-02-03 27171707 node "Greenpeace International, 5, Ottho Heldringstraat, Westlandgracht, Nieuw-West, Amsterdam, Noord-Holland, Nederland, 1066AZ, Nederland" office ngo 0.722713711460203 Nederland FALSE
+hague university of applied sciences nl Europe Western Europe FALSE 1 2021-02-03 172073582 way "Haagse Hogeschool, 75, Johanna Westerdijkplein, Schipperskwartier, Laak, Den Haag, Zuid-Holland, Nederland, 2521EN, Nederland" amenity college 0.325616522175778 Nederland FALSE
+international bar association nl Europe Western Europe FALSE 1 2021-02-03 300605690 node "International Bar Association, Nassaulaan, Willemspark, Centrum, Den Haag, Zuid-Holland, Nederland, 2514JT, Nederland" office association 0.301 Nederland FALSE
+international red cross and red crescent movement nl Europe Western Europe FALSE 1 2021-02-03 30304696 node "Rode Kruis Ede, 30C, Klinkenbergerweg, Ede, Gelderland, Nederland, 6711MK, Nederland" office ngo 0.688190127552538 Nederland FALSE
+joint institute for vlbi nl Europe Western Europe FALSE 1 2021-02-03 53796048 node "Joint Institute for VLBI ERIC, Oude Hoogeveensedijk, Lhee, Dwingeloo, Westerveld, Drenthe, Nederland, 7991, Nederland" office research 0.401 Nederland FALSE
+kws nl Europe Western Europe FALSE 1 2021-02-03 124014428 way "KWS, Botlek Rotterdam, Rotterdam, Zuid-Holland, Nederland" landuse industrial 0.3 Nederland FALSE
+leiden university medical centre nl Europe Western Europe FALSE 1 2021-02-03 257776634 relation "Leiden, Zuid-Holland, Nederland" boundary administrative 0.719246276766776 Nederland FALSE
+medicines agency nl Europe Western Europe FALSE 1 2021-02-03 302037271 node "European Medicines Agency, 6, Domenico Scarlattilaan, Drentepark, Zuid, Amsterdam, Noord-Holland, Nederland, 1083HS, Nederland" office government 0.69651736792561 Nederland FALSE
+nederland nl Europe Western Europe FALSE 1 2021-02-03 258635389 relation Nederland boundary administrative 0.929416895369094 Nederland FALSE
+nib nl Europe Western Europe FALSE 1 2021-02-03 28452921 node "NIBC Bank, 4, Carnegieplein, Zeeheldenkwartier, Centrum, Den Haag, Zuid-Holland, Nederland, 2517KJ, Nederland" amenity bank 0.422734482343971 Nederland FALSE
+smos nl Europe Western Europe FALSE 1 2021-02-03 86360011 way "Derk Smoeslaan, Sluitersveld, Almelo, Overijssel, Nederland, 7603SX, Nederland" highway residential 0.1 Nederland FALSE
+synlogic nl Europe Western Europe FALSE 1 2021-02-03 52272358 node "Synlogic, 1H, Branderweg, Westenholte, Zwolle, Overijssel, Nederland, 8042PD, Nederland" office it 0.101 Nederland FALSE
+tno nl Europe Western Europe FALSE 1 2021-02-03 95537231 way "TNO, Rijswijk, Zuid-Holland, Nederland, 2288GJ, Nederland" landuse industrial 0.3 Nederland FALSE
+twente nl Europe Western Europe FALSE 1 2021-02-03 46292871 node "Twente, Saasveld, Dinkelland, Overijssel, Nederland, 7597KL, Nederland" place region 0.546214416898128 Nederland FALSE
+university of delft nl Europe Western Europe FALSE 1 2021-02-03 138201041 way "Technische Universiteit Delft, Mijnbouwstraat, Wippolder, Delft, Zuid-Holland, Nederland, 2628, Nederland" amenity university 0.604534284533579 Nederland FALSE
+university of leiden nl Europe Western Europe FALSE 1 2021-02-03 259157980 relation "Universiteit Leiden, Einsteinweg, Leiden Bio Science Park, Leiden, Zuid-Holland, Nederland, 2333CE, Nederland" amenity university 0.688163620893378 Nederland FALSE
+university of maastricht nl Europe Western Europe FALSE 1 2021-02-03 31891847 node "University College Maastricht, De Bosquetplein, Maastricht-Centrum, Maastricht, Limburg, Nederland, 6211, Nederland" amenity university 0.494548847777872 Nederland FALSE
+university of utrecht nl Europe Western Europe FALSE 1 2021-02-03 103062889 way "University College Utrecht 'Babel', 7, Campusplein, Rijnsweerd, Utrecht, Nederland, 3584ED, Nederland" amenity university 0.471596680569804 Nederland FALSE
+utrecht nl Europe Western Europe FALSE 1 2021-02-03 258519257 relation "Utrecht, Nederland" boundary administrative 0.729439910682055 Nederland FALSE
+vrij nederland nl Europe Western Europe FALSE 1 2021-02-03 212385 node "Vrij, Siebengewald, Bergen, Limburg, Nederland, 5853, Nederland" place hamlet 0.45 Nederland FALSE
+vrije universiteit amsterdam nl Europe Western Europe FALSE 1 2021-02-03 258889678 relation "VU Hoofdgebouw, 1105, De Boelelaan, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland, 1081 HV, Nederland" amenity university 0.101 Nederland FALSE
+vrije university nl Europe Western Europe FALSE 1 2021-02-03 94052906 way "Vrije Universiteit, Campusplein, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland" amenity university 0.576914729576358 Nederland FALSE
+vu university amsterdam nl Europe Western Europe FALSE 1 2021-02-03 94052906 way "Vrije Universiteit, Campusplein, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland" amenity university 0.576914729576358 Nederland FALSE
+wageningen university and research nl Europe Western Europe FALSE 1 2021-02-03 235168671 way "Wageningen University & Research, Bornsesteeg, Wageningen, Gelderland, Nederland, 6708PE, Nederland" amenity university 0.485440647712364 Nederland FALSE
+wageningen university and research centre nl Europe Western Europe FALSE 1 2021-02-03 235168671 way "Wageningen University & Research, Bornsesteeg, Wageningen, Gelderland, Nederland, 6708PE, Nederland" amenity university 0.485440647712364 Nederland FALSE
+x-tek systems nl Europe Western Europe FALSE 1 2021-02-03 153550698 way "Aerotek / Tek Systems, Maria Montessorilaan, Rokkeveen, Zoetermeer, Zuid-Holland, Nederland, 2719DB, Nederland" building yes 0.201 Nederland FALSE
+international center for tropical agriculture ni Americas Central America FALSE 1 2021-02-03 23992977 node "CIAT - Centro Internacional de Agricultura Tropical, Calle La Extramadura, Los Robles, Distrito I, Managua (Municipio), Departamento de Managua, 14002, Nicaragua" office ngo 0.101 Nicaragua FALSE
+nih vrc ni Americas Central America FALSE 1 2021-02-03 68159851 node "Motoshop VRC, Pista Pedro JoaquÃn Chamorro, Barrio Santa Rosa, Santa Rosa, Distrito IV, Managua (Municipio), Departamento de Managua, 11095, Nicaragua" shop motorcycle 0.101 Nicaragua FALSE
+unan ni Americas Central America FALSE 1 2021-02-03 258777799 relation "Universidad Nacional Autónoma de Nicaragua (UNAN), Sector UNAN Managua, Distrito I, Managua (Municipio), Departamento de Managua, 14172, Nicaragua" boundary administrative 0.405003945962319 Nicaragua FALSE
+united nation's food and agriculture organization ni Americas Central America FALSE 1 2021-02-03 147031638 way "FAO Representation, Via al Mirador, Mirador Norte, Mirador Norte Santo Domingo, Distrito I, Managua (Municipio), Departamento de Managua, 14236, Nicaragua" office yes 0.101 Nicaragua FALSE
+aba ng Africa Western Africa FALSE 1 2021-02-03 4302273 node "Aba, Aba South, Abia, Nigeria" place city 0.51986117350753 Nigeria FALSE
+agi ng Africa Western Africa FALSE 1 2021-02-03 4166597 node "Agi, Ushongo, Benue, Nigeria" place village 0.375 Nigeria FALSE
+asor ng Africa Western Africa FALSE 1 2021-02-03 4143033 node "Asor, Vandeikya, Benue, Nigeria" place village 0.375 Nigeria FALSE
+bank of industry ng Africa Western Africa FALSE 1 2021-02-03 251858983 way "Bank of Industry, Oba Adesida Road, Akure, Akure South, Ondo, P.M.B 704, Nigeria" amenity bank 0.301 Nigeria FALSE
+cipm ng Africa Western Africa FALSE 1 2021-02-03 215607744 way "CIPM, Agidingbi, Ikeja, Nigeria" landuse commercial 0.3 Nigeria FALSE
+egu ng Africa Western Africa FALSE 1 2021-02-03 4155158 node "Egue, Ogoja, Cross River, Nigeria" place village 0.375 Nigeria FALSE
+emu ng Africa Western Africa FALSE 1 2021-02-03 4192015 node "Emu, Lokoja, Kogi, Nigeria" place village 0.375 Nigeria FALSE
+european union council ng Africa Western Africa FALSE 1 2021-02-03 61840071 node "Delegation of the European Union to Nigeria and ECOWAS, European Union Crescent, Abuja, Municipal Area Council, Federal Capital Territory, 900281, Nigeria" office diplomatic 0.301 Nigeria FALSE
+federal university of bahia ng Africa Western Africa FALSE 1 2021-02-03 212660417 way "Wudil - Potiskum Federal Road, Sabon Gari Arewa, Sabon Gari Lga Quarter, Sabon Gari, Wudil, Kano, Nigeria" highway primary 0.2 Nigeria FALSE
+gwu ng Africa Western Africa FALSE 1 2021-02-03 4216886 node "Gwu, Guma, Benue, Nigeria" place village 0.375 Nigeria FALSE
+iddo ng Africa Western Africa FALSE 1 2021-02-03 4158848 node "Iddo, Ijumu, Kogi, Nigeria" place village 0.375 Nigeria FALSE
+iita ng Africa Western Africa FALSE 1 2021-02-03 210080586 way "IITA, Oluana, Akinyele, Oyo, Nigeria" landuse research 0.3 Nigeria FALSE
+itar ng Africa Western Africa FALSE 1 2021-02-03 4164628 node "Itar, Ushongo, Benue, Nigeria" place village 0.375 Nigeria FALSE
+kigam ng Africa Western Africa FALSE 1 2021-02-03 4191125 node "Kigam, Dankolo, Sakaba, Kebbi, Nigeria" place hamlet 0.35 Nigeria FALSE
+living proof ng Africa Western Africa FALSE 1 2021-02-03 214035104 way "Living-Proof Church Street, Ijaiye, Coker, Ifako/Ijaye, 100282, Nigeria" highway residential 0.3 Nigeria FALSE
+national primary health care development agency ng Africa Western Africa FALSE 1 2021-02-03 63408220 node "National Primary Health Care Development Agency, Murtala Muhammed Way, Yamma 2, Muhammadu Dikko Stadium, Katsina, Nigeria" amenity hospital 0.601 Nigeria FALSE
+obafemi awolowo university ng Africa Western Africa FALSE 1 2021-02-03 65154644 node "Obafemi Awolowo University, Road 1, Ife, Ife Central, Osun, Nigeria" amenity university 0.675561325671519 Nigeria FALSE
+open technology fund ng Africa Western Africa FALSE 1 2021-02-03 301111077 way "Petroleum Technology Development Fund, Memorial Drive, Wuse II, Abuja, Municipal Area Council, Federal Capital Territory, 223140, Nigeria" office government 0.201 Nigeria FALSE
+redeemer's university ng Africa Western Africa FALSE 1 2021-02-03 82335474 node "Redeemers University, Ede, Akoda Road, Ede South, Osun, 232121, Nigeria" amenity college 0.301 Nigeria FALSE
+rivers ng Africa Western Africa FALSE 1 2021-02-03 258774669 relation "Rivers, Nigeria" boundary administrative 0.589155408370537 Nigeria FALSE
+sheba ng Africa Western Africa FALSE 1 2021-02-03 4292823 node "Sheba, Fufore, Adamawa, Nigeria" place village 0.375 Nigeria FALSE
+tüba ng Africa Western Africa FALSE 1 2021-02-03 258538002 relation "Tuba, Jere, Borno, Nigeria" boundary administrative 0.35 Nigeria FALSE
+ukaea ng Africa Western Africa FALSE 1 2021-02-03 4061173 node "Ukaa, Lafia, Nasarawa, Nigeria" place village 0.275 Nigeria FALSE
+ukip ng Africa Western Africa FALSE 1 2021-02-03 4135824 node "Ukip, Odukpani, Cross River, Nigeria" place village 0.375 Nigeria FALSE
+ussa ng Africa Western Africa FALSE 1 2021-02-03 4138452 node "Ussa, Rafi, Niger, Nigeria" place village 0.375 Nigeria FALSE
+ut health ng Africa Western Africa FALSE 1 2021-02-03 252874587 way "health, Ganye - Jimeta Federal Road, Kubi, Jada, Adamawa, Nigeria" amenity hospital 0.111 Nigeria FALSE
+zenith bank ng Africa Western Africa FALSE 1 2021-02-03 217118303 way "Zenith Bank, Lairdstown, Lokoja, Kogi, Nigeria" landuse commercial 0.4 Nigeria FALSE
+acmad ne Africa Western Africa FALSE 1 2021-02-03 48915388 node "ACMAD, Avenue des Ministères, Kombo, Niamey, 227, Niger" office telecommunication 0.101 Niger FALSE
+akari ne Africa Western Africa FALSE 1 2021-02-03 3928427 node "Akari, Tchirozérine, Agadez, Niger" place village 0.375 Niger FALSE
+court of auditors ne Africa Western Africa FALSE 1 2021-02-03 40892781 node "Cour de Compte, Avenue des Ministères, Kombo, Niamey, 227, Niger" amenity courthouse 0.001 Niger FALSE
+ecole normale supérieure ne Africa Western Africa FALSE 1 2021-02-03 150675686 way "École Normale Supérieure, Nogaré, Niamey, Niger" landuse residential 0.4 Niger FALSE
+global health program ne Africa Western Africa FALSE 1 2021-02-03 72262246 node "USAID Global Health Supply Chain Program, Rue KK - 37, Ambassades, Yantala Bas, Niamey, 12519, Niger" office ngo 0.301 Niger FALSE
+sciences en marche ne Africa Western Africa FALSE 1 2021-02-03 247370552 way "Faculté des Sciences Économiques et Juridiques (FSEJ), Rue du Malii, Baie d'Along, Kalley Sud, Niamey, 13053, Niger" amenity university 0.201 Niger FALSE
+united nations economic commission for africa ne Africa Western Africa FALSE 1 2021-02-03 100693942 way "Commission Economique de Nations Unis pour l'Afrique, Avenue du Fleuve Niger, Château 1, Plateau, Niamey, PO BOX 744, Niger" office international_organization 0.201 Niger FALSE
+adelie land NA Africa Southern Africa FALSE 1 2021-02-03 258784652 relation French Antarctic Territory boundary region 0.512160492428557 NA FALSE
+concordia station NA Africa Southern Africa FALSE 1 2021-02-03 17620139 node "Concordia Station, Route 66, Camp d'été, Concordia Station" tourism attraction 0.54728560320245 NA FALSE
+flower garden banks national marine sanctuary NA Africa Southern Africa FALSE 1 2021-02-03 259278410 relation Flower Garden Banks National Marine Sanctuary boundary protected_area 0.896586468044334 NA FALSE
+icecube neutrino observatory NA Africa Southern Africa FALSE 1 2021-02-03 59696254 node IceCube Neutrino Observatory office research 0.703758799530623 NA FALSE
+jang bogo station NA Africa Southern Africa FALSE 1 2021-02-03 76959223 node Jang Bogo Station office research 0.301 NA FALSE
+ou NA Africa Southern Africa FALSE 1 2021-02-03 299876346 node أوروبا place continent 0.820706719188318 NA FALSE
+southern ocean NA Africa Southern Africa FALSE 1 2021-02-03 1180665 node Southern Ocean place ocean 0.804907554591729 NA FALSE
+security commission na NA NA FALSE 1 2021-02-03 176798699 way "Social Security Commission, Social Security Commission Street, Evululuko, Oshakati, Oshana Region, Namibia" building yes 0.201 Namibia FALSE
+university of namibia na NA NA FALSE 1 2021-02-03 259061968 relation "University of Namibia (UNAM), 340, Western Bypass, Academia, Windhoek, Khomas Region, 10021, Namibia" amenity university 0.65609057542022 Namibia FALSE
+defence science institute my Asia South-Eastern Asia FALSE 1 2021-02-03 201603752 way "Institut Penyelidikan Sains dan Teknologi Pertahanan, Kajang 2, Majlis Perbandaran Kajang, Selangor, 43000, Malaysia" landuse military 0.2 Malaysia FALSE
+executive council my Asia South-Eastern Asia FALSE 1 2021-02-03 181186080 way "Klang Executive Club, Majlis Perbandaran Klang, Selangor, Malaysia" landuse commercial 0.3 Malaysia FALSE
+ipo my Asia South-Eastern Asia FALSE 1 2021-02-03 919320 node "Ipoh, Perak, 30450, Malaysia" place city 0.615222407384027 Malaysia FALSE
+micron my Asia South-Eastern Asia FALSE 1 2021-02-03 170067917 way "Micron, Muar, Johor, Malaysia" landuse industrial 0.3 Malaysia FALSE
+nas council my Asia South-Eastern Asia FALSE 1 2021-02-03 77986421 node "NAS THE BARBERSHOP, Jalan Rantau Panjang, Kampung Rantau Panjang, Majlis Perbandaran Klang, Selangor, 42100, Malaysia" shop hairdresser_supply 0.101 Malaysia FALSE
+national defence university of malaysia my Asia South-Eastern Asia FALSE 1 2021-02-03 177354671 way "Universiti Pertahanan Nasional Malaysia, Sungai Besi, Kuala Lumpur, 57000, Malaysia" amenity university 0.453359579316511 Malaysia FALSE
+national institute of occupational safety and health my Asia South-Eastern Asia FALSE 1 2021-02-03 56964700 node "Institut Keselamatan dan Kesihatan Pekerjaan Negara (NIOSH), Jalan Tun Abdul Razak, Ayer Keroh, Majlis Perbandaran Hang Tuah Jaya, Melaka Tengah, Melaka, 75450, Malaysia" office government 0.101 Malaysia FALSE
+niosh my Asia South-Eastern Asia FALSE 1 2021-02-03 191530658 way "National Institute of Safety and Health (NIOSH), Majlis Perbandaran Kajang, Selangor, Malaysia" landuse commercial 0.3 Malaysia FALSE
+university malaysia sarawak my Asia South-Eastern Asia FALSE 1 2021-02-03 77913241 node "Open University Malaysia, Jalan Ibrahim Sultan, Johor Bahru, Iskandar Malaysia, Johor, 80300, Malaysia" amenity university 0.201 Malaysia FALSE
+zero hour my Asia South-Eastern Asia FALSE 1 2021-02-03 54517763 node "OYO 304 Zero Hour, 60, Changkat Bukit Bintang, Bukit Bintang, Kuala Lumpur, 50200, Malaysia" tourism hotel 0.201 Malaysia FALSE
+autonomous university of mexico state mx Americas Central America FALSE 1 2021-02-03 96671012 way "Universidad Nacional Autónoma de México, Circuito Exterior, Ciudad Universitaria, Coyoacán, Ciudad de México, 04360, México" amenity university 0.562409087444079 México FALSE
+cañales de la fuente mx Americas Central America FALSE 1 2021-02-03 130437167 way "Rió Chiquito, Morelia, Michoacán de Ocampo, 58010, México" waterway canal 0.35 México FALSE
+chiquita mx Americas Central America FALSE 1 2021-02-03 83170179 node "La Chiquita, Escárcega, Campeche, 24350, México" place village 0.375 México FALSE
+ciencia mx Americas Central America FALSE 1 2021-02-03 300995336 way "Ciencia, Industrial Cuamatla, Cuautitlán Izcalli, Estado de México, 54730, México" highway unclassified 0.2 México FALSE
+cimmyt mx Americas Central America FALSE 1 2021-02-03 185530203 way "CIMMyT, San Sebastian, Metepec, Estado de México, México" landuse farmland 0.3 México FALSE
+cincia mx Americas Central America FALSE 1 2021-02-03 300995336 way "Ciencia, Industrial Cuamatla, Cuautitlán Izcalli, Estado de México, 54730, México" highway unclassified 0.1 México FALSE
+cjs mx Americas Central America FALSE 1 2021-02-03 168991899 way "Aeropuerto Intl. Abraham González, Calle Mariposas, Fraccionamiento Paseos del Alba, Ciudad Juárez, Municipio de Juárez, Chihuahua, 32695, México" aeroway aerodrome 0.20962395537125 México FALSE
+el mercurio mx Americas Central America FALSE 1 2021-02-03 258592407 relation "Mercurio, Delegación Centro Histórico, Santiago de Querétaro, Municipio de Querétaro, Querétaro, 76040, México" boundary administrative 0.45 México FALSE
+ixtoc mx Americas Central America FALSE 1 2021-02-03 144903083 way "Ixtoc, Municipio de Zacatecas, Zacatecas, 98050, México" highway residential 0.2 México FALSE
+jumex mx Americas Central America FALSE 1 2021-02-03 256750870 way "Jumex, Salinas Victoria, Nuevo León, México" landuse industrial 0.3 México FALSE
+mexic mx Americas Central America FALSE 1 2021-02-03 257065613 relation México boundary administrative 0.839923932441765 México FALSE
+mexichem fluor mx Americas Central America FALSE 1 2021-02-03 83412633 node "Mexichem Flúor, S.A. de C.V., Avenida Minerales, FRACCIONAMIENTO PUENTE SOL, San Luis PotosÃ, Municipio de San Luis PotosÃ, San Luis PotosÃ, 78398, México" man_made works 0.101 México FALSE
+paranal mx Americas Central America FALSE 1 2021-02-03 64125022 node "El Paranal, Compostela, México" place village 0.375 México FALSE
+paseo de la reforma mx Americas Central America FALSE 1 2021-02-03 206203911 way "Paseo de la Reforma, Matamoros, Municipio de Matamoros, Tamaulipas, México" leisure park 0.55 México FALSE
+pds mx Americas Central America FALSE 1 2021-02-03 126696505 way "Aeropuerto Intl. de Piedras Negras, Libramiento Venustiano Carranza, Colonia Venustiano Carranza, Nava, Coahuila de Zaragoza, 26090, México" aeroway aerodrome 0.305439512435045 México FALSE
+pemex mx Americas Central America FALSE 1 2021-02-03 259232903 relation "PEMEX, Tierra Blanca, Veracruz de Ignacio de la Llave, 95180, México" boundary administrative 0.35 México FALSE
+petróleos mexicanos mx Americas Central America FALSE 1 2021-02-03 198944140 way "Petróleos Mexicanos, Encarnación de DÃaz, Jalisco, México" highway residential 0.3 México FALSE
+ucu mx Americas Central America FALSE 1 2021-02-03 258828316 relation "Ucú, Yucatán, 97357, México" boundary administrative 0.349448365439565 México FALSE
+ursus maritimus mx Americas Central America FALSE 1 2021-02-03 258279792 relation "Polar bear, Panoramica 1a. Sección, Guadalajara, Jalisco, México" landuse enclosure 0.2 México FALSE
+food and nutrition sciences mw Africa Eastern Africa FALSE 1 2021-02-03 163124289 way "Nutrition and Food Sciences Department, S125, Mitundu, Lilongwe, Central Region, Malawi" building school 0.401 Malawi FALSE
+malawi-liverpool-wellcome trust clinical research programme mw Africa Eastern Africa FALSE 1 2021-02-03 203971970 way "Malawi-Liverpool-Wellcome Trust Clinical Research Programme, Kenyatta Drive, Limbe, Blantyre, Southern Region, Malawi" building yes 0.701 Malawi FALSE
+national research programme mw Africa Eastern Africa FALSE 1 2021-02-03 203971970 way "Malawi-Liverpool-Wellcome Trust Clinical Research Programme, Kenyatta Drive, Limbe, Blantyre, Southern Region, Malawi" building yes 0.201 Malawi FALSE
+istc mt Europe Southern Europe FALSE 1 2021-02-03 103649213 way "ISTC, Hal Far, Birżebbuġa, Nofsinhar, BBG 2366, Malta" amenity school 0.101 Malta FALSE
+national museum of the archaeology mt Europe Southern Europe FALSE 1 2021-02-03 98624313 way "National Museum of Archaeology, Triq ir-Repubblika, Valletta, Xlokk, 1112, Malta" tourism museum 0.753955066068524 Malta FALSE
+unt mn Asia Eastern Asia FALSE 1 2021-02-03 15012021 node "Уньт, Хутаг-Өндөр, Булган, Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á °" place hamlet 0.25 Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° FALSE
+burma mm Asia South-Eastern Asia FALSE 1 2021-02-03 257686006 relation မြန်မာ boundary administrative 0.70160293453831 မြန်မာ FALSE
+japan japan mm Asia South-Eastern Asia FALSE 1 2021-02-03 52812179 node "Japan Japan, ပန်းဆá€á€¯á€¸á€<90>န်းလမ်း, ကျောက်á€<90>ံá€<90>ား, ရန်ကုန်, Western District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 11183, မြန်မာ" amenity restaurant 0.201 မြန်မာ FALSE
+khwe mm Asia South-Eastern Asia FALSE 1 2021-02-03 56327123 node "Ma Khwe, မá€á€¯á€¸á€™á€±á€¬á€€á€º, ဗန်းမော်á€<81>ရá€á€¯á€„်, ကá€<81>ျင်ပြည်နယ် (Kachin), မြန်မာ" place village 0.375 မြန်မာ FALSE
+meteorological office mm Asia South-Eastern Asia FALSE 1 2021-02-03 165525254 way "Meteorological Office, ကမ္ဘာအေးစေá€<90>ီလမ်း, မရမ်းကုန်း, Northern District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 11061, မြန်မာ" building yes 0.201 မြန်မာ FALSE
+petronas mm Asia South-Eastern Asia FALSE 1 2021-02-03 176840009 way "Petronas, ဗဟန်း, ရန်ကုန်, Western District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, မြန်မာ" landuse commercial 0.3 မြန်မာ FALSE
+suny college mm Asia South-Eastern Asia FALSE 1 2021-02-03 73203724 node "suny, 3, Chay-myit-pin, ပြင်ဦးလွင်, ပြင်ဦးလွင်á€<81>ရá€á€¯á€„်, ရှမ်းပြည်နယ်မြောက်ပá€á€¯á€„်း, မန္á€<90>လေးá€<90>á€á€¯á€„်း, 05082, မြန်မာ" shop car_repair 0.111 မြန်မာ FALSE
+united nation mm Asia South-Eastern Asia FALSE 1 2021-02-03 211221297 way "ကမ္ဘာ့ကုလသမဂ္ဂ United Nation, နá€<90>်မောက်လမ်း, á€<90>ာမွေ, ရန်ကုန်, Southern District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 00000, မြန်မာ" building yes 0.201 မြန်မာ FALSE
+fema ml Africa Western Africa FALSE 1 2021-02-03 20841052 node "Féma, Cercle d'Ansongo, Gao, Mali" place hamlet 0.25 Mali FALSE
+mpdl ml Africa Western Africa FALSE 1 2021-02-03 84054815 node "ONG Mouvement pour la Paix MPDL, Route secondaire kita liberté, Liberté Darsalam, Kita, Kayes, Mali" office ngo 0.101 Mali FALSE
+european university mk Europe Southern Europe FALSE 1 2021-02-03 99750914 way "ЕвропÑ<81>ки уиверзитет, 68, Булевар Климент ОхридÑ<81>ки, Капиштец, Центар, Скопје, Општина Центар, Град Скопје, СкопÑ<81>ки СР, 1000, Северна Македонија" building university 0.289139026272805 Северна Македонија FALSE
+macedonia mk Europe Southern Europe FALSE 1 2021-02-03 258289965 relation Северна Македонија boundary administrative 0.700106436214969 Северна Македонија FALSE
+methodius university mk Europe Southern Europe FALSE 1 2021-02-03 91653738 way "Универзитет „Св. Кирил и Методиј“, 9, Булевар Гоце Делчев, Маџир Маало, Центар, Скопје, Општина Центар, Град Скопје, СкопÑ<81>ки СР, 1000, Северна Македонија" amenity university 0.445726149027095 Северна Македонија FALSE
+sofia mg Africa Eastern Africa FALSE 1 2021-02-03 50765789 node "Sofia, Province de Mahajanga, Madagasikara" place state 0.65 Madagasikara FALSE
+university of antananarivo mg Africa Eastern Africa FALSE 1 2021-02-03 247271163 way "IT University, N 7, Andoharanofotsy, Antananarivo, Analamanga, Province d’Antananarivo, 102, Madagasikara" amenity university 0.301 Madagasikara FALSE
+brca me Europe Southern Europe FALSE 1 2021-02-03 259536883 relation "Brca, Opština Bar, Crna Gora / Црна Гора" boundary administrative 0.442480646342894 Crna Gora / Црна Гора FALSE
+strp me Europe Southern Europe FALSE 1 2021-02-03 6436011 node "Strp, Opština Kotor, 85338, Crna Gora / Црна Гора" place village 0.442954744060451 Crna Gora / Црна Гора FALSE
+university of montenegro me Europe Southern Europe FALSE 1 2021-02-03 300314506 way "Sportski i kulturni centar Univerziteta Crne Gore, 1, Studentska, Kruševac, Podgorica, Glavni grad Podgorica, 81000, Crna Gora / Црна Гора" office yes 0.001 Crna Gora / Црна Гора FALSE
+culture and research md Europe Eastern Europe FALSE 1 2021-02-03 76263818 node "Ministerul Educației, Culturii și Cercetării, 1, Piața Marea Adunare Națională, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2033, Moldova" office government 0.001 Moldova FALSE
+moldova md Europe Eastern Europe FALSE 1 2021-02-03 258078872 relation Moldova boundary administrative 0.810647543596845 Moldova FALSE
+moldova state university md Europe Eastern Europe FALSE 1 2021-02-03 96416496 way "Universitatea de Stat din Moldova, 60, Strada Alexei Mateevici, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2009, Moldova" amenity university 0.511834385728338 Moldova FALSE
+republic of moldova md Europe Eastern Europe FALSE 1 2021-02-03 258078872 relation Moldova boundary administrative 0.810647543596845 Moldova FALSE
+social democratic party md Europe Eastern Europe FALSE 1 2021-02-03 75621414 node "Partidul Social Democrat, Strada Ghioceilor, Buiucanii Vechi, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2008, Moldova" office political_party 0.101 Moldova FALSE
+technical university of moldova md Europe Eastern Europe FALSE 1 2021-02-03 259221802 relation "Universitatea Tehnică a Moldovei, Bulevardul Cuza-Vodă, Toamna de Aur, Chișinău, Sectorul Botanica, Municipiul Chișinău, 2032, Moldova" amenity university 0.412408728172101 Moldova FALSE
+transparency international md Europe Eastern Europe FALSE 1 2021-02-03 80688236 node "Transparency International, 98, Strada 31 August 1989, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2004, Moldova" office association 0.201 Moldova FALSE
+atlas ma Africa Northern Africa FALSE 1 2021-02-03 58180936 node "Atlas Mountains, Toubkal ⵜⵓⴱⵇⴰâµ<8d> توبقال, caïdat de’Ouzioua, cercle de Taliouine, Province de Taroudant ⵜⴰⵙⴳⴰ âµ<8f> ⵜⴰⵔⵓⴷⴰâµ<8f>ⵜ إقليم تارودانت, Souss-Massa ⵙⵓⵙⵙ-ⵎⴰⵙⵙⴰ سوس-ماسة, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" natural mountain_range 0.622636990621202 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+bureau of international cooperation ma Africa Northern Africa FALSE 1 2021-02-03 151396673 way "Bureau International de la Coopération Décentralisée - Figuig المكتب الدولي التعاون اللامركزي لمدينة Ù<81>كيك, Boulevard Hassan II شارع الØسن الثاني, Quartier Administratif الØÙŠ الإداري, Figuig ⵉⴼⵉⵢⵢⵉⵢ Ù<81>كيك, Pachalik de Figuig, Province de Figuig إقليم الناظور, Oriental ⵜⴰâµ<8f>ⴳⵎⵓⴹⵜ الشرقية, 61002, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" office ngo 0.201 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+institute pasteur ma Africa Northern Africa FALSE 1 2021-02-03 36249968 node "Institute Pasteur, Avenue Hadj Mohamed Tazi, Marshan مرشان, Tanger طنجة, arrondissement de Tanger-Medina طنجة المدينة, pachalik de Tanger طنجة, Préfecture de Tanger-Assilah عمالة طنجة-أصيلة, Tanger-Tétouan-Al Hoceima ⵟⴰâµ<8f>ⵊ-ⵟⵉⵜⴰⵡⵉâµ<8f>-âµ<8d>ⵃⵓⵙⵉⵎⴰ طنجة تطوان الØسيمة, 90005, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب" office educational_institution 0.201 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب FALSE
+environmental computer science ly Africa Northern Africa FALSE 1 2021-02-03 77766672 node "مراقبة Øماية البيئة من التلوث, طريق المنطقه الاولي, مدينة البريقة, الواØات, ليبيا" tourism artwork 0.001 ليبيا FALSE
+national library of science and technology ly Africa Northern Africa FALSE 1 2021-02-03 193077551 way "المكتبة الوطنية للعلوم والتقنية, طريق تاجوراء الوسط, طرابلس, سوق الجمعة, طرابلس, ليبيا" amenity library 0.001 ليبيا FALSE
+new hope fertility clinic ly Africa Northern Africa FALSE 1 2021-02-03 245123183 way "عيادة الامل للخصبة, شارع الخليج العربي, الØدائق, بنغازي, 10001, ليبيا" amenity hospital 0.001 ليبيا FALSE
+mie university lu Europe Western Europe FALSE 1 2021-02-03 229451045 way "Maison de l'Innovation, Avenue des Hauts-Fourneaux, Belval, Esch-sur-Alzette, Canton Esch-sur-Alzette, 4362, Lëtzebuerg" building yes 0.001 Lëtzebuerg FALSE
+university of luxembourg lu Europe Western Europe FALSE 1 2021-02-03 186892046 way "Université du Luxembourg - Campus Limpertsberg, Rue Frantz Clément, Limpertsberg, Luxembourg, Canton Luxembourg, 1913, Lëtzebuerg" amenity university 0.101 Lëtzebuerg FALSE
+skoda lt Europe Northern Europe FALSE 1 2021-02-03 258707357 relation "Skuodas, Skuodo miesto seniūnija, Skuodo rajono savivaldybė, Klaipėdos apskritis, Lietuva" boundary administrative 0.443410405267134 Lietuva FALSE
+vu university lt Europe Northern Europe FALSE 1 2021-02-03 259014111 relation "Vilniaus universitetas, Simono Daukanto aikÅ¡tÄ—, Senamiestis, SenamiesÄ<8d>io seniÅ«nija, Vilnius, Vilniaus miesto savivaldybÄ—, Vilniaus apskritis, Lietuva" amenity university 0.557377358917248 Lietuva FALSE
+appeal court ls Africa Southern Africa FALSE 1 2021-02-03 167262882 way "Appeal Court, Nightingale Road, White City, Maseru, Maseru District, 100, Lesotho" amenity courthouse 0.201 Lesotho FALSE
+maoa ls Africa Southern Africa FALSE 1 2021-02-03 175399852 way "Proposed Maoa-Mafubelu Community Council, Ha Mahala, Lithotaneng, Leribe District, Lesotho" landuse construction 0.3 Lesotho FALSE
+last mile health lr Africa Western Africa FALSE 1 2021-02-03 197374476 way "Last Mile Health, Dweh Street, Niao, Zone 5, Tchien, Grand Gedeh County, Liberia" office ngo 0.301 Liberia FALSE
+liber lr Africa Western Africa FALSE 1 2021-02-03 257865924 relation Liberia boundary administrative 0.76493857339783 Liberia FALSE
+people's party lr Africa Western Africa FALSE 1 2021-02-03 57756179 node "United People's Party Office, Baltimore Boulevard, Borworor Quarrer Community (E, Barwror Quarter, Gbarnga, Zone 3, Jorquelleh, Bong County, Liberia" office political_party 0.301 Liberia FALSE
+aaaaaa lk Asia Southern Asia FALSE 1 2021-02-03 177636879 way "aaaaaa, Kapithan Bandula Weerasingha Mawatha, Bendiyamulla, ගම්පහ, බස්නà·<8f>හිර පළà·<8f>à¶, 63.A.63, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" building residential 0.111 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+department of geography lk Asia Southern Asia FALSE 1 2021-02-03 147802012 way "Department of Geography, Wijerama Junction, Gangodawila South, Delkanda, බස්නà·<8f>හිර පළà·<8f>à¶, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" natural grassland 0.5 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+district general hospital lk Asia Southern Asia FALSE 1 2021-02-03 43623408 node "District General Hospital, Thalvupadu Mannar Road, Toddaveli, மனà¯<8d>னாரà¯<8d> மாவடà¯<8d>டமà¯<8d>, வட மாகாணமà¯<8d>, 41000, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity hospital 0.367710111330712 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+freedom party lk Asia Southern Asia FALSE 1 2021-02-03 212085481 way "Sri Lanka Freedom Party - Jaffna District, 4th Cross Street, Mixed Retail Residential, யாழà¯<8d>பà¯<8d>பாணமà¯<8d>, யாழà¯<8d>பà¯<8d>பாணமà¯<8d> மாவடà¯<8d>டமà¯<8d>, வட மாகாணமà¯<8d>, 7, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office political_party 0.201 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+hri lk Asia Southern Asia FALSE 1 2021-02-03 135662687 way "Mattala Rajapaksa International Airport, Airport Road, Maththala, හම්බන්à¶à·œà¶§ දිස්à¶à·Šâ€<8d>රික්කය, දකුණු පළà·<8f>à¶, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" aeroway aerodrome 0.326239076957718 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+individual house lk Asia Southern Asia FALSE 1 2021-02-03 199672414 way "Individual house, Village road, Pasyala, බස්නà·<8f>හිර පළà·<8f>à¶, 033, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" building house 0.201 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+itn lk Asia Southern Asia FALSE 1 2021-02-03 139273914 way "Independent Television Network – ITN, Wickramasinghe Pura Road, Jayawadanagama, Thalangama South, Thalawathugoda, බස්නà·<8f>හිර පළà·<8f>à¶, 10116, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity public_building 0.101 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+members of parliament lk Asia Southern Asia FALSE 1 2021-02-03 232939503 way "Parliament Members' Housing, Madiwela, à·<81>à·Šâ€<8d>රී ජයවර්ධනපුර කà·<9d>ට්ටේ, බස්නà·<8f>හිර පළà·<8f>à¶, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" landuse residential 0.4 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+national aquatic resources research and development agency lk Asia Southern Asia FALSE 1 2021-02-03 72133325 node "The National Aquatic Resources Research and Development Agency, Nara Road, Crow Island, Mattakkuliya, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00150, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" office Research_and_product_development 0.701 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+ucsc lk Asia Southern Asia FALSE 1 2021-02-03 183525981 way "UCSC, 35, Reid Avenue, Independace Squre, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" building yes 0.101 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+university of ruhuna lk Asia Southern Asia FALSE 1 2021-02-03 44083620 node "University Of Ruhuna, New Tangalle Road, මà·<8f>à¶à¶», Devinuwara, මà·<8f>à¶à¶» දිස්à¶à·Šâ€<8d>රික්කය, දකුණු පළà·<8f>à¶, 81160, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" amenity university 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+us national herbarium lk Asia Southern Asia FALSE 1 2021-02-03 138112413 way "National Herbarium, River Drive, Kendakaduwa, Eriyagama, මහනුවර දිස්à¶à·Šâ€<8d>රික්කය, මධ්â€<8d>යම පළà·<8f>à¶, 20400, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை" building yes 0.201 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை FALSE
+fountain medical development lc Americas Caribbean FALSE 1 2021-02-03 187420482 way "American International Medical University, Beausejour Main Road, Beausejour NHC Phase 2, Acacia Heights, Beausejour, Gros Islet, LCO1 101, Saint Lucia" amenity university 0.287641222780259 Saint Lucia FALSE
+global environment facility lc Americas Caribbean FALSE 1 2021-02-03 48669497 node "Global Environment Facility Small Grants Programmme United nations Development Programme (GEF SGP UNDP), Desir Avenue, L'anse Road, Sans Souci, Castries, 1487, Saint Lucia" office yes 0.301 Saint Lucia FALSE
+town lc Americas Caribbean FALSE 1 2021-02-03 70258427 node "Town, Soufriere, ST. LUCIA, Saint Lucia" place suburb 0.375 Saint Lucia FALSE
+american university of beirut lb Asia Western Asia FALSE 1 2021-02-03 95275637 way "الجامعة الأمريكية Ù<81>ÙŠ بيروت, شارع 76, الØمرا, الØمراء, رأس بيروت, بيروت, Ù…ØاÙ<81>ظة بيروت, 2033 9105, لبنان" amenity university 0.486153860067244 لبنان FALSE
+apec lb Asia Western Asia FALSE 1 2021-02-03 71190099 node "Apec, Old Souk Hasroun, Øصرون, قضاء بشرّي, Ù…ØاÙ<81>ظة الشمال, 1377, لبنان" amenity fuel 0.101 لبنان FALSE
+aapa la Asia South-Eastern Asia FALSE 1 2021-02-03 53572459 node "ຈິງ, ເມືàºàº‡àº<81>ະລຶມ, ເຊàº<81>àºàº‡, ປະເທດລາວ" place village 0.275 ປະເທດລາວ FALSE
+department of meteorology and hydrology la Asia South-Eastern Asia FALSE 1 2021-02-03 21008314 node "Department of Meteorology and Hydrology, Avenue Souphanouvong, ໜàºàº‡àº›àº²à»ƒàº™, ວຽງຈັນ, ສີໂຄດຕະບàºàº‡, ນະຄàºàº™àº«àº¼àº§àº‡àº§àº½àº‡àºˆàº±àº™, 6441, ປະເທດລາວ" building office 0.501 ປະເທດລາວ FALSE
+ministry of public security la Asia South-Eastern Asia FALSE 1 2021-02-03 200397894 way "Ministry of Public Security, Chemin Nongbone, ບ້ານàº<9d>າàº<8d>, ວຽງຈັນ, ເມືàºàº‡àºˆàº±àº™àº—ະບູລີ, ນະຄàºàº™àº«àº¼àº§àº‡àº§àº½àº‡àºˆàº±àº™, 01003, ປະເທດລາວ" amenity police 0.401 ປະເທດລາວ FALSE
+omb la Asia South-Eastern Asia FALSE 1 2021-02-03 54244449 node "ດູ່, ເມືàºàº‡àº®àº¸àº™, àºàº¸àº”ົມໄຊ, ປະເທດລາວ" place village 0.275 ປະເທດລາວ FALSE
+prison law office la Asia South-Eastern Asia FALSE 1 2021-02-03 252411118 way "ຄຸໄໃຫມ່ຄຸໄໃຫມ່, ຖະຫນົ່ນໄປຫາບ້ານເàº<81>ິນ, ເàº<81>ີນໃຕ້, ທຸລະຄົມ, ວຽງຈັນ, ປະເທດລາວ" amenity prison 0.001 ປະເທດລາວ FALSE
+mgh kz Asia Central Asia FALSE 1 2021-02-03 62523570 node "MGH, ПанфиловÑ<81>кий район, Ð<90>лматинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, ҚазақÑ<81>тан" mountain_pass yes 0.35 ҚазақÑ<81>тан FALSE
+republic of kazakhstan kz Asia Central Asia FALSE 1 2021-02-03 258456913 relation ҚазақÑ<81>тан boundary administrative 0.762519577338093 ҚазақÑ<81>тан FALSE
+chosun ilbo kr Asia Eastern Asia FALSE 1 2021-02-03 145965192 way "ì¡°ì„ ì<9d>¼ë³´ë¯¸ìˆ ê´€, 세종대로21길, 소공ë<8f>™, 중구, 서울, 04519, 대한민êµ" tourism gallery 0.441531223132585 ëŒ€í•œë¯¼êµ FALSE
+election commission kr Asia Eastern Asia FALSE 1 2021-02-03 229109140 way "세종특별ìž<90>치시 ì„ ê±°ê´€ë¦¬ìœ„ì›<90>회, 남세종로, 보람ë<8f>™, 세종, 30150, 대한민êµ" office government 0.001 ëŒ€í•œë¯¼êµ FALSE
+ewha womans university kr Asia Eastern Asia FALSE 1 2021-02-03 259075058 relation "ì<9d>´í™”ì—¬ìž<90>대학êµ<90>, 52, ì<9d>´í™”여대길, ì‹ ì´Œë<8f>™, 서대문구, 서울, 03760, 대한민êµ" amenity university 0.47254535964387 ëŒ€í•œë¯¼êµ FALSE
+gachon university kr Asia Eastern Asia FALSE 1 2021-02-03 69928613 node "가천대, 성남대로, ìˆ˜ì •êµ¬, 수진ë<8f>™, 13110, 대한민êµ" railway station 0.350501936383412 ëŒ€í•œë¯¼êµ FALSE
+gwangju institute of science and technology kr Asia Eastern Asia FALSE 1 2021-02-03 197084062 way "ê´‘ì£¼ê³¼í•™ê¸°ìˆ ì›<90>, 123, 첨단과기로, 광산구, 광주, 61005, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+hanaro kr Asia Eastern Asia FALSE 1 2021-02-03 117966939 way "하나로, 대ë<8f>™ë¦¬, 거창군, ê²½ìƒ<81>남ë<8f>„, 대한민êµ" landuse residential 0.2 ëŒ€í•œë¯¼êµ FALSE
+hanyang university kr Asia Eastern Asia FALSE 1 2021-02-03 66564765 node "한양대, 206, 왕ì‹ë¦¬ë¡œ, 사근ë<8f>™, 성ë<8f>™êµ¬, 서울, 04763, 대한민êµ" railway station 0.370185956704757 ëŒ€í•œë¯¼êµ FALSE
+institute for environment and health kr Asia Eastern Asia FALSE 1 2021-02-03 229907799 way "세종시보건환경연구ì›<90>, 12, ì„œë¶<81>부2ë¡œ, 조치ì›<90>ì„œë¶<81>부지구 (본 지구는 ì˜ˆì •/공사 중ì<9d>´ë¯€ë¡œ 변경ë<90> 수 있ì<9d>Œ), 조치ì›<90>ì<9d><8d>, 세종, 30015, 대한민êµ" office government 0.001 ëŒ€í•œë¯¼êµ FALSE
+jeju national university kr Asia Eastern Asia FALSE 1 2021-02-03 11306936 node "ì œì£¼êµ<90>대, ì<9d>¼ì£¼ë<8f>™ë¡œ, ê±´ìž…ë<8f>™, ì œì£¼ì‹œ, 63293, 대한민êµ" junction yes 0.001 ëŒ€í•œë¯¼êµ FALSE
+kookmin university kr Asia Eastern Asia FALSE 1 2021-02-03 129642584 way "êµë¯¼ëŒ€í•™êµ<90>, ë³´êµë¬¸ë¡œ29길, ì •ë¦‰3ë<8f>™, 성ë¶<81>구, 서울, 02707, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+korea atomic energy research institute kr Asia Eastern Asia FALSE 1 2021-02-03 238115633 way "í•œêµì›<90>ìž<90>ë ¥ì—°êµ¬ì›<90>, ì‹ ì„±ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 대한민êµ" landuse military 0.2 ëŒ€í•œë¯¼êµ FALSE
+korea development institute kr Asia Eastern Asia FALSE 1 2021-02-03 72869447 node "ë¶<81>한개발연구소, 28, í<9d>¬ìš°ì •ë¡œ5길, í•©ì •ë<8f>™, 마í<8f>¬êµ¬, 서울, ì˜¤ì •êµ¬, 04019, 대한민êµ" office research 0.001 ëŒ€í•œë¯¼êµ FALSE
+korea institute of nuclear safety kr Asia Eastern Asia FALSE 1 2021-02-03 198459956 way "í•œêµì›<90>ìž<90>ë ¥ì•ˆì „ê¸°ìˆ ì›<90>, 온천ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 대한민êµ" landuse commercial 0.2 ëŒ€í•œë¯¼êµ FALSE
+korea institute of ocean science and technology kr Asia Eastern Asia FALSE 1 2021-02-03 175306429 way "í•œêµí•´ì–‘ê³¼í•™ê¸°ìˆ ì›<90>, ìƒ<81>ë¡<9d>구, 안산시, 경기ë<8f>„, 대한민êµ" landuse industrial 0.2 ëŒ€í•œë¯¼êµ FALSE
+kyungpook national university kr Asia Eastern Asia FALSE 1 2021-02-03 145552795 way "êµë¦½ê²½ë¶<81>대학êµ<90>, 대현로9길, 대현ë<8f>™, ë¶<81>구, 대구, 41573, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+ls cable kr Asia Eastern Asia FALSE 1 2021-02-03 207764001 way "LSì „ì„ ì‚¬ì›<90>아파트, ì‹ í<8f>‰ë<8f>™, 구미시, ê²½ìƒ<81>ë¶<81>ë<8f>„, 대한민êµ" landuse residential 0.3 ëŒ€í•œë¯¼êµ FALSE
+ministry of oceans and fisheries kr Asia Eastern Asia FALSE 1 2021-02-03 53551582 node "해양수산부(5ë<8f>™), 94, 다솜2ë¡œ, 어진ë<8f>™, ë<8f>„ë‹´ë<8f>™, 세종, 30110, 대한민êµ" office government 0.001 ëŒ€í•œë¯¼êµ FALSE
+postech kr Asia Eastern Asia FALSE 1 2021-02-03 259443543 relation "í<8f>¬í•ê³µê³¼ëŒ€í•™êµ<90>, 77, ì²ì•”ë¡œ, 효곡ë<8f>™, 남구, í<8f>¬í•ì‹œ, ê²½ìƒ<81>ë¶<81>ë<8f>„, 37673, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+pusan national university in busan kr Asia Eastern Asia FALSE 1 2021-02-03 196919997 way "부산대학êµ<90>, 금강로335번길, ìž¥ì „1ë<8f>™, ìž¥ì „ë<8f>™, ê¸ˆì •êµ¬, 부산, 46282, 대한민êµ" amenity university 0.439740442442793 ëŒ€í•œë¯¼êµ FALSE
+sbs kr Asia Eastern Asia FALSE 1 2021-02-03 61070534 node "SBS, 161, 목ë<8f>™ì„œë¡œ, 목1ë<8f>™, 양천구, 서울, ì˜¤ì •êµ¬, 08006, 대한민êµ" amenity studio 0.692747798796741 ëŒ€í•œë¯¼êµ FALSE
+seoul national university of science and technology kr Asia Eastern Asia FALSE 1 2021-02-03 178768152 way "ì„œìš¸ê³¼í•™ê¸°ìˆ ëŒ€í•™êµ<90>, ë…¸ì›<90>ë¡œ, 공릉2ë<8f>™, 서울, 01816, 대한민êµ" amenity university 0.375700293936422 ëŒ€í•œë¯¼êµ FALSE
+sungkyunkwan kr Asia Eastern Asia FALSE 1 2021-02-03 107069637 way "ì„±ê· ê´€ëŒ€í•™êµ<90> ì<9d>¸ë¬¸ì‚¬íšŒê³¼í•™ìº í<8d>¼ìŠ¤, 25-2, ì„±ê· ê´€ë¡œ, 혜화ë<8f>™, 종로구, 명륜1ê°€, 서울, 03063, 대한민êµ" amenity university 0.483507677970318 ëŒ€í•œë¯¼êµ FALSE
+university of ulsan college of medicine kr Asia Eastern Asia FALSE 1 2021-02-03 200588646 way "울산대학êµ<90> ì<9d>˜ê³¼ëŒ€í•™, 88, 올림픽로43길, Pungnap 2(i)-dong, 송파구, 서울, 05505, 대한민êµ" amenity university 0.001 ëŒ€í•œë¯¼êµ FALSE
+kim chaek university of technology kp Asia Eastern Asia FALSE 1 2021-02-03 117123664 way "김책공업종합대학, ì˜<81>광거리, 중구ì—, 외성ë<8f>™, í<8f>‰ì–‘ì‹œ, ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ" amenity university 0.340053860433783 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ FALSE
+kim il-sung university kp Asia Eastern Asia FALSE 1 2021-02-03 258684511 relation "ê¹€ì<9d>¼ì„±ì¢…합대학, ë ¤ëª…ê±°ë¦¬, 대성구ì—, í<8f>‰ì–‘, í<8f>‰ì–‘ì‹œ, ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ" amenity university 0.42474743961288 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ FALSE
+pyongyang university of science and technology kp Asia Eastern Asia FALSE 1 2021-02-03 45781187 node "í<8f>‰ì–‘ê³¼í•™ê¸°ìˆ ëŒ€í•™, AH1, ë<9d>½ëž‘구ì—, í<8f>‰ì–‘, í<8f>‰ì–‘ì‹œ, ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ" amenity university 0.292441551930616 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ FALSE
+university of the west indies kn Americas Caribbean FALSE 1 2021-02-03 207615978 way "University Of The West Indies, Horsfords Road, Irish Town, Port Zante, Basseterre, Saint George Basseterre, Saint Kitts, 07162, Saint Kitts and Nevis" amenity university 0.501 Saint Kitts and Nevis FALSE
+central pacific ki Oceania Micronesia FALSE 1 2021-02-03 195202169 way "Central Pacific, Main Road, Nawerewere, Tarawa Te Inainano, Kiribati" shop seafood 0.201 Kiribati FALSE
+cdri kh Asia South-Eastern Asia FALSE 1 2021-02-03 53298902 node "CDRI, ផ្លូវ ៣១៥, សង្កាáž<8f>់បឹងកក់ទី ២, áž<81>ណ្ឌទួលគោក, រាជធានីភ្នំពáŸ<81>ញ, 120408, ព្រះរាជាណាចក្រ​កម្ពុជា" office educational_institution 0.101 ព្រះរាជាណាចក្រ​កម្ពុជា FALSE
+morakot kh Asia South-Eastern Asia FALSE 1 2021-02-03 150353783 way "កោះពស់, ក្រុងព្រះសីហនុ, áž<81>áŸ<81>áž<8f>្áž<8f>ព្រះសីហនុ, ព្រះរាជាណាចក្រ​កម្ពុជា" place island 0.325 ព្រះរាជាណាចក្រ​កម្ពុជា FALSE
+public prosecutor's office kg Asia Central Asia FALSE 1 2021-02-03 104759616 way "Прокуратура, Бишкек, КыргызÑ<81>тан" landuse construction 0.2 КыргызÑ<81>тан FALSE
+angelina jolie ke Africa Eastern Africa FALSE 1 2021-02-03 185368038 way "Angelina Jolie Primary School, E1351, Turkana, Kenya" amenity school 0.201 Kenya FALSE
+glaxosmithkline ke Africa Eastern Africa FALSE 1 2021-02-03 256812958 way "Glaxo Smithkline, Mbotela, Central Business District, Nairobi, Kenya" landuse industrial 0.4 Kenya FALSE
+international centre of insect physiology and ecology ke Africa Eastern Africa FALSE 1 2021-02-03 193624949 way "International Centre of Insect Physiology and Ecology (ICIPE) Field Station, Ukunda-Ramisi Road, Kona Ya Chale, Kwale, Coastal Kenya, 80400, Kenya" building industrial 0.701 Kenya FALSE
+international livestock research institute ke Africa Eastern Africa FALSE 1 2021-02-03 154926034 way "International Livestock Research Institute, C61, Nairobi, P.O. BOX 30709, Kenya" office educational_institution 0.401 Kenya FALSE
+kenya wildlife service ke Africa Eastern Africa FALSE 1 2021-02-03 168205921 way "Kenya Wildlife Service, Kisumu, Nyanza, Kenya" landuse commercial 0.5 Kenya FALSE
+mount kenya safari club ke Africa Eastern Africa FALSE 1 2021-02-03 15683008 node "Mount Kenya Safari Club, D488, Nyeri, Central Kenya, 10400, Kenya" tourism hotel 0.401 Kenya FALSE
+sino-africa joint research centre ke Africa Eastern Africa FALSE 1 2021-02-03 177716862 way "Sino-Africa Joint Research Centre, Juja, Kiambu, Central Kenya, Kenya" landuse construction 0.7 Kenya FALSE
+university of nairobi ke Africa Eastern Africa FALSE 1 2021-02-03 66537019 node "University of Nairobi(Kabete Campus), Kapenguria Road, Nairobi, P.O. BOX 30709, Kenya" amenity university 0.301 Kenya FALSE
+us court of appeals ke Africa Eastern Africa FALSE 1 2021-02-03 116083341 way "Court of Appeals, Fort Jesus Road, Mombasa, Coastal Kenya, 80100, Kenya" amenity courthouse 0.401 Kenya FALSE
+verity ke Africa Eastern Africa FALSE 1 2021-02-03 163539434 way "Verity, Nyeri, Central Kenya, 10100, Kenya" highway residential 0.2 Kenya FALSE
+world agroforestry centre ke Africa Eastern Africa FALSE 1 2021-02-03 259495866 relation "World Agroforestry Center, ICRAF Road, Gigiri, Nairobi, 00800, Kenya" building yes 0.512795139465266 Kenya FALSE
+advanced science institute jp Asia Eastern Asia FALSE 1 2021-02-03 180150166 way "産æ¥æŠ€è¡“ç·<8f>å<90>ˆç ”究所;西事æ¥æ‰€, å¦åœ’西大通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0061, 日本" amenity research_institute 0.42962282009393 日本 FALSE
+aerospace exploration agency jp Asia Eastern Asia FALSE 1 2021-02-03 104684391 way "å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本" amenity research_institute 0.534103782224402 日本 FALSE
+aga jp Asia Eastern Asia FALSE 1 2021-02-03 258597957 relation "阿賀町, æ<9d>±è’²åŽŸéƒ¡, 新潟県, 日本" boundary administrative 0.438650451987068 日本 FALSE
+atomic energy agency jp Asia Eastern Asia FALSE 1 2021-02-03 220860551 way "Japan Atomic Energy Agency, 765-1, ã<81>¯ã<81>ªã<81>¿ã<81>šã<81><8d>通り, æ<9d>±æµ·æ<9d>‘, é‚£ç<8f>‚郡, 茨城県, 319-1184, 日本" building yes 0.301 日本 FALSE
+azabu university jp Asia Eastern Asia FALSE 1 2021-02-03 129610650 way "麻布大å¦, 矢部ã<81>µã‚Œã<81>‚ã<81>„地下é<81>“, ä¸å¤®åŒº, 相模原市, 神奈å·<9d>県, 229-0032, 日本" amenity university 0.415142283922981 日本 FALSE
+bandai jp Asia Eastern Asia FALSE 1 2021-02-03 258916292 relation "ç£<90>梯町, 耶麻郡, ç¦<8f>島県, 969-3301, 日本" boundary administrative 0.408093117536752 日本 FALSE
+carbon institute jp Asia Eastern Asia FALSE 1 2021-02-03 144485403 way "カーボンニュートラル・エãƒ<8d>ãƒ«ã‚®ãƒ¼å›½éš›ç ”ç©¶æ‰€ 第1ç ”ç©¶æ£Ÿ, 桜井太郎丸線, 西区, ç¦<8f>岡市, ç¦<8f>岡県, 819-0382, 日本" building university 0.001 日本 FALSE
+center for materials science jp Asia Eastern Asia FALSE 1 2021-02-03 140270004 way "ナノマテリアルテクノãƒã‚¸ãƒ¼ã‚»ãƒ³ã‚¿ãƒ¼ (Center for Nano Materials and Technology), 石å·<9d>県é<81>“55å<8f>·å°<8f>æ<9d>¾è¾°å<8f>£ç·š, æ—å<8f>°, 能美市, 石å·<9d>県, 923-1206, 日本" building university 0.301 日本 FALSE
+chiba institute of technology jp Asia Eastern Asia FALSE 1 2021-02-03 104275451 way "å<8d>ƒè‘‰å·¥æ¥å¤§å¦, ã<81>¾ã‚<8d>ã<81>«ã<81>ˆé€šã‚Š, 津田沼2, 習志野市, å<8d>ƒè‘‰çœŒ, 274-0825, 日本" amenity university 0.442477975994532 日本 FALSE
+chiba university jp Asia Eastern Asia FALSE 1 2021-02-03 133433420 way "å<8d>ƒè‘‰å¤§å¦, 文教通り, æ<9d>¾æ³¢2, 緑町1, 稲毛区, å<8d>ƒè‘‰å¸‚, å<8d>ƒè‘‰çœŒ, 2600033, 日本" amenity university 0.495611571950763 日本 FALSE
+chuo university jp Asia Eastern Asia FALSE 1 2021-02-03 218424118 way "ä¸å¤®å¤§å¦, 多摩モノレール通り, 八王å<90>市, æ<9d>±äº¬éƒ½, 191-8506, 日本" amenity university 0.540197762731253 日本 FALSE
+cooperative research center jp Asia Eastern Asia FALSE 1 2021-02-03 207174922 way "百周年記念館(産å¦é€£æ<90>ºæŽ¨é€²æ©Ÿæ§‹ï¼‰, 秋田八郎潟線, 手形山崎町, 秋田市, 秋田県, 010-0864, 日本" building university 0.001 日本 FALSE
+council for science and technology jp Asia Eastern Asia FALSE 1 2021-02-03 14641777 node "ç·<8f>å<90>ˆç§‘å¦æŠ€è¡“会è°, å…本木通り, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.001 日本 FALSE
+denka jp Asia Eastern Asia FALSE 1 2021-02-03 216092175 way "Denka, 糸éšå·<9d>市, 新潟県, 日本" landuse industrial 0.3 日本 FALSE
+department of internal medicine jp Asia Eastern Asia FALSE 1 2021-02-03 302545893 way "å°<8f>å<9d>‚内科クリニック, 11, å°<8f>立野通り 金沢湯涌ç¦<8f>光線, å®<9d>町, 金沢市, 石å·<9d>県, 920-8638, 日本" amenity doctors 0.001 日本 FALSE
+department of physiology jp Asia Eastern Asia FALSE 1 2021-02-03 50185221 node "Department of Physiology, Wakayama Medical University School of Medicine, ä¸å¤®é€šã‚Š, å’ŒæŒå±±å¸‚, å’ŒæŒå±±çœŒ, 640-8511, 日本" amenity school 0.301 日本 FALSE
+doi jp Asia Eastern Asia FALSE 1 2021-02-03 48804686 node "土居, 平野守å<8f>£ç·š, 大æž<9d>西町, é¦¬å ´ç”ºä¸‰ä¸<81>ç›®, 守å<8f>£å¸‚, 大阪府, 570-0038, 日本" railway station 0.338296402069185 日本 FALSE
+fisheries agency jp Asia Eastern Asia FALSE 1 2021-02-03 14700372 node "水産åº<81>, 霞ケ関, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.001 日本 FALSE
+goto jp Asia Eastern Asia FALSE 1 2021-02-03 258571934 relation "五島市, 長崎県, 日本" boundary administrative 0.430996300874427 日本 FALSE
+hirosaki university jp Asia Eastern Asia FALSE 1 2021-02-03 173133861 way "弘å‰<8d>大å¦, 石å·<9d>土手町線, 富田3, 富野町, 弘å‰<8d>市, é<9d>’森県, 036-8186, 日本" amenity university 0.444601849346538 日本 FALSE
+idex jp Asia Eastern Asia FALSE 1 2021-02-03 158633198 way "Cosmo, 二ä¸é€šã‚Š, 高麗町, 鹿å…<90>島市, 鹿å…<90>島県, 892-8677, 日本" amenity fuel 0.001 日本 FALSE
+ito jp Asia Eastern Asia FALSE 1 2021-02-03 258663212 relation "伊æ<9d>±å¸‚, é<9d>™å²¡çœŒ, 日本" boundary administrative 0.460897541165665 日本 FALSE
+itochu jp Asia Eastern Asia FALSE 1 2021-02-03 164136286 way "ITOCHU, ã<81>¾ã‚<81>ã<81> 大通り;金沢田鶴浜線, 広岡1, 広岡, 金沢市, 石å·<9d>県, 920-0031, 日本" building yes 0.101 日本 FALSE
+jamstec jp Asia Eastern Asia FALSE 1 2021-02-03 15031015 node "æµ·æ´‹ç ”ç©¶é–‹ç™ºæ©Ÿæ§‹, テストコース(GRANDRIVE), æ¨ªé ˆè³€å¸‚, 神奈å·<9d>県, 238-8550, 日本" amenity public_building 0.001 日本 FALSE
+japan aerospace and exploration agency jp Asia Eastern Asia FALSE 1 2021-02-03 104684391 way "å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本" amenity research_institute 0.534103782224402 日本 FALSE
+japan patent office jp Asia Eastern Asia FALSE 1 2021-02-03 15012020 node "特許åº<81>, 3, å¤–å €é€šã‚Š, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8915, 日本" office government 0.412830331815194 日本 FALSE
+japanese communist party jp Asia Eastern Asia FALSE 1 2021-02-03 26533301 node "日本共産党ä¸å¤®å§”員会, 7, 明治通り, å<8d>ƒé§„ヶ谷四ä¸<81>ç›®, 渋谷区, æ<9d>±äº¬éƒ½, 151-8586, 日本" office political_party 0.001 日本 FALSE
+juntendo university jp Asia Eastern Asia FALSE 1 2021-02-03 126277004 way "é †å¤©å ‚å¤§å¦ï¼ˆåŒ»å¦éƒ¨ï¼‰, æ²¹å<9d>‚, 本郷二ä¸<81>ç›®, 文京区, æ<9d>±äº¬éƒ½, 113-8431, 日本" amenity university 0.001 日本 FALSE
+kawasaki jp Asia Eastern Asia FALSE 1 2021-02-03 258763819 relation "å·<9d>崎市, 神奈å·<9d>県, 日本" boundary administrative 0.579153673816489 日本 FALSE
+keio jp Asia Eastern Asia FALSE 1 2021-02-03 226108428 way "Keio Line, 国際通り, 西新宿一ä¸<81>ç›®, 新宿区, æ<9d>±äº¬éƒ½, 160-0023, 日本" shop mall 0.101 日本 FALSE
+kurume university jp Asia Eastern Asia FALSE 1 2021-02-03 173775202 way "久留米大å¦ï¼ˆåŒ»å¦éƒ¨ï¼‰, 県é<81>“17å<8f>·åŒ»å¤§é€šã‚Š, 城å<8d>—町, 久留米市, ç¦<8f>岡県, 830-0011, 日本" amenity university 0.446874063573656 日本 FALSE
+laboratory of radioisotope complex jp Asia Eastern Asia FALSE 1 2021-02-03 111776378 way "R.I ç·<8f>å<90>ˆ 実験室, ã‚„ã<81>™ã‚‰ã<81>Žã<81>®é<81>“, 北å°<8f>路町, 内ä¾<8d>原町, 奈良市, 奈良県, 6308271, 日本" building university 0.001 日本 FALSE
+mathematical society jp Asia Eastern Asia FALSE 1 2021-02-03 64702547 node "日本数å¦ä¼š, 8, 蔵å‰<8d>橋通り, å<8f>°æ<9d>±äºŒä¸<81>ç›®, å<8f>°æ<9d>±åŒº, æ<9d>±äº¬éƒ½, 110-0006, 日本" office association 0.001 日本 FALSE
+meijo university jp Asia Eastern Asia FALSE 1 2021-02-03 128174721 way "å<90><8d>城大å¦, 飯田街é<81>“, 天白区, å<90><8d>å<8f>¤å±‹å¸‚, 愛知県, 468-8503, 日本" amenity university 0.445726149027095 日本 FALSE
+merck & company jp Asia Eastern Asia FALSE 1 2021-02-03 218371594 way "Merck, ã<81>„ã‚<8f>ã<81><8d>市, ç¦<8f>島県, 日本" landuse industrial 0.3 日本 FALSE
+meteorological agency jp Asia Eastern Asia FALSE 1 2021-02-03 258888416 relation "気象åº<81>, å†…å €é€šã‚Š, 大手町1, 大手町, 神田, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0004, 日本" building public 0.528920419784088 日本 FALSE
+mext jp Asia Eastern Asia FALSE 1 2021-02-03 50358605 node "文部科å¦çœ<81>, 桜田通り, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" office government 0.541445598310702 日本 FALSE
+ministry of foreign affairs jp Asia Eastern Asia FALSE 1 2021-02-03 14859293 node "外務çœ<81>, 霞ヶ関å<9d>‚, 霞ヶ関2, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.545769418466942 日本 FALSE
+ministry of the environment jp Asia Eastern Asia FALSE 1 2021-02-03 123742322 way "環境çœ<81>, ç¥<9d>田通り, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" amenity public_building 0.508986391392961 日本 FALSE
+monju jp Asia Eastern Asia FALSE 1 2021-02-03 164574010 way "ã‚‚ã‚“ã<81>˜ã‚…, 宮津養父線, å—æ<9d>‰æœ«, 宮津市, 京都府, 626-0001, 日本" building transportation 0.322405775434826 日本 FALSE
+nara jp Asia Eastern Asia FALSE 1 2021-02-03 258244510 relation "奈良県, 日本" boundary administrative 0.611235608420169 日本 FALSE
+national aerospace laboratory jp Asia Eastern Asia FALSE 1 2021-02-03 788177 node "èˆªç©ºå®‡å®™æŠ€è¡“ç ”ç©¶æ‰€, 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 181-8555, 日本" highway traffic_signals 0.001 日本 FALSE
+national cerebral and cardiovascular center jp Asia Eastern Asia FALSE 1 2021-02-03 196010585 way "å›½ç«‹å¾ªç’°å™¨ç—…ç ”ç©¶ã‚»ãƒ³ã‚¿ãƒ¼, 1, 豊ä¸å²¸éƒ¨ç·š, 岸部新町, å<90>¹ç”°å¸‚, 大阪府, 564-8565, 日本" amenity hospital 0.001 日本 FALSE
+national council for science and technology jp Asia Eastern Asia FALSE 1 2021-02-03 14641777 node "ç·<8f>å<90>ˆç§‘å¦æŠ€è¡“会è°, å…本木通り, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.001 日本 FALSE
+national institute for environmental studies jp Asia Eastern Asia FALSE 1 2021-02-03 118729145 way "å›½ç«‹ç’°å¢ƒç ”ç©¶æ‰€, å¦åœ’西大通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0053, 日本" amenity research_institute 0.385200970199076 日本 FALSE
+national institute for materials science jp Asia Eastern Asia FALSE 1 2021-02-03 118354285 way "物質・æ<9d><90>æ–™ç ”ç©¶æ©Ÿæ§‹, 1, ã<81>¤ã<81><8f>ã<81>°å…¬åœ’通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0047, 日本" office research 0.367391061753173 日本 FALSE
+national institute for materials science in tsukuba jp Asia Eastern Asia FALSE 1 2021-02-03 118354285 way "物質・æ<9d><90>æ–™ç ”ç©¶æ©Ÿæ§‹, 1, ã<81>¤ã<81><8f>ã<81>°å…¬åœ’通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0047, 日本" office research 0.367391061753173 日本 FALSE
+national science and technology library jp Asia Eastern Asia FALSE 1 2021-02-03 130023176 way "ç<90>†ç³»å›³æ›¸é¤¨, ä¹<9d>大ゲートブリッジ, 西区, ç¦<8f>岡市, ç¦<8f>岡県, 819−0395, 日本" amenity library 0.001 日本 FALSE
+nature astronomy jp Asia Eastern Asia FALSE 1 2021-02-03 183168113 way "ã<81>¡ã<81>¯ã‚„星ã<81>¨è‡ªç„¶ã<81>®ãƒŸãƒ¥ãƒ¼ã‚¸ã‚¢ãƒ , 金剛山é<81>Šæ©é<81>“, å<8d>ƒæ—©èµ¤é˜ªæ<9d>‘, å<8d>—河内郡, 大阪府, 5850051, 日本" tourism museum 0.001 日本 FALSE
+nect jp Asia Eastern Asia FALSE 1 2021-02-03 79692993 node "salon Lie-nect, 上尾白岡線, 伊奈町, 北足立郡, 埼玉県, 362-0806, 日本" shop hairdresser 0.101 日本 FALSE
+nihon jp Asia Eastern Asia FALSE 1 2021-02-03 258446007 relation 日本 boundary administrative 0.871013326546246 日本 FALSE
+npc jp Asia Eastern Asia FALSE 1 2021-02-03 216467228 way "NPC, æ<9d>±æ<9d>¾å±±å<81>œè»Šå ´ç·š, ç®å¼“町1, æ<9d>±æ<9d>¾å±±å¸‚, 埼玉県, 355-0014, 日本" amenity parking 0.101 日本 FALSE
+nuclear regulation authority jp Asia Eastern Asia FALSE 1 2021-02-03 51874808 node "原å<90>力è¦<8f>制委員会, 9, 御組å<9d>‚, å…本木一ä¸<81>ç›®, å…本木, 麻布, 港区, æ<9d>±äº¬éƒ½, 106-8487, 日本" office government 0.001 日本 FALSE
+nuclear safety commission jp Asia Eastern Asia FALSE 1 2021-02-03 14941318 node "原å<90>力安全委員会, 三年å<9d>‚, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" building public 0.001 日本 FALSE
+obama white house jp Asia Eastern Asia FALSE 1 2021-02-03 258672713 relation "å°<8f>浜市, ç¦<8f>井県, 日本" boundary administrative 0.449107677186954 日本 FALSE
+oita university jp Asia Eastern Asia FALSE 1 2021-02-03 120859745 way "大分大å¦æ—¦é‡ŽåŽŸã‚ャンパス, 国é<81>“10å<8f>·, 大分市, 大分県, 870-0854, 日本" amenity university 0.001 日本 FALSE
+osaka city university jp Asia Eastern Asia FALSE 1 2021-02-03 22182825 node "市立大å¦å‰<8d>, Mediacenter, ä½<8f>å<90>‰åŒº, 大阪市, 大阪府, 558-0022, 日本" highway bus_stop 0.001 日本 FALSE
+red cross hospital jp Asia Eastern Asia FALSE 1 2021-02-03 45442138 node "赤å<8d><81>å—病院å‰<8d>, æ<9d>¾å±±å¸‚é<81>“ 鮒屋町è·å›½ç¥žç¤¾å‰<8d>ç·š, 平和通一ä¸<81>ç›®, 西一万町, æ<9d>¾å±±å¸‚, 愛媛県, 790-0825, 日本" railway tram_stop 0.267719150556049 日本 FALSE
+riken brain institute jp Asia Eastern Asia FALSE 1 2021-02-03 151778643 way "脳科å¦ç·<8f>å<90>ˆç ”究センター æ<9d>±æ£Ÿ, 新座ãƒ<90>イパス, 和光市, 埼玉県, 351-0106, 日本" building yes 0.001 日本 FALSE
+saitama university jp Asia Eastern Asia FALSE 1 2021-02-03 139990167 way "埼玉大å¦, ã<81>•ã<81>„ã<81>Ÿã<81>¾é´»å·£ç·š, 桜区, ã<81>•ã<81>„ã<81>Ÿã<81>¾å¸‚, 埼玉県, 338-0835, 日本" amenity university 0.001 日本 FALSE
+sakurada jp Asia Eastern Asia FALSE 1 2021-02-03 123818427 way "桜田門, å†…å €é€šã‚Š, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本" historic city_gate 0.29350420583069 日本 FALSE
+sapporo medical university jp Asia Eastern Asia FALSE 1 2021-02-03 129721276 way "æœå¹ŒåŒ»ç§‘大å¦, ç¦<8f>ä½<8f>桑園通, å<8d>—1æ<9d>¡è¥¿9, ä¸å¤®åŒº, æœå¹Œå¸‚, 石狩振興局, 北海é<81>“, 060-8556, 日本" amenity university 0.406681943714513 日本 FALSE
+sdo jp Asia Eastern Asia FALSE 1 2021-02-03 108898337 way "ä½<90>渡空港, 両津広域農é<81>“, 秋津, ä½<90>渡市, 新潟県, 952-0006, 日本" aeroway aerodrome 0.40710035943812 日本 FALSE
+shen neng jp Asia Eastern Asia FALSE 1 2021-02-03 83114350 node "神能,輪æ¥, 日高å·<9d>島線, å<9d>‚戸市, 埼玉県, 350-2222, 日本" shop bicycle 0.001 日本 FALSE
+shinshu university jp Asia Eastern Asia FALSE 1 2021-02-03 58242149 node "Shinshu University, 国é<81>“292å<8f>·, å¹³ç©<8f>, 山ノ内町, 下高井郡, 長野県, 381-0401, 日本" highway bus_stop 0.201 日本 FALSE
+tamagawa jp Asia Eastern Asia FALSE 1 2021-02-03 258585111 relation "多摩å·<9d>, 神奈å·<9d>県, 198-0212, 日本" waterway river 0.450854461294197 日本 FALSE
+tokai university in hiratsuka jp Asia Eastern Asia FALSE 1 2021-02-03 104165416 way "æ<9d>±æµ·å¤§å¦ 湘å<8d>—ã‚ャンパス, 1, 北門通り, 平塚市, 神奈å·<9d>県, 259-1292, 日本" amenity university 0.001 日本 FALSE
+tokushima university jp Asia Eastern Asia FALSE 1 2021-02-03 37840846 node "大å¦å‰<8d>, å<90>‰é‡Žå·<9d>ãƒ<90>イパス, 徳島市, 徳島県, 770-8571, 日本" highway bus_stop 0.001 日本 FALSE
+tokyo electric power company jp Asia Eastern Asia FALSE 1 2021-02-03 121819030 way "æ<9d>±äº¬é›»åŠ›æ¸‹è°·æ”¯ç¤¾, ファイアー通り, 神å<8d>—一ä¸<81>ç›®, 渋谷区, æ<9d>±äº¬éƒ½, 150-8334, 日本" building yes 0.001 日本 FALSE
+tokyo metropolitan assembly jp Asia Eastern Asia FALSE 1 2021-02-03 940456 node "è°äº‹å ‚å<8d>—, å<8d>—通り, 西新宿二ä¸<81>ç›®, 新宿区, æ<9d>±äº¬éƒ½, 163-8001, 日本" highway traffic_signals 0.001 日本 FALSE
+tokyo university of agriculture jp Asia Eastern Asia FALSE 1 2021-02-03 104451530 way "æ<9d>±äº¬è¾²æ¥å¤§å¦, å<8d>ƒæ³é€šã‚Š, çµŒå ‚4, 船橋, 世田谷区, æ<9d>±äº¬éƒ½, 156-0054, 日本" amenity university 0.476564468003337 日本 FALSE
+tokyo university of agriculture and technology jp Asia Eastern Asia FALSE 1 2021-02-03 129699576 way "æ<9d>±äº¬è¾²å·¥å¤§å¦, 下山谷通り, ä¸ç”º, å°<8f>金井市, æ<9d>±äº¬éƒ½, 184-0012, 日本" amenity university 0.001 日本 FALSE
+toyohashi university of technology jp Asia Eastern Asia FALSE 1 2021-02-03 108255102 way "豊橋技術科å¦å¤§å¦, å°<8f>æ<9d>¾åŽŸå°<8f>æ± ç·š, 天伯町, 豊橋市, 愛知県, 441-8115, 日本" amenity university 0.411679724670082 日本 FALSE
+trade and innovation jp Asia Eastern Asia FALSE 1 2021-02-03 65049975 node "Trade Next Standard Innovation, 黒田庄多井田線, æ<9d>¿æ³¢ç”º, 西脇市, 兵庫県, 日本" shop car 0.301 日本 FALSE
+university museum of the university of tokyo jp Asia Eastern Asia FALSE 1 2021-02-03 122005976 way "æ<9d>±äº¬å¤§å¦ç·<8f>å<90>ˆç ”究å<8d>šç‰©é¤¨, æ£èµ¤é€šã‚Š, 本郷五ä¸<81>ç›®, 文京区, æ<9d>±äº¬éƒ½, 113-0033, 日本" tourism museum 0.323710213530857 日本 FALSE
+university of hokkaido jp Asia Eastern Asia FALSE 1 2021-02-03 128417717 way "北海é<81>“大å¦, 環状通, 北14æ<9d>¡æ<9d>±7, æ<9d>±åŒº, æœå¹Œå¸‚, 石狩振興局, 北海é<81>“, 060-0808, 日本" amenity university 0.525438377157725 日本 FALSE
+university of kyoto jp Asia Eastern Asia FALSE 1 2021-02-03 128750307 way "äº¬éƒ½å¤§å¦ åŒ—éƒ¨æ§‹å†…, 志賀越é<81>“, 北白å·<9d>ä¹…ä¿<9d>田町, 左京区, 京都市, 京都府, 606-8276, 日本" amenity university 0.57959701929309 日本 FALSE
+university of the ryukyus jp Asia Eastern Asia FALSE 1 2021-02-03 107343763 way "ç<90>‰ç<90>ƒå¤§å¦, 宜野湾西原線, 内間, 西原町, ä¸é 郡, 沖縄県, 903-0121, 日本" amenity university 0.468090947740774 日本 FALSE
+university of yamanashi jp Asia Eastern Asia FALSE 1 2021-02-03 158492717 way "å¸<9d>京科å¦å¤§å¦æ<9d>±äº¬è¥¿ã‚ャンパス, ä¸å¤®è‡ªå‹•è»Šé<81>“, 上野原市, 山梨県, 日本" amenity university 0.428807256594898 日本 FALSE
+wakayama university jp Asia Eastern Asia FALSE 1 2021-02-03 127282447 way "å’ŒæŒå±±å¤§å¦, 1ã‚ãƒå<9d>‚, æ „è°·, å’ŒæŒå±±å¸‚, å’ŒæŒå±±çœŒ, 640-8511, 日本" amenity university 0.001 日本 FALSE
+waseda university jp Asia Eastern Asia FALSE 1 2021-02-03 194562447 way "æ—©ç¨²ç”°å¤§å¦ åŒ—ä¹<9d>å·žã‚ャンパス, 2-2, 有毛引野線, è‹¥æ<9d>¾åŒº, 北ä¹<9d>州市, ç¦<8f>岡県, 808-0135, 日本" amenity university 0.001 日本 FALSE
+xfel jp Asia Eastern Asia FALSE 1 2021-02-03 103594598 way "XFEL, 上郡末広線, 光都二ä¸<81>ç›®, éž<8d>å±…, 上郡町, 赤穂郡, 兵庫県, 日本" building yes 0.101 日本 FALSE
+xiap jp Asia Eastern Asia FALSE 1 2021-02-03 132243075 way "地下P入路, ç ‚å±±ç”º, ä¸åŒº, 浜æ<9d>¾å¸‚, é<9d>™å²¡çœŒ, 430-0926, 日本" highway service 0.075 日本 FALSE
+yokohama city university jp Asia Eastern Asia FALSE 1 2021-02-03 110892089 way "横浜市立大å¦, æ<9d>±è¥¿è‡ªç”±é€šè·¯ 西å<81>´éšŽæ®µ, 柳町, 金沢区, 横浜市, 神奈å·<9d>県, 231-0017, 日本" amenity university 0.443549060892257 日本 FALSE
+yuan jp Asia Eastern Asia FALSE 1 2021-02-03 297445876 node "原, 原å<81>œè»Šå ´ç·š, 沼津市, é<9d>™å²¡çœŒ, 410-0312, 日本" railway station 0.364463378933884 日本 FALSE
+ama jo Asia Western Asia FALSE 1 2021-02-03 16241175 node "عمان, 2062, الأردن" place city 0.610035786199553 الأردن FALSE
+four seasons hotel jo Asia Western Asia FALSE 1 2021-02-03 138307414 way "Four Seasons Hotel, شارع البصرة, ام اذينة الشرقي, عمان, 11195, الأردن" tourism hotel 0.750443028528829 الأردن FALSE
+jordan university of science and technology jo Asia Western Asia FALSE 1 2021-02-03 148655079 way "Jordan University of Science and Technology, Betra St, إربد‎, إربد, الأردن" amenity university 0.601 الأردن FALSE
+wadi rum jo Asia Western Asia FALSE 1 2021-02-03 149386364 way "وادي رم, العقبة, الأردن" natural desert 0.408010995739962 الأردن FALSE
+maytals jm Americas Caribbean FALSE 1 2021-02-03 139033445 way "Maytals Crescent, Cooreville Gardens, Saint Andrew, Surrey County, 20, Jamaica" highway residential 0.2 Jamaica FALSE
+durrell wildlife conservation trust je Europe Northern Europe FALSE 1 2021-02-03 129612064 way "Jersey Zoo, La Profonde Rue, Trinity, JE3 5BP, Jersey" tourism zoo 0.30922699466609 Jersey FALSE
+abr it Europe Southern Europe FALSE 1 2021-02-03 258290208 relation "Abruzzo, Italia" boundary administrative 0.755885514368911 Italia FALSE
+adria it Europe Southern Europe FALSE 1 2021-02-03 257700491 relation "Adria, Rovigo, Veneto, 45011, Italia" boundary administrative 0.58739021265696 Italia FALSE
+aetna it Europe Southern Europe FALSE 1 2021-02-03 241820 node "Etna, Maletto, Catania, Sicilia, Italia" natural volcano 0.547928846167033 Italia FALSE
+allea it Europe Southern Europe FALSE 1 2021-02-03 224399555 way "Largo Luigi Sante Colonna, Sacro Cuore, Novara, Piemonte, 28100, Italia" highway tertiary 0.1 Italia FALSE
+ari it Europe Southern Europe FALSE 1 2021-02-03 257982588 relation "Ari, Chieti, Abruzzo, Italia" boundary administrative 0.588735462120359 Italia FALSE
+asce it Europe Southern Europe FALSE 1 2021-02-03 50299980 node "Sc'é, Dalico, Chiuro, Comunità Montana della Valtellina di Sondrio, Sondrio, Lombardia, 23026, Italia" place locality 0.125 Italia FALSE
+aurora cannabis it Europe Southern Europe FALSE 1 2021-02-03 299833705 way "Cannabis, Livorno, Toscana, 57128, Italia" highway path 0.175 Italia FALSE
+baselga it Europe Southern Europe FALSE 1 2021-02-03 257765077 relation "Baselga di Piné, Comunità Alta Valsugana e Bersntol, Provincia di Trento, Trentino-Alto Adige/Südtirol, 38042, Italia" boundary administrative 0.610764750724671 Italia FALSE
+cal it Europe Southern Europe FALSE 1 2021-02-03 258205142 relation "Calabria, Italia" boundary administrative 0.767103527755831 Italia FALSE
+candiolo cancer institute it Europe Southern Europe FALSE 1 2021-02-03 100915781 way "Istituto per la Ricerca e la Cura del Cancro Candiolo (IRCCS), SP142, Candiolo, Torino, Piemonte, Italia" amenity hospital 0.101 Italia FALSE
+casa sollievo it Europe Southern Europe FALSE 1 2021-02-03 73520663 node "Casa Sollievo, Due Torri 3 Perpendicolare, Due Torri, Fiumarella, Milazzo, Messina, Sicilia, 98057, Italia" amenity social_facility 0.201 Italia FALSE
+ceres it Europe Southern Europe FALSE 1 2021-02-03 257753212 relation "Ceres, Unione Montana di Comuni delle Valli di Lanzo, Ceronda e Casternone, Torino, Piemonte, Italia" boundary administrative 0.633997464448559 Italia FALSE
+ceva it Europe Southern Europe FALSE 1 2021-02-03 257748591 relation "Ceva, Cuneo, Piemonte, 12073, Italia" boundary administrative 0.645044323052155 Italia FALSE
+civil protection it Europe Southern Europe FALSE 1 2021-02-03 7407617 node "Sede Protezione Civile, 4, Via delle Gambarare, San Tommaso, Soleschiano, Vermegliano, Ronchi dei Legionari, UTI Carso Isonzo Adriatico / MTU Kras SoÄ<8d>a Jadran, Friuli Venezia Giulia, 34077, Italia" building public 0.101 Italia FALSE
+cmv it Europe Southern Europe FALSE 1 2021-02-03 129267416 way "CMV, Via Baldassarre Malamini, Zona Industriale Cento 2000, Cento, Unione Alto Ferrarese, Ferrara, Emilia-Romagna, 44042, Italia" building yes 0.101 Italia FALSE
+consert it Europe Southern Europe FALSE 1 2021-02-03 217849481 way "ConserT srl, Cavaione, Truccazzano, Milano, Lombardia, Italia" landuse industrial 0.3 Italia FALSE
+continental africa it Europe Southern Europe FALSE 1 2021-02-03 59058346 node "Africa, Monteveglio Alto, Monteveglio, Valsamoggia, Unione dei comuni Valli del Reno, Lavino e Samoggia, Bologna, Emilia-Romagna, 40053, Italia" place locality 0.225 Italia FALSE
+cornare it Europe Southern Europe FALSE 1 2021-02-03 15654248 node "Cornarè, Mansuè, Treviso, Veneto, 31018, Italia" place hamlet 0.25 Italia FALSE
+cosac it Europe Southern Europe FALSE 1 2021-02-03 179535513 way "Vicolo Cosac, Carvacco, Vendoglio, Treppo Grande, UTI Collinare, Friuli Venezia Giulia, Italia" highway residential 0.2 Italia FALSE
+cossa it Europe Southern Europe FALSE 1 2021-02-03 13413104 node "Cossa, Via Vittorio Asinari di Bernezzo, Parella, Circoscrizione 4, Torino, Piemonte, 10146, Italia" highway bus_stop 0.101 Italia FALSE
+cs it Europe Southern Europe FALSE 1 2021-02-03 257689055 relation "Cosenza, Calabria, Italia" boundary administrative 0.62816937725518 Italia FALSE
+cta it Europe Southern Europe FALSE 1 2021-02-03 103730268 way "Aeroporto di Catania Fontanarossa, Via Filippo Eredia, Villaggio Santa Maria Goretti, San Giorgio-Librino-San Giuseppe la Rena-Zia Lisa-Villaggio Sant'Agata, Catania, Sicilia, 95121, Italia" aeroway aerodrome 0.452592978117187 Italia FALSE
+di ferranti it Europe Southern Europe FALSE 1 2021-02-03 14645919 node "Ferranti, Strada Provinciale 502 di Cingoli, Savignano, Caccamo, Serrapetrona, Macerata, Marche, Italia" tourism hotel 0.201 Italia FALSE
+di maio it Europe Southern Europe FALSE 1 2021-02-03 61053488 node "Di Maio, Piazza Noce, Uditore, V Circoscrizione, Palermo, Sicilia, 90135, Italia" shop bakery 0.201 Italia FALSE
+eia it Europe Southern Europe FALSE 1 2021-02-03 3653571 node "Eia, Golese, Parma, Emilia-Romagna, 43126, Italia" place hamlet 0.526719844716193 Italia FALSE
+etna it Europe Southern Europe FALSE 1 2021-02-03 241820 node "Etna, Maletto, Catania, Sicilia, Italia" natural volcano 0.647928846167033 Italia FALSE
+famiglia cristiana it Europe Southern Europe FALSE 1 2021-02-03 119137909 way "Via Famiglia Cristiana, Sicomo, Mazara del Vallo, Trapani, Sicilia, 91026, Italia" highway residential 0.3 Italia FALSE
+fera it Europe Southern Europe FALSE 1 2021-02-03 12359963 node "Il Ferà , Cuneo, Piemonte, Italia" natural peak 0.3 Italia FALSE
+fgf it Europe Southern Europe FALSE 1 2021-02-03 15408539 node "FGF, 12, Piazza Insurrezione, Isola San Giacomo, Padova, Veneto, 35149, Italia" shop clothes 0.101 Italia FALSE
+forza italia it Europe Southern Europe FALSE 1 2021-02-03 49634864 node "Forza Italia, 3, Via del Borgo Antico, Centro, Gallarate, Varese, Lombardia, 21013, Italia" office political_party 0.201 Italia FALSE
+gavi it Europe Southern Europe FALSE 1 2021-02-03 258404642 relation "Gavi, Alessandria, Piemonte, 15066, Italia" boundary administrative 0.626348589615649 Italia FALSE
+gsk vaccines it Europe Southern Europe FALSE 1 2021-02-03 259248267 relation "GSK Vaccines, Petriccio, Siena, Toscana, Italia" landuse industrial 0.4 Italia FALSE
+huvepharma it Europe Southern Europe FALSE 1 2021-02-03 159437631 way "Huvepharma (ex Sanofi), Garessio, Cuneo, Piemonte, Italia" landuse industrial 0.3 Italia FALSE
+ibl it Europe Southern Europe FALSE 1 2021-02-03 108832964 way "IBL, Cavallino, Coniolo, Alessandria, Piemonte, Italia" landuse industrial 0.3 Italia FALSE
+ictp it Europe Southern Europe FALSE 1 2021-02-03 99444447 way "ICTP Galileo Guesthouse, 7, Via Beirut, Roiano-Gretta-Barcola-Cologna-Scorcola, Miramare / Miramar, Trieste, UTI Giuliana / Julijska MTU, Friuli Venezia Giulia, 34151, Italia" building university 0.101 Italia FALSE
+imt it Europe Southern Europe FALSE 1 2021-02-03 258348177 relation "Campus IMT, 19, Piazza San Francesco, San Concordio, Lucca, Toscana, 55100, Italia" building school 0.443892137025745 Italia FALSE
+inaf it Europe Southern Europe FALSE 1 2021-02-03 113942153 way "La Specola, 5, Vicolo dell'Osservatorio, San Giuseppe, Padova, Veneto, 35141, Italia" tourism attraction 0.258218474293395 Italia FALSE
+ingv it Europe Southern Europe FALSE 1 2021-02-03 105415909 way "Istituto Nazionale di Geofisica e Vulcanologia, 605, Via di Vigna Murata, Quartiere XX Ardeatino, Roma, Roma Capitale, Lazio, 00143, Italia" amenity research_institute 0.312795139465266 Italia FALSE
+istituto di astrofisica it Europe Southern Europe FALSE 1 2021-02-03 96661608 way "INAF - Istituto Nazionale di AstroFisica, Viale Professor Cesare Sanfilippo, Picanello-Ognina-Barriera-Canalicchio, Catania, Sicilia, 95123, Italia" building university 0.574532111506442 Italia FALSE
+la repubblica it Europe Southern Europe FALSE 1 2021-02-03 2308014 node "Repubblica, Piazza della Repubblica, Municipio Roma I, Roma, Roma Capitale, Lazio, 00184, Italia" railway station 0.563961619858331 Italia FALSE
+legambiente it Europe Southern Europe FALSE 1 2021-02-03 67713400 node "Legambiente, Piazzetta San Giovanni dal Fosso, Perugia, Umbria, 06122, Italia" office association 0.101 Italia FALSE
+mar it Europe Southern Europe FALSE 1 2021-02-03 257717754 relation "Marche, Italia" boundary administrative 0.753750462851578 Italia FALSE
+mol it Europe Southern Europe FALSE 1 2021-02-03 256848066 relation "Molise, Italia" boundary administrative 0.73612097112061 Italia FALSE
+mosaico it Europe Southern Europe FALSE 1 2021-02-03 44551556 node "Mosaico, Via Tito Livio, San Leonardo, Larino, Campobasso, Molise, 86035, Italia" tourism attraction 0.377334066701962 Italia FALSE
+mose it Europe Southern Europe FALSE 1 2021-02-03 2517979 node "Mosè, 4/a, Piazza di San Pietro in Vincoli, Rione I Monti, Municipio Roma I, Roma, Roma Capitale, Lazio, 00184, Italia" tourism artwork 0.427503445679354 Italia FALSE
+national front it Europe Southern Europe FALSE 1 2021-02-03 257702157 relation "Front, Torino, Piemonte, Italia" boundary administrative 0.628491408781471 Italia FALSE
+national institute of statistics it Europe Southern Europe FALSE 1 2021-02-03 69505825 node "ISTAT Ufficio Regionale Toscana, 80, Via dell'Agnolo, San Niccolò, Quartiere 1, Firenze, Toscana, 50122, Italia" office research 0.703323682867195 Italia FALSE
+nokia bell labs it Europe Southern Europe FALSE 1 2021-02-03 202583074 way "Nokia Bell Labs, Via Energy Park, Segro Energy Park, Torri Bianche, Vimercate, Monza e della Brianza, Lombardia, 20871, Italia" building yes 0.301 Italia FALSE
+numonyx it Europe Southern Europe FALSE 1 2021-02-03 33774179 node "Via Alfredo Agosta f/te Numonyx, Via Alfredo Agosta, San Giorgio-Librino-San Giuseppe la Rena-Zia Lisa-Villaggio Sant'Agata, Catania, Sicilia, 95121, Italia" highway bus_stop 0.101 Italia FALSE
+palermo it Europe Southern Europe FALSE 1 2021-02-03 258312426 relation "Palermo, Sicilia, Italia" boundary administrative 0.756114817144791 Italia FALSE
+parma it Europe Southern Europe FALSE 1 2021-02-03 257214446 relation "Parma, Emilia-Romagna, Italia" boundary administrative 0.725573424016841 Italia FALSE
+people nih it Europe Southern Europe FALSE 1 2021-02-03 50769806 node "People, Piazza dell'Olmo, Terni, Umbria, 05100, Italia" amenity bar 0.101 Italia FALSE
+piper it Europe Southern Europe FALSE 1 2021-02-03 24253230 node "Monte Piper, Dogna, UTI del Canal del Ferro - Val Canale, Friuli Venezia Giulia, Italia" natural peak 0.4 Italia FALSE
+procter & gamble it Europe Southern Europe FALSE 1 2021-02-03 107973245 way "100, Procter & Gamble, Santa Palomba, Pomezia, Roma Capitale, Lazio, 00040, Italia" landuse industrial 0.4 Italia FALSE
+pz it Europe Southern Europe FALSE 1 2021-02-03 256841560 relation "Potenza, Basilicata, Italia" boundary administrative 0.623700593766485 Italia FALSE
+sapienza university it Europe Southern Europe FALSE 1 2021-02-03 93614288 way "Sapienza Università di Roma, Piazzale del Verano, San Lorenzo, Municipio Roma II, Roma, Roma Capitale, Lazio, 00161, Italia" amenity university 0.646633621782453 Italia FALSE
+sar it Europe Southern Europe FALSE 1 2021-02-03 259005837 relation "Sardegna, Italia" boundary administrative 0.784794769506041 Italia FALSE
+sca it Europe Southern Europe FALSE 1 2021-02-03 226340670 way "Sca, Montaretto, Bonassola, La Spezia, Liguria, Italia" natural beach 0.3 Italia FALSE
+sissa it Europe Southern Europe FALSE 1 2021-02-03 256792 node "Sissa, Sissa Trecasali, Parma, Emilia-Romagna, 43018, Italia" place village 0.549149847834766 Italia FALSE
+slow food italy it Europe Southern Europe FALSE 1 2021-02-03 55351950 node "Slow Food Godo e Bassa Romagna, 17, Via della Chiesa, Villanova di Bagnacavallo, Bagnacavallo, Unione dei comuni della Bassa Romagna, Ravenna, Emilia-Romagna, 48012, Italia" office association 0.201 Italia FALSE
+united nations world food programme it Europe Southern Europe FALSE 1 2021-02-03 119517457 way "United Nations World Food Programme, Brindisi, Puglia, Italia" landuse military 0.7 Italia FALSE
+university of bergamo it Europe Southern Europe FALSE 1 2021-02-03 145293897 way "Università degli Studi di Bergamo, Via dei Caniana, Finazzi, San Tommaso, Grumellina, Bergamo, Lombardia, 24122, Italia" amenity university 0.508338828424476 Italia FALSE
+university of cagliari it Europe Southern Europe FALSE 1 2021-02-03 49358856 node "Scuola Universitaria per Mediatori Linguistici, Via Abruzzi, San Michele, Pirri, Cagliari - Casteddu, Cagliari, Sardegna, 09122, Italia" amenity university 0.101 Italia FALSE
+university of catania it Europe Southern Europe FALSE 1 2021-02-03 259056568 relation "Università degli Studi di Catania - Dipartimento di Giurisprudenza, Picanello-Ognina-Barriera-Canalicchio, Catania, Sicilia, Italia" amenity university 0.565624057571395 Italia FALSE
+university of insubria it Europe Southern Europe FALSE 1 2021-02-03 104135116 way "Università degli Studi dell'Insubria, Piazza della Repubblica, Motta, Giubiano, Biumo Superiore, Varese, Lombardia, Italia" amenity university 0.495276863807175 Italia FALSE
+university of milan bicocca it Europe Southern Europe FALSE 1 2021-02-03 44257894 node "University Bar, 13, Via Luigi Pulci, Bicocca, Municipio 9, Milano, Lombardia, 20162, Italia" amenity restaurant 0.301 Italia FALSE
+university of milan-bicocca it Europe Southern Europe FALSE 1 2021-02-03 44257894 node "University Bar, 13, Via Luigi Pulci, Bicocca, Municipio 9, Milano, Lombardia, 20162, Italia" amenity restaurant 0.301 Italia FALSE
+university of rome it Europe Southern Europe FALSE 1 2021-02-03 104579427 way "Pontificia Università Gregoriana, 4, Piazza della Pilotta, Rione II Trevi, Municipio Roma I, Roma, Roma Capitale, Lazio, 00187, Italia" amenity university 0.553259727348553 Italia FALSE
+university of valle it Europe Southern Europe FALSE 1 2021-02-03 104135116 way "Università degli Studi dell'Insubria, Piazza della Repubblica, Motta, Giubiano, Biumo Superiore, Varese, Lombardia, Italia" amenity university 0.395276863807175 Italia FALSE
+university of venice it Europe Southern Europe FALSE 1 2021-02-03 258599724 relation "Venice International University, Viale Vittorio Veneto, Sant'Elena, Venezia-Murano-Burano, Lido, Venezia, Veneto, 30132, Italia" amenity university 0.507572334229807 Italia FALSE
+us marine it Europe Southern Europe FALSE 1 2021-02-03 257688159 relation "Marineo, Palermo, Sicilia, 90035, Italia" boundary administrative 0.569621885852042 Italia FALSE
+verona it Europe Southern Europe FALSE 1 2021-02-03 257258792 relation "Verona, Veneto, Italia" boundary administrative 0.746157388882853 Italia FALSE
+vimm it Europe Southern Europe FALSE 1 2021-02-03 121353519 way "VIMM, Via Giuseppe Orus, Stanga, Padova, Veneto, 35131, Italia" amenity public_building 0.101 Italia FALSE
+vlbi it Europe Southern Europe FALSE 1 2021-02-03 60295636 node "Antenna VLBI, SP5, Matera, Basilicata, 74013, Italia" man_made tower 0.101 Italia FALSE
+egs is Europe Northern Europe FALSE 1 2021-02-03 210808767 way "Egilsstaðaflugvöllur, Flugvallarvegur Egilsstöðum, Egilsstaðir, Múlaþing, Austurland, 700, Ã<8d>sland" aeroway aerodrome 0.328668254407684 Ã<8d>sland FALSE
+national earthquake center is Europe Northern Europe FALSE 1 2021-02-03 163994877 way "Skjálftasetrið, Akurgerði, Kópasker, Norðurþing, Norðurland eystra, 670, Ã<8d>sland" tourism museum 0.001 Ã<8d>sland FALSE
+perlan is Europe Northern Europe FALSE 1 2021-02-03 96152073 way "Perlan, 1, VarmahlÃð, HlÃðar, ReykjavÃkurborg, Höfuðborgarsvæðið, 105, Ã<8d>sland" tourism attraction 0.379354982157541 Ã<8d>sland FALSE
+reykjavik is Europe Northern Europe FALSE 1 2021-02-03 258385845 relation "ReykjavÃkurborg, Höfuðborgarsvæðið, Ã<8d>sland" boundary administrative 0.618605174933632 Ã<8d>sland FALSE
+agriculture organization ir Asia Southern Asia FALSE 1 2021-02-03 54642145 node "جهادکشاورزی استان آذربایجان شرقی, امیر کبیر, مرز Ù…Øله, لیلاوا, شهر تبریز, بخش مرکزی شهرستان تبریز, شهرستان تبریز, استان آذربایجان شرقی, 5183731665, ایران" office government 0.001 ایران FALSE
+cultural heritage ir Asia Southern Asia FALSE 1 2021-02-03 194900450 way "سازمان میراث Ù<81>رهنگی، صنایع دستی Ùˆ گردشگری, یکم, شهرک ملاصدرا, چهارصد دستگاه, شهر قزوین, مرز شهر قزوین, شهرستان قزوین, استان قزوین, چهار راه هشت بهشت, ایران" office yes 0.001 ایران FALSE
+energy research institute ir Asia Southern Asia FALSE 1 2021-02-03 100441310 way "مرکز تØقیقات وزارت نیرو, گلستان دوم, درختی, منطقه Û² شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1468763785, ایران" amenity university 0.001 ایران FALSE
+eni ir Asia Southern Asia FALSE 1 2021-02-03 43316866 node "اعنی, دهستان شوئیل, بخش رØیم آباد, شهرستان رودسر, استان گیلان, ایران" place village 0.275 ایران FALSE
+goodarzi ir Asia Southern Asia FALSE 1 2021-02-03 199464728 way "گودرزی, Ú©ÙˆÛŒ Ù<81>رهنگیان, شهر بروجرد, دهستان همت‌آباد, بخش مرکزی, شهرستان بروجرد, استان لرستان‎, 6915863614, ایران" highway residential 0.1 ایران FALSE
+hse ir Asia Southern Asia FALSE 1 2021-02-03 258618125 relation "استان هرمزگان, ایران" boundary administrative 0.571634966054199 ایران FALSE
+institute of agricultural resources ir Asia Southern Asia FALSE 1 2021-02-03 71510476 node "مرکز تØقیقات کشاورزی Ùˆ منابع‌طبیعی زابل, مرکز تØقیقات کشاورزی, دهستان قائم آباد, بخش مرکزی, شهرستان نیمروز, استان سیستان Ùˆ بلوچستان, 432, ایران" office research 0.001 ایران FALSE
+ira ir Asia Southern Asia FALSE 1 2021-02-03 258075432 relation ایران boundary administrative 0.824702703615226 ایران FALSE
+islamic azad university ir Asia Southern Asia FALSE 1 2021-02-03 66010042 node "دانشگاه آزاد اسلامی همدان, مرز دانشگاه آزاد اسلامی, شهر همدان, بخش مرکزی شهرستان همدان, شهرستان همدان, استان همدان, همدان, ایران" place neighbourhood 0.25 ایران FALSE
+islamic revolutionary guard corps ir Asia Southern Asia FALSE 1 2021-02-03 75598301 node "سپاه پاسدارن انقلاب اسلامی, شهید Ù<81>همیده, گرمی, دهستان انی, بخش مرکزی, شهرستان گرمی, استان اردبیل, ایران" office government 0.001 ایران FALSE
+kermanshah university of medical sciences ir Asia Southern Asia FALSE 1 2021-02-03 206194946 way "دانشگاه علوم پزشکی کرمانشاه, شاهمرادی, کرمانشاه, شهر کرمانشاه, بخش مرکزی, شهرستان کرمانشاه, استان کرمانشاه, 6714853559, ایران" amenity university 0.001 ایران FALSE
+nfl ir Asia Southern Asia FALSE 1 2021-02-03 52785808 node "Ù†Ù<81>Ù„, دهستان جایزان, بخش جایزان, شهرستان امیدیه, استان خوزستان, ایران" place hamlet 0.25 ایران FALSE
+niakan ir Asia Southern Asia FALSE 1 2021-02-03 197613717 way "نیاکان, پوریای ولی, شهر اصÙ<81>هان, بخش مرکزی شهرستان اصÙ<81>هان, شهرستان اصÙ<81>هان, استان اصÙ<81>هان, 8148745781, ایران" highway residential 0.1 ایران FALSE
+nsl ir Asia Southern Asia FALSE 1 2021-02-03 6151867 node "نسل, دهستان رزآب, بخش مرکزی, شهرستان سروآباد, استان کردستان, ایران" place village 0.281311730611622 ایران FALSE
+oic ir Asia Southern Asia FALSE 1 2021-02-03 227400895 way "OIEC, منطقه ۱ شهر تهران, شهر تجریش, بخش رودبار قصران, شهرستان شمیرانات, استان تهران, ایران" landuse commercial 0.2 ایران FALSE
+sharif university of technology ir Asia Southern Asia FALSE 1 2021-02-03 139885466 way "دانشگاه صنعتی شریÙ<81>, خیابان آزادی, زنجان شمالی, منطقه Û² شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1458744811, ایران" amenity university 0.430996300874427 ایران FALSE
+tehran university ir Asia Southern Asia FALSE 1 2021-02-03 259097888 relation "دانشگاه تهران, منطقه ۶ شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, ایران" boundary administrative 0.2 ایران FALSE
+tehran university of medical sciences ir Asia Southern Asia FALSE 1 2021-02-03 54623759 node "دانشگاه علوم پزشکی Ùˆ خدمات بهداشتی درمانی تهران, Û±Û¶ آذر, دانشگاه تهران, منطقه Û¶ شهر تهران, شهرداری تهران منطقه شش ناØیه سه, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1314665611, ایران" amenity university 0.383021208265432 ایران FALSE
+toshiba ir Asia Southern Asia FALSE 1 2021-02-03 259514382 relation "توشیبا, شهر رشت, بخش مرکزی شهرستان رشت, شهرستان رشت, استان گیلان, ایران" boundary administrative 0.2 ایران FALSE
+trp ir Asia Southern Asia FALSE 1 2021-02-03 45155123 node "ترپ, دهستان رودقات, بخش صوÙ<81>یان, شهرستان شبستر, استان آذربایجان شرقی, ایران" place village 0.325302870611459 ایران FALSE
+wsl ir Asia Southern Asia FALSE 1 2021-02-03 177714403 way "وصل, دزÙ<81>ول, شهر دزÙ<81>ول, بخش مرکزی, شهرستان دزÙ<81>ول, استان خوزستان, 009861, ایران" highway residential 0.1 ایران FALSE
+academic journals iq Asia Western Asia FALSE 1 2021-02-03 67750372 node "المركز الاكاديمي للنشر Ù<81>ÙŠ المجلات العالمية, باب المعظم, مدينة الطب, البلدية الرصاÙ<81>Ø©, بغداد, ناØية مرکز قضاء الرصاÙ<81>Ø©, قضاء الرصاÙ<81>Ø©, Ù…ØاÙ<81>ظة بغداد, 10047, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" amenity university 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+emergency response division iq Asia Western Asia FALSE 1 2021-02-03 69832805 node "شعبة استجابة الطوارئ, شارع الجمهورية, الØكيمية, ناØية مرکز قضاء البصرة, قضاء البصرة, Ù…ØاÙ<81>ظة البصرة, 99650, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" tourism artwork 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+higher institute of health iq Asia Western Asia FALSE 1 2021-02-03 247159587 way "Higher Institute of Health Professions, شەقامی بازاڕی مووسەڵا, Ú¯Û•Ú•Û•Ú©ÛŒ قازی Ù…Øەمەد, كركوك, ناØیەی ناوەندەکەی قەزای کەرکووک, قضاء كركوك / قەزای كەركووك, Ù…ØاÙ<81>ظة كركوك / پارێزگای کەرکووک, 36001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" office educational_institution 0.401 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+ministry of natural resources iq Asia Western Asia FALSE 1 2021-02-03 213588840 way "Ministry Of Natural Resources, Salahaddin, پارکی سامی عەبدولڕەØمان, هەولێر, ناØیەی ناوەندەکەی قەزای ھەولێر, قەزای ھەولێر, پارێزگای هەولێر, ‎هەرێمی کوردستان, 44001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" office government 0.401 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+national university of sciences and technology iq Asia Western Asia FALSE 1 2021-02-03 255577829 way "الجامعة الوطنية للعلوم والتكنولوجيا, شارع المرتضا, الÙ<81>داء, الناصرية, Ù…ØاÙ<81>ظة ذي قار, 64001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" amenity college 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+nwf iq Asia Western Asia FALSE 1 2021-02-03 24555027 node "نوÙ<81>, ناØية السنية, قضاء الديوانية, Ù…ØاÙ<81>ظة القادسية, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" place village 0.275 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+refugees international iq Asia Western Asia FALSE 1 2021-02-03 67638652 node "IFIR - Ù<81>یدراسیۆنی پەنابەران, 05, 412-5, Rizgari 412, سلێمانی, ناØیەی بەکرەجۆ, قەزای سلێمانی, ‎هەرێمی کوردستان, 46001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" office ngo 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+university of kurdistan iq Asia Western Asia FALSE 1 2021-02-03 69030276 node "زانکۆی سەلاØەددین-ھەولێر/ Ú©Û†Ù„ÛŽÚ˜ÛŒ ئەندازیاری بەشی ئەندازیاریی سەرچاوەکانی ئاو Ùˆ بەنداوو, شەقامی زانکۆ, زانکۆ ٣٤١, هەولێر, ناØیەی ناوەندەکەی قەزای ھەولێر, قەزای ھەولێر, پارێزگای هەولێر, ‎هەرێمی کوردستان, 44001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü©" amenity college 0.338041195081873 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© FALSE
+aaab in Asia Southern Asia FALSE 1 2021-02-03 38383655 node "aaab, NH45, Sadar, Jabalpur, Jabalpur Tahsil, Jabalpur, Madhya Pradesh, 482001, India" tourism museum 0.111 India FALSE
+actionaid in Asia Southern Asia FALSE 1 2021-02-03 47347601 node "ActionAid, Richmond Road, Craig Park Layout, Shantala Nagar, East Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, - 560095, India" office ngo 0.101 India FALSE
+agharkar research institute in Asia Southern Asia FALSE 1 2021-02-03 38271396 node "Agharkar Research Institute, Gopal Ganesh Agarkar Path, Deccan Gymkhana, Pune City, Pune District, Maharashtra, 411004, India" office educational_institution 0.301 India FALSE
+aiims in Asia Southern Asia FALSE 1 2021-02-03 75775290 node "All India Institute of Medical Sciences, Aurobindo Marg, Yusuf Sarai Market, Defence Colony Teshil, South East Delhi, Delhi, 110029, India" railway station 0.344585942469205 India FALSE
+aip in Asia Southern Asia FALSE 1 2021-02-03 59077197 node "Attippattu, Manali Ponneri Road, Edayanchavadi, Ward 15, Nappalayam, Vellaiveyil Chavadi, Ponneri, Thiruvallur District, Tamil Nadu, 600120, India" railway station 0.292441551930616 India FALSE
+akp in Asia Southern Asia FALSE 1 2021-02-03 10482569 node "Anakapalle, Anakapalle - Chodavaram Road, Anakapalle, Visakhapatnam, Andhra Pradesh, 531001, India" railway station 0.319018527529768 India FALSE
+ap in Asia Southern Asia FALSE 1 2021-02-03 258583657 relation "Andhra Pradesh, India" boundary administrative 0.6434753044048 India FALSE
+aries systems in Asia Southern Asia FALSE 1 2021-02-03 16414945 node "Aris Global Software Pvt Ltd., Krishnaraja Sagara Road, Kumbara Koppalu, Metagalli Industrial Area, Mysuru, Mysuru taluk, Mysuru district, Karnataka, 570016, India" building office 0.001 India FALSE
+ashoka university in Asia Southern Asia FALSE 1 2021-02-03 214685328 way "Ashoka University, Grand Trunk Road, Kundli Industrial Area, Rasoi, Sonipat, Haryana, 131029, India" amenity university 0.201 India FALSE
+astronomy & astrophysics in Asia Southern Asia FALSE 1 2021-02-03 113630721 way "Inter University Center for Astronomy & Astrophysics, Breman Chowk - Khadki Bazar Road, Mandalay Lines, Khadki, Pune City, Pune District, Maharashtra, 411007, India" building yes 0.201 India FALSE
+astrophysics institute in Asia Southern Asia FALSE 1 2021-02-03 99960273 way "Indian Institute of Astrophysics, Koramangala 2nd Block, Koramangala, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, India" boundary wall 0.589453166408414 India FALSE
+asv in Asia Southern Asia FALSE 1 2021-02-03 4568562 node "Asarva, Naroda ROad, Kalapi nagar, Ahmedabad, Ahmadabad City Taluka, Ahmedabad District, Gujarat, 380001, India" railway station 0.319711033684734 India FALSE
+atomic energy regulatory board in Asia Southern Asia FALSE 1 2021-02-03 300213241 relation "Atomic Energy Regulatory Board, V.N. Purav Marg, Govandi West, M/E Ward, Zone 5, Mumbai, Mumbai Suburban, Maharashtra, 400088, India" building yes 0.401 India FALSE
+azim premji university in Asia Southern Asia FALSE 1 2021-02-03 47600219 node "Azim Premji University, Service Road, Begur, Bommanahalli Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, 560 100, India" amenity university 0.569299555080491 India FALSE
+banaras hindu university in Asia Southern Asia FALSE 1 2021-02-03 65891789 node "काशी हिनà¥<8d>दू विशà¥<8d>वविदà¥<8d>यालय, Semi Circle Road 2, Karbirdas Colony, Varanasi, Uttar Pradesh, 221005, India" amenity college 0.001 India FALSE
+bar association in Asia Southern Asia FALSE 1 2021-02-03 47769764 node "Bar Association, Court Road, Paravur, Ernakulam district, Kerala, 683513, India" office association 0.201 India FALSE
+bhabha atomic research centre in Asia Southern Asia FALSE 1 2021-02-03 103414770 way "Bhabha Atomic Research Centre - BARC, M/E Ward, Zone 5, Mumbai, Mumbai Suburban, Maharashtra, India" landuse industrial 0.6 India FALSE
+bharat biotech in Asia Southern Asia FALSE 1 2021-02-03 146726935 way "biotech road, Clappana, Karunagappally, Kollam, Kerala, 690525, India" highway living_street 0.2 India FALSE
+bhaskaracharya college of applied sciences in Asia Southern Asia FALSE 1 2021-02-03 85536123 node "Bhaskaracharya College Of Applied Sciences, Nala Road, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110075, India" amenity college 0.501 India FALSE
+bhp in Asia Southern Asia FALSE 1 2021-02-03 18383797 node "Bolpur Santiniketan, NH114, Bolpur, Bolpur Sriniketan, Birbhum, West Bengal, 731204, India" railway station 0.33596057896493 India FALSE
+biocon in Asia Southern Asia FALSE 1 2021-02-03 74803996 node "Biocon, Joggers Ln, Veerasandra Industrial Estate, Anantnagar, Anekal, Bangalore Urban, Karnataka, 560100, India" office company 0.101 India FALSE
+bma in Asia Southern Asia FALSE 1 2021-02-03 82778948 node "Belmuri, Durgapur Expressway, Polba - Dadpur, Hugli, West Bengal, 712305, India" railway station 0.321743055077702 India FALSE
+bsp in Asia Southern Asia FALSE 1 2021-02-03 6684331 node "Bilaspur Junction, Bilaspur Bypass, Lalkhadan, Bilaspur, Bilaspur Tahsil, Bilaspur, Chhattisgarh, 495004, India" railway station 0.332141421099015 India FALSE
+cdm in Asia Southern Asia FALSE 1 2021-02-03 60122088 node "Chidambaram, Railway Feeder Road, Chidambaram, Cuddalore District, Tamil Nadu, 608001, India" railway station 0.328965278593994 India FALSE
+center for science in Asia Southern Asia FALSE 1 2021-02-03 78997138 node "Centre for science(aravindan sir), ITS, Karunagapally, Karunagappally, Kollam, Kerala, 690518, India" office educational_institution 0.201 India FALSE
+center for the study of science in Asia Southern Asia FALSE 1 2021-02-03 26344651 node "CSTEP, 10th Cross Road, Papanna Layout, Kodigehalli, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560094, India" office ngo 0.001 India FALSE
+central bureau of investigation in Asia Southern Asia FALSE 1 2021-02-03 253091618 way "Central Bureau Of Investigation, Road 3, Sector 7, Gandhinagar, Gandhinagar Taluka, Gandhinagar District, Gujarat, 382008, India" office yes 0.401 India FALSE
+central information commission in Asia Southern Asia FALSE 1 2021-02-03 173685766 way "Central Information Commission, Baba Gang Nath Marg, Vasant Vihar Tehsil, New Delhi, Delhi, 110 067, India" office government 0.301 India FALSE
+central news agency in Asia Southern Asia FALSE 1 2021-02-03 69050515 node "Central News Agency, Outer Circle, Connaught Place, Rakab Ganj, Chanakya Puri Tehsil, New Delhi, Delhi, 110001, India" shop books 0.301 India FALSE
+central pollution control board in Asia Southern Asia FALSE 1 2021-02-03 141460125 way "Pollution Control Board, Maharaj Surajmal Marg, Shahdara CBD, Vivek Vihar Tehsil, Shahdara, Delhi, 110051, India" building public 0.301 India FALSE
+centre for nanotechnology in Asia Southern Asia FALSE 1 2021-02-03 173998399 way "Center for Nanotechnology, CIS road, Ward 105 Gachibowli, Hyderabad, Serilingampalle mandal, Rangareddy, Telangana, 50046, India" building yes 0.201 India FALSE
+centre for scientific research in Asia Southern Asia FALSE 1 2021-02-03 134025877 way "Center for Scientific Research, Bliss Road, Annainagar, Ozhukarai Taluk, Puducherry district, Puducherry, 605101, India" building yes 0.301 India FALSE
+centre for sustainable agriculture in Asia Southern Asia FALSE 1 2021-02-03 68078354 node "centre for sustainable agriculture (CSA), Street 14, Tarnaka, Ward 143 Tarnaka, Greater Hyderabad Municipal Corporation North Zone, Hyderabad, Maredpally mandal, Hyderabad, Telangana, 500003, India" office ngo 0.401 India FALSE
+century foundation in Asia Southern Asia FALSE 1 2021-02-03 75013783 node "The New Century Medical & Education Foundation Trust Blood Bank & Aphaeresis Centre, Nagras Road, Aundh, Pune City, Pune District, Maharashtra, 411007, India" amenity blood_bank 0.201 India FALSE
+cga in Asia Southern Asia FALSE 1 2021-02-03 5997295 node "Chengail, NH16, Sankrail, Howrah, West Bengal, 711322, India" railway station 0.24352463088163 India FALSE
+congress party in Asia Southern Asia FALSE 1 2021-02-03 60778451 node "Congress Party, Powai Road, Anandgadh, N Ward, Zone 6, Mumbai, Mumbai Suburban, Maharashtra, 400084, India" office government 0.201 India FALSE
+csr in Asia Southern Asia FALSE 1 2021-02-03 55519048 node "Chak Sikandar, Station Road Chaksikandar, Bidupur, Vaishali, Bihar, 844115, India" railway station 0.279354982157541 India FALSE
+ctd in Asia Southern Asia FALSE 1 2021-02-03 14471317 node "Chhota Udepur, SH62, Chhota Udaipur, Chhota Udaipur Taluka, Chhota Udaipur District, Gujarat, 391165, India" railway station 0.320054390558144 India FALSE
+d. d. & mariani in Asia Southern Asia FALSE 1 2021-02-03 259426205 relation "Mariani, Jorhat, India" boundary administrative 0.75 India FALSE
+dbt in Asia Southern Asia FALSE 1 2021-02-03 64558864 node "Dakshin Barasat‎, Baruipur Kulpi Road, Dakshin Barasat‎, Jaynagar - I, South 24 Parganas, West Bengal, 743391, India" railway station 0.338296402069185 India FALSE
+defence research & development organisation in Asia Southern Asia FALSE 1 2021-02-03 83060459 node "Defence Research and Development Organisation, Bakavand Tahsil, Bastar, Chhattisgarh, India" office research 0.401 India FALSE
+defence research establishment in Asia Southern Asia FALSE 1 2021-02-03 224432662 way "Defence Avionics Research Establishment - DARE, A Narayanapura, Mahadevapura Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, India" landuse military 0.561844955490086 India FALSE
+delhi school of economics in Asia Southern Asia FALSE 1 2021-02-03 83554677 node "Delhi School of Economics, Chhatra Marg, Delhi University (North Campus), Civil Lines Tehsil, Central Delhi, Delhi, 110007, India" amenity college 0.401 India FALSE
+department of electrical engineering and computer science in Asia Southern Asia FALSE 1 2021-02-03 166771882 way "Department of Electrical engineering, IIT Bombay, Infinite Corridoor, Jyotiba Phule Nagar, S Ward, Zone 6, Mumbai, Mumbai Suburban, Maharashtra, 400076, INDIA, India" building university 0.401 India FALSE
+dpj in Asia Southern Asia FALSE 1 2021-02-03 2772343 node "Dharmapuri, Main Road, Dharmapuri, Dharmapuri District, Tamil Nadu, 636700, India" railway station 0.328369791841981 India FALSE
+entrepreneurship institute in Asia Southern Asia FALSE 1 2021-02-03 129614030 way "Xavier Institute of Management and Entrepreneurship, Shantipura Main Road, Electronics City Phase 2 (East), Bangalore South, Bangalore Urban, Karnataka, 560100, India" amenity university 0.587306266325387 India FALSE
+fisheries research in Asia Southern Asia FALSE 1 2021-02-03 120316625 way "Fisheries Research, Okha, Okhamandal Taluka, Devbhumi Dwaraka District, Gujarat, 361350, India" landuse commercial 0.4 India FALSE
+foxconn in Asia Southern Asia FALSE 1 2021-02-03 223452108 way "Foxconn, Sunguvarchatram, Sriperumbudur, Kanchipuram District, Tamil Nadu, India" landuse industrial 0.3 India FALSE
+genomics institute in Asia Southern Asia FALSE 1 2021-02-03 130622683 way "CSIR-Institute of Genomics & Integrative Biology, Mathura Road, Pocket A, Govindpuri, Kalkaji Tehsil, South East Delhi, Delhi, 1243, India" office government 0.462719188578863 India FALSE
+glenmark pharmaceuticals in Asia Southern Asia FALSE 1 2021-02-03 166823886 way "Glenmark Pharmaceuticals Ltd., Shendra MIDC, Aurangabad, Maharashtra, India" landuse industrial 0.4 India FALSE
+goa university in Asia Southern Asia FALSE 1 2021-02-03 302010537 way "Goa University, Library, Dr. E Borges Road, Dona Paula, Tiswadi, North Goa, Goa, 403004, India" amenity library 0.201 India FALSE
+google maps in Asia Southern Asia FALSE 1 2021-02-03 185532602 way "Vani Dahivi Road, Vani, Dindori, Nashik, Maharashtra, 422215, India" highway tertiary 0.1 India FALSE
+gslv in Asia Southern Asia FALSE 1 2021-02-03 71301324 node "GSLV Mk II rocket model, Veli- Perumathura road, Veli, Thiruvananthapuram, Kerala, 695001, India" tourism attraction 0.101 India FALSE
+guru gobind singh indraprastha university in Asia Southern Asia FALSE 1 2021-02-03 124450320 way "Guru Gobind Singh Indraprastha University, Road 205, Sector 17, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110078, India" amenity university 0.841762590849456 India FALSE
+hindu rao hospital in Asia Southern Asia FALSE 1 2021-02-03 85536497 node "Hindu Rao Hospital, Chhatra Marg, Delhi University (North Campus), Civil Lines Tehsil, Central Delhi, Delhi, 110007, India" amenity hospital 0.301 India FALSE
+hp labs in Asia Southern Asia FALSE 1 2021-02-03 15156752 node "HP Labs and HP India Sales, Hosur Road, Adugodi, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, 560095, India" building yes 0.201 India FALSE
+htc in Asia Southern Asia FALSE 1 2021-02-03 11364266 node "Hathras City, NH530B, Madan Lal Banswale, Hathras, Uttar Pradesh, 204101, India" railway station 0.331291305560682 India FALSE
+iia in Asia Southern Asia FALSE 1 2021-02-03 99960273 way "Indian Institute of Astrophysics, Koramangala 2nd Block, Koramangala, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, India" boundary wall 0.389453166408414 India FALSE
+iiser in Asia Southern Asia FALSE 1 2021-02-03 156513014 way "Indian Institute of Science Education and Research (IISER), Pune, IISER-NCL Inner road, Pashan, Pune City, Pune District, Maharashtra, 411008, India" amenity university 0.435695492967573 India FALSE
+indian agricultural research institute in Asia Southern Asia FALSE 1 2021-02-03 140318395 way "Indian Agricultural Research Institute, Aundh, Pune City, Pune District, Maharashtra, 411027, India" landuse farmland 0.6 India FALSE
+indian astronomical observatory in Asia Southern Asia FALSE 1 2021-02-03 180757589 way "Indian Astronomical Observatory, Hanle, Hanle-Ukdungle road, Leh, Leh District, Ladakh, India" man_made observatory 0.301 India FALSE
+indian institute of science bangalore in Asia Southern Asia FALSE 1 2021-02-03 259230417 relation "Indian Institute of Science, CV Raman Road, Malleswaram, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India" amenity university 0.960020321697533 India FALSE
+indian institute of science education and research kolkata in Asia Southern Asia FALSE 1 2021-02-03 174148762 way "IISER Kolkata, National Highway 34 Connector, Haringhata, Nadia, West Bengal, 741246, India" amenity university 0.101 India FALSE
+indian institute of technology bombay in Asia Southern Asia FALSE 1 2021-02-03 259128373 relation "Indian Institute of Technology Bombay, Powai, S Ward, Zone 6, Mumbai, Mumbai Suburban, Maharashtra, 400076, India" amenity university 0.913885190805925 India FALSE
+indian medical association in Asia Southern Asia FALSE 1 2021-02-03 15338881 node "Indian Medical Association, Albert Victor Road, Chamarajapete, Chamrajapet, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560 002, India" amenity library 0.301 India FALSE
+indian national congress in Asia Southern Asia FALSE 1 2021-02-03 221253786 way "Indian Trade Union Congress Nagar, Pudupalayam, Rajapalayam, Virudhunagar District, Tamil Nadu, 626117, India" highway residential 0.3 India FALSE
+indraprastha university in Asia Southern Asia FALSE 1 2021-02-03 124450320 way "Guru Gobind Singh Indraprastha University, Road 205, Sector 17, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110078, India" amenity university 0.541762590849456 India FALSE
+information centre in Asia Southern Asia FALSE 1 2021-02-03 5709828 node "Information Centre, Talala Taluka, Gir Somnath District, Gujarat, 362135, India" place locality 0.325 India FALSE
+institute for plasma research in Asia Southern Asia FALSE 1 2021-02-03 192038053 way "Institute For Plasma Research ,IPR,Bhat, Gandhinagar-Ahmedabad Highway, Bhat, Gandhinagar Taluka, Gandhinagar District, Gujarat, 382428, India" amenity college 0.401 India FALSE
+institute of aerospace medicine in Asia Southern Asia FALSE 1 2021-02-03 101944990 way "Institute of Aerospace Medicine - IAM, Airport Arrival Road, HAL Township, HAL Airport Ward, Mahadevapura Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, 560103, India" amenity college 0.401 India FALSE
+institute of electronics in Asia Southern Asia FALSE 1 2021-02-03 129614030 way "Xavier Institute of Management and Entrepreneurship, Shantipura Main Road, Electronics City Phase 2 (East), Bangalore South, Bangalore Urban, Karnataka, 560100, India" amenity university 0.687306266325387 India FALSE
+institute of microbial technology in Asia Southern Asia FALSE 1 2021-02-03 120906770 way "CSIR Institute for Microbial Technology, Pashchim Marg, Sector 39, Ward 9, Palsora, Chandigarh, 160039, India" amenity research_institute 0.54352463088163 India FALSE
+integrative biology in Asia Southern Asia FALSE 1 2021-02-03 130622683 way "CSIR-Institute of Genomics & Integrative Biology, Mathura Road, Pocket A, Govindpuri, Kalkaji Tehsil, South East Delhi, Delhi, 1243, India" office government 0.462719188578863 India FALSE
+jawaharlal nehru university in Asia Southern Asia FALSE 1 2021-02-03 95083567 way "Jawaharlal Nehru University, Bhagwan Mahavir Marg, Vasant Kunj, Vasant Vihar Tehsil, New Delhi, Delhi, 110067, India" amenity university 0.301 India FALSE
+jsps in Asia Southern Asia FALSE 1 2021-02-03 80164905 node "JSPS Government Homeopathic Medical College, Uppal Road, Bharat Nagar, Ward 8 Habsiguda, Greater Hyderabad Municipal Corporation East Zone, Hyderabad, Uppal mandal, Medchal–Malkajgiri, Telangana, 500013, India" amenity university 0.101 India FALSE
+kemri in Asia Southern Asia FALSE 1 2021-02-03 298924784 node "Kemri, Girwa Tehsil, Udaipur, Rajasthan, India" place hamlet 0.35 India FALSE
+kmt in Asia Southern Asia FALSE 1 2021-02-03 29584870 node "Khammam, Railway Station road, Gandhi chowk, Khammam_Urban mandal, Khammam, Telangana, 507002, India" railway station 0.239862222899095 India FALSE
+ligo-india in Asia Southern Asia FALSE 1 2021-02-03 234678680 way "LIGO India project site, Aundha (Nagnath), Hingoli, Maharashtra, India" landuse construction 0.4 India FALSE
+madras high court in Asia Southern Asia FALSE 1 2021-02-03 100230126 way "Madras High Court, North Fort Road, Island Grounds, Ward 60, Zone 5 Royapuram, Chennai, Chennai District, Tamil Nadu, 600009, India" amenity courthouse 0.767530366216316 India FALSE
+mdr tb in Asia Southern Asia FALSE 1 2021-02-03 302694362 way "MDR, Indore, Indore Tahsil, Madhya Pradesh, 452001, India" highway primary 0.2 India FALSE
+medical college in Asia Southern Asia FALSE 1 2021-02-03 49107221 node "Medical College, kudamaloor, Kottayam, Kerala, 686008, India" place quarter 0.45 India FALSE
+ministry of external affairs in Asia Southern Asia FALSE 1 2021-02-03 65278763 node "Ministry of External Affairs, Rajpath, Central Secretariat, Rakab Ganj, Chanakya Puri Tehsil, New Delhi, Delhi, 110001, India" office government 0.84541340693117 India FALSE
+ministry of finance in Asia Southern Asia FALSE 1 2021-02-03 64686582 node "Ministry of Finance, Rajpath, Central Secretariat, Rakab Ganj, Chanakya Puri Tehsil, New Delhi, Delhi, 110004, India" office government 0.723545743680597 India FALSE
+msc in Asia Southern Asia FALSE 1 2021-02-03 650745 node "Chennai Chetpat, McNichols Road, Ward 104, Zone 8 Anna Nagar, Chennai, Chennai District, Tamil Nadu, 600010, India" railway station 0.310439474412231 India FALSE
+nalco in Asia Southern Asia FALSE 1 2021-02-03 259264932 relation "NALCO, Anugul, Odisha, 759145, India" boundary administrative 0.55 India FALSE
+national centre for radio astrophysics in Asia Southern Asia FALSE 1 2021-02-03 154987972 way "National Centre for Radio Astrophysics, Pune Univesity Campus, Breman Chowk - Khadki Bazar Road, Mandalay Lines, Khadki, Pune City, Pune District, Maharashtra, 411007, India" amenity university 0.501 India FALSE
+national chemical laboratory in Asia Southern Asia FALSE 1 2021-02-03 105954638 way "National Chemical Laboratory, NCL Colony Road, Pune City, Pune District, Maharashtra, 411008, India" building yes 0.59350420583069 India FALSE
+national green tribunal in Asia Southern Asia FALSE 1 2021-02-03 212085570 way "National Green Tribunal, Faridkot House Lane, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India" building yes 0.301 India FALSE
+national institute of biomedical genomics in Asia Southern Asia FALSE 1 2021-02-03 68325867 node "National Institute of Biomedical Genomics, SH1, Gayespur, Chakdah, Nadia, West Bengal, 741232, India" office educational_institution 0.501 India FALSE
+national law university in Asia Southern Asia FALSE 1 2021-02-03 138974523 way "National Law University, Road 205, Sector 13, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110078, India" amenity university 0.602323854176492 India FALSE
+nmda in Asia Southern Asia FALSE 1 2021-02-03 14578782 node "New Morinda Junction, Ludhiana-Chandigarh Highway, Sukho Majra, Chamkaur Sahib Tahsil, Rupnagar, Punjab, 140101, India" railway station 0.001 India FALSE
+nstl in Asia Southern Asia FALSE 1 2021-02-03 244047342 way "nstl road, Susarla Colony, Visakhapatnam, Visakhapatnam (Urban), Visakhapatnam, Andhra Pradesh, 530001, India" highway residential 0.2 India FALSE
+nuclear power corporation of india in Asia Southern Asia FALSE 1 2021-02-03 161045684 way "Nuclear Power Research Corporation of India - NPCI, Benniganahalli Ward, East Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, India" landuse commercial 0.7 India FALSE
+onb in Asia Southern Asia FALSE 1 2021-02-03 26652731 node "O N B, Naduvattom, Beypore Road, Kozhikode Municipal Corporation - Beypore zone, Beypore, Kozhikode, Kozhikode district, Kerala, 673015, India" building yes 0.001 India FALSE
+open access india in Asia Southern Asia FALSE 1 2021-02-03 107854140 way "Buddha Park Access Rd., Kanpur, Kanpur Nagar, Uttar Pradesh, 208012, India" highway residential 0.3 India FALSE
+phat in Asia Southern Asia FALSE 1 2021-02-03 81736230 node "Phat, Palampur, Kangra, Himachal Pradesh, 176102, India" place village 0.375 India FALSE
+raja ramanna centre for advanced technology in indore in Asia Southern Asia FALSE 1 2021-02-03 136320888 way "Raja Ramanna Centre for Advanced Technology, Rau-Indore road, Indore, Indore Tahsil, Madhya Pradesh, 452001, India" amenity university 0.801 India FALSE
+ranbaxy in Asia Southern Asia FALSE 1 2021-02-03 715218 node "Ranbaxy, Service Road, Sector 18, Gurgaon, Gurugram, Haryana, 122010, India" landuse commercial 0.101 India FALSE
+regenerative medicine in Asia Southern Asia FALSE 1 2021-02-03 226982489 way "Institute For Stem Cell Science and Regenerative Medicine, 5th Main Road, Canara Bank Layout, Vidyaranyapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560065, India" building yes 0.201 India FALSE
+regenerative medicine center in Asia Southern Asia FALSE 1 2021-02-03 226982489 way "Institute For Stem Cell Science and Regenerative Medicine, 5th Main Road, Canara Bank Layout, Vidyaranyapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560065, India" building yes 0.201 India FALSE
+science and research in Asia Southern Asia FALSE 1 2021-02-03 83813152 node "KPR College of Arts, Science and Research, KPR college road, Coimbatore, Sulur, Coimbatore District, Tamil Nadu, 641407, India" office educational_institution 0.301 India FALSE
+serum institute in Asia Southern Asia FALSE 1 2021-02-03 104626139 way "Serum Institute Road, Aivarakandapura, Bangalore North, Bangalore Urban, Karnataka, 560088, India" highway secondary 0.3 India FALSE
+shiv nadar university in Asia Southern Asia FALSE 1 2021-02-03 174803369 way "Hostel 2A, 2011 Street, Chithera, Dadri, Gautam Buddha Nagar, Uttar Pradesh, 201314, India" tourism hostel 0.001 India FALSE
+sinochem in Asia Southern Asia FALSE 1 2021-02-03 153854957 way "DSM Sinochem Pharmaceutical Industries, Balachaur Tahsil, Shaheed Bhagat Singh Nagar, Punjab, India" landuse industrial 0.3 India FALSE
+space science institute in Asia Southern Asia FALSE 1 2021-02-03 176056727 way "Indian Institute of Space Science and Technology, Trivandrum, Manoorkonam-panacode, Maannoorkkonam, Nedumangad, Thiruvananthapuram, Kerala, 695547, India" amenity university 0.676937105996802 India FALSE
+sri sathya sai university in Asia Southern Asia FALSE 1 2021-02-03 296017694 node "Sri Sathya Sai Loka Seva Pre University College, SH100, Alike, Bantwal taluk, Dakshina Kannada, Karnataka, 574235, India" amenity college 0.401 India FALSE
+sse in Asia Southern Asia FALSE 1 2021-02-03 177888378 way "Sholapur Airport, Hotgi Road, Ratandeep Housing Society, Ramlal Nagar, Solapur North, Solapur, Maharashtra, 413007, India" aeroway aerodrome 0.390444593674683 India FALSE
+state supreme court in Asia Southern Asia FALSE 1 2021-02-03 258928765 relation "Supreme Court, Tilak Marg, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India" amenity courthouse 0.700289443464696 India FALSE
+tata institute in Asia Southern Asia FALSE 1 2021-02-03 259230417 relation "Indian Institute of Science, CV Raman Road, Malleswaram, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India" amenity university 0.560020321697533 India FALSE
+tata institute of social sciences in Asia Southern Asia FALSE 1 2021-02-03 175114004 way "Tata Institute of Social Sciences, NIRD Rd, Rajendra Nagar, Ward 60 Rajendra Nagar, Greater Hyderabad Municipal Corporation South Zone, Hyderabad, Rajendranagar mandal, Rangareddy, Telangana, 500030, India" building yes 0.501 India FALSE
+technology and research in Asia Southern Asia FALSE 1 2021-02-03 168546735 way "Technology and Research, Kh road, Sector 14, Gandhinagar, Gandhinagar Taluka, Gandhinagar District, Gujarat, 382024, India" amenity college 0.301 India FALSE
+times of india in Asia Southern Asia FALSE 1 2021-02-03 47081191 node "Times of India, Rest House Crescent Road, Shantala Nagar, East Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, BENGALURU, India" office newspaper 0.301 India FALSE
+tuberculosis research centre in Asia Southern Asia FALSE 1 2021-02-03 143672353 way "Tuberculosis Research Institute, Club Road, Chetpet, Ward 107, Zone 8 Anna Nagar, Chennai, Chennai District, Tamil Nadu, 600 006, India" amenity college 0.201 India FALSE
+uaa in Asia Southern Asia FALSE 1 2021-02-03 56392022 node "Uppala, LR, Uppala, Manjeswaram, Kasaragod, Kerala, 671322, India" railway station 0.299997827209804 India FALSE
+united nations children's fund in Asia Southern Asia FALSE 1 2021-02-03 143582995 way "United Nations Childrens' Fund (UNICEF) - India, K. K. Birla Lane, Lodhi Estate, Chanakya Puri Tehsil, New Delhi, Delhi, 110003, India" office government 0.501 India FALSE
+united technologies corporation in Asia Southern Asia FALSE 1 2021-02-03 75181630 node "United Technologies Corp, Durgam Cheruvu Road, Madhapur, Ward 104 Kondapur, Hyderabad, Serilingampalle mandal, Rangareddy, Telangana, 996544, India" office company 0.201 India FALSE
+university of delhi south campus in Asia Southern Asia FALSE 1 2021-02-03 205692666 way "Benito Juarez Marg, Delhi Cantonment, New Delhi, Delhi, 110057, India" highway tertiary 0.2 India FALSE
+university of mysore in Asia Southern Asia FALSE 1 2021-02-03 183116886 way "University of Mysore, Chamaraja Double Road, Chamarajapuram, Mysuru, Mysuru taluk, Mysuru district, Karnataka, 570001, India" amenity university 0.667707938540516 India FALSE
+university of pune in Asia Southern Asia FALSE 1 2021-02-03 120165826 way "Department of Geography, विदà¥<8d>यापीठरसà¥<8d>ता, Aundh, Khadki, Pune City, Pune District, Maharashtra, 411 007, India" amenity college 0.201 India FALSE
+us catholics in Asia Southern Asia FALSE 1 2021-02-03 246582495 way "St. Augustine Roman Catholics Latin Church, Murukkumpuzha, chirayinkeezhu-Thiruvananthapuram Road, Azhoor, Thiruvananthapuram, Kerala, 695302, India" amenity place_of_worship 0.201 India FALSE
+wadia institute of himalayan geology in Asia Southern Asia FALSE 1 2021-02-03 158407716 way "Wadia Institute of Himalayan Geology, General Mahadev Singh (GMS) Road, Ashirwad Enclave, Dehradun, 248001, India" amenity school 0.501 India FALSE
+bar-ilan university il Asia Western Asia FALSE 1 2021-02-03 103805843 way "×<90>×•× ×™×‘×¨×¡×™×˜×ª בר ×<90>ילן, השקד, רמת ×<90>ילן, גבעת שמו×<90>ל, × ×¤×ª פתח תקווה, מחוז המרכז, no, ישר×<90>ל" amenity university 0.517808168627706 ישר×<90>ל FALSE
+barzilai il Asia Western Asia FALSE 1 2021-02-03 103366196 way "ברזילי, גיבתון, רחובות, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל" highway residential 0.1 ישר×<90>ל FALSE
+better place il Asia Western Asia FALSE 1 2021-02-03 22147093 node "Better Place, 65, מועצה ×<90>זורית גליל תחתון, × ×¤×ª יזרע×<90>ל, מחוז הצפון, no, ישר×<90>ל" amenity fuel 0.201 ישר×<90>ל FALSE
+israel border police il Asia Western Asia FALSE 1 2021-02-03 160962387 way "משמר הגבול, מוס×<90> סייק, קרית ×ž× ×—×<9d> בגין, الشيخ جراØ, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" amenity police 0.001 ישר×<90>ל FALSE
+meteorological service il Asia Western Asia FALSE 1 2021-02-03 119417889 way "המכון המט×<90>ורולוגי, 4, ×<90>זור תעשייה ×’, ר×<90>שון לציון, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל" office government 0.324987614684334 ישר×<90>ל FALSE
+saab il Asia Western Asia FALSE 1 2021-02-03 258610150 relation "شعب‎, × ×¤×ª עכו, מחוז הצפון, ישר×<90>ל" boundary administrative 0.390771556772395 ישר×<90>ל FALSE
+technion il Asia Western Asia FALSE 1 2021-02-03 112050731 way "×˜×›× ×™×•×Ÿ, קרית ×”×˜×›× ×™×•×Ÿ, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" highway platform 0.1 ישר×<90>ל FALSE
+technion — israel institute of technology il Asia Western Asia FALSE 1 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+technion institute il Asia Western Asia FALSE 1 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+technion institute of technology il Asia Western Asia FALSE 1 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+technion israel institute of technology il Asia Western Asia FALSE 1 2021-02-03 107068371 way "×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל" amenity university 0.481395763639811 ישר×<90>ל FALSE
+tel aviv university in israel il Asia Western Asia FALSE 1 2021-02-03 58968232 node "×”×˜×›× ×™×•×Ÿ, מרדכי מקלף, תל ×<90>ביב - יפו, ×’× ×™ ×©×¨×•× ×”, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל" amenity university 0.001 ישר×<90>ל FALSE
+un office for the coordination of humanitarian affairs il Asia Western Asia FALSE 1 2021-02-03 6354500 node "UN Office for the Coordination of Humanitarian Affairs (OCHA), ×—×™×™×<9d> ברלב, باب الساهرة, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל" amenity public_building 0.801 ישר×<90>ל FALSE
+wright brothers il Asia Western Asia FALSE 1 2021-02-03 123047810 way "×”×<90>×—×™×<9d> רייט, ×<90>גמי×<9d>, רמת ידין, × ×ª× ×™×”, × ×¤×ª השרון, מחוז המרכז, no, ישר×<90>ל" highway residential 0.1 ישר×<90>ל FALSE
+abbvie ie Europe Northern Europe FALSE 1 2021-02-03 258648097 relation "AbbVie, Calry ED, Sligo Municipal Borough District, County Sligo, Connacht, F91 XH39, Éire / Ireland" landuse industrial 0.3 Éire / Ireland FALSE
+alexion ie Europe Northern Europe FALSE 1 2021-02-03 203009581 way "Alexion, Cruiserath Road, College Business & Technology Park, Blanchardstown-Mulhuddart ED, Blanchardstown, Fingal, Dublin 15, Leinster, D15 R925, Éire / Ireland" man_made works 0.101 Éire / Ireland FALSE
+ardi ie Europe Northern Europe FALSE 1 2021-02-03 226577 node "Ardee, The Municipal District of Ardee, County Louth, Leinster, A92 H006, Éire / Ireland" place town 0.370185956704757 Éire / Ireland FALSE
+cams ie Europe Northern Europe FALSE 1 2021-02-03 258628095 relation "Cams, Drumfin ED, Ballymote-Tubbercurry Municipal District, County Sligo, Connacht, Éire / Ireland" boundary administrative 0.35 Éire / Ireland FALSE
+county kildare ie Europe Northern Europe FALSE 1 2021-02-03 258403200 relation "County Kildare, Leinster, Éire / Ireland" boundary administrative 0.723362011212736 Éire / Ireland FALSE
+intel ireland ie Europe Northern Europe FALSE 1 2021-02-03 188372471 way "Intel Ireland, Collinstown Industrial Park, Leixlip ED, The Municipal District of Celbridge — Leixlip, County Kildare, Leinster, W23 N2T7, Éire / Ireland" highway service 0.275 Éire / Ireland FALSE
+maynooth university ie Europe Northern Europe FALSE 1 2021-02-03 55317797 node "Dance, River Apartments, Maynooth ED, The Municipal District of Clane — Maynooth, County Kildare, Leinster, KILDARE, Éire / Ireland" tourism artwork 0.101 Éire / Ireland FALSE
+mayo foundation ie Europe Northern Europe FALSE 1 2021-02-03 39624203 node "Hospice Shop, Market Street, Ballina Urban ED, Ballina Municipal District, County Mayo, Connacht, F26 P6C1, Éire / Ireland" shop charity 0.101 Éire / Ireland FALSE
+merck sharp & dohme ie Europe Northern Europe FALSE 1 2021-02-03 5765653 node "Merck Sharp & Dohme, R448, Pollerton Little, Carlow Rural, The Municipal District of Carlow, County Carlow, Leinster, R93 Y381, Éire / Ireland" man_made works 0.301 Éire / Ireland FALSE
+national university of ireland ie Europe Northern Europe FALSE 1 2021-02-03 148002637 way "National University of Ireland, 49, Merrion Square East, Dublin, Dublin 2, Leinster, DO2 VY60, Éire / Ireland" building house 0.401 Éire / Ireland FALSE
+national university of ireland galway ie Europe Northern Europe FALSE 1 2021-02-03 128311337 way "National University of Ireland, Galway, University Road, Nun's Island, Galway Municipal District, Cathair na Gaillimhe, County Galway, Connacht, H91 F5Y3, Éire / Ireland" amenity university 0.501 Éire / Ireland FALSE
+ncbi ie Europe Northern Europe FALSE 1 2021-02-03 297995042 node "NCBI, High Street, Kilkenny No.1 Urban, The Municipal District of Kilkenny City, County Kilkenny, Leinster, R95 V6TE, Éire / Ireland" shop charity 0.101 Éire / Ireland FALSE
+ncse ie Europe Northern Europe FALSE 1 2021-02-03 76554855 node "National Council for Special Education, Heritage Business Park, Mahon Industrial Estate, Mahon, Mahon B, Cork, County Cork, Munster, T12 XK5R, Éire / Ireland" office government 0.001 Éire / Ireland FALSE
+newgrange ie Europe Northern Europe FALSE 1 2021-02-03 96120841 way "Newgrange, Towpath, Duleek, The Municipal District of Laytown — Bettystown, County Meath, Leinster, C15 XW28, Éire / Ireland" tourism attraction 0.529041378051631 Éire / Ireland FALSE
+noc ie Europe Northern Europe FALSE 1 2021-02-03 133056952 way "Ireland West Airport Knock, R376, Sonnagh ED, Claremorris-Swinford Municipal District, County Mayo, Connacht, Éire / Ireland" aeroway aerodrome 0.402778707896871 Éire / Ireland FALSE
+pheic ie Europe Northern Europe FALSE 1 2021-02-03 258835961 relation "Peakroe, Aughrim ED, Athenry-Oranmore Municipal District, County Galway, Connacht, Éire / Ireland" boundary administrative 0.25 Éire / Ireland FALSE
+physics division ie Europe Northern Europe FALSE 1 2021-02-03 94426972 way "Science Centre (North), Route1, Roebuck, Dundrum ED, Dundrum, Dún Laoghaire-Rathdown, County Dublin, Leinster, D04 XT65, Éire / Ireland" building university 0.001 Éire / Ireland FALSE
+research and development division ie Europe Northern Europe FALSE 1 2021-02-03 83761129 node "HSE, Research and Development, Parkgate Street, Islandbridge, Phoenix Park ED, Dublin, Dublin 8, Leinster, D08 YFF1, Éire / Ireland" office government 0.301 Éire / Ireland FALSE
+thermo fisher ie Europe Northern Europe FALSE 1 2021-02-03 98913796 way "Thermo-Fisher, Carrigaline, Ballincollig - Carrigaline, County Cork, Munster, Éire / Ireland" landuse industrial 0.4 Éire / Ireland FALSE
+ucd ie Europe Northern Europe FALSE 1 2021-02-03 6829023 node "UCD, Wynnsward Drive, Roebuck, Clonskeagh-Belfield ED, Dundrum, Dún Laoghaire-Rathdown, County Dublin, Leinster, D14 NH72, Éire / Ireland" place house 0.101 Éire / Ireland FALSE
+university college cork ie Europe Northern Europe FALSE 1 2021-02-03 219587720 way "IRA Volunteers Memorial and Gravesite, College Road, Gillabbey B, Cork, County Cork, Munster, T12 ND89, Éire / Ireland" historic memorial 0.201 Éire / Ireland FALSE
+apha id Asia South-Eastern Asia FALSE 1 2021-02-03 13638301 node "Apha, Sawang, Aceh Selatan, Aceh, Indonesia" place village 0.375 Indonesia FALSE
+bandung institute of technology id Asia South-Eastern Asia FALSE 1 2021-02-03 132073472 way "Institut Teknologi Bandung, 10-12, Ganesha, Lebak Siliwangi, Jawa Barat, 40132, Indonesia" amenity university 0.546170188407265 Indonesia FALSE
+bandung institute of technology indonesia id Asia South-Eastern Asia FALSE 1 2021-02-03 132073472 way "Institut Teknologi Bandung, 10-12, Ganesha, Lebak Siliwangi, Jawa Barat, 40132, Indonesia" amenity university 0.646170188407265 Indonesia FALSE
+bina nusantara university id Asia South-Eastern Asia FALSE 1 2021-02-03 301970874 way "Universitas BINUS (Bina Nusantara) Kampus Syahdan, 9, Jalan KH. Syahdan, RW 12, Palmerah, Jakarta Barat, Daerah Khusus Ibukota Jakarta, 11480, Indonesia" amenity university 0.201 Indonesia FALSE
+cctv id Asia South-Eastern Asia FALSE 1 2021-02-03 73875815 node "CCTV, Turgo, Dusun Tegalmindi, Sleman, Daerah Istimewa Yogyakarta, 55786, Indonesia" leisure park 0.25 Indonesia FALSE
+center for international forestry research id Asia South-Eastern Asia FALSE 1 2021-02-03 242934787 way "Center for International Forestry Research (CIFOR), Situ Gede, Jawa Barat, 16115, Indonesia" landuse research 0.786244954737813 Indonesia FALSE
+cifor id Asia South-Eastern Asia FALSE 1 2021-02-03 154300870 way "Cifor, Bubulak, Jawa Barat, 16112, Indonesia" highway trunk 0.2 Indonesia FALSE
+department of pharmacy id Asia South-Eastern Asia FALSE 1 2021-02-03 161761878 way "Departemen Farmasi, Jalan Profesor Dokter Mahar Mardjono, Pondok Cina, Jawa Barat, 16424, Indonesia" building yes 0.101 Indonesia FALSE
+eijkman institute for molecular biology id Asia South-Eastern Asia FALSE 1 2021-02-03 199379553 way "Lembaga Eijkman, 69, Jalan Pangeran Diponegoro, RW 05, Kenari, Senen, Jakarta Pusat, Daerah Khusus Ibukota Jakarta, 10430, Indonesia" building yes 0.101 Indonesia FALSE
+gadjah mada university id Asia South-Eastern Asia FALSE 1 2021-02-03 117923558 way "Gadjah Mada University Press, Jalan Teknika, Pogung Baru, Sinduadi, Mlati, Sleman, Daerah Istimewa Yogyakarta, 55222, Indonesia" craft bookbinder 0.301 Indonesia FALSE
+google earth id Asia South-Eastern Asia FALSE 1 2021-02-03 210747083 way "Jalan Saxophone, RW 05, Kel.Tunggulwulung, Landungsari, Malang, Jawa Timur, 65144, Indonesia" highway service 0.075 Indonesia FALSE
+inaoe id Asia South-Eastern Asia FALSE 1 2021-02-03 13470927 node "Inaoe, Rote Ndao, Nusa Tenggara Timur, Indonesia" place village 0.375 Indonesia FALSE
+la stampa id Asia South-Eastern Asia FALSE 1 2021-02-03 13921820 node "Stampa, Tapanuli Selatan, Sumatera Utara, Indonesia" place village 0.475 Indonesia FALSE
+laetoli id Asia South-Eastern Asia FALSE 1 2021-02-03 10742285 node "Bulu Latoli, Sulawesi Selatan, Indonesia" natural peak 0.3 Indonesia FALSE
+liang bua id Asia South-Eastern Asia FALSE 1 2021-02-03 51149275 node "Liang Bua, Jalan Ruteng-Reo, Barang, Manggarai, Nusa Tenggara Timur, Indonesia" natural cave_entrance 0.588895403331395 Indonesia FALSE
+mai-mai id Asia South-Eastern Asia FALSE 1 2021-02-03 13953284 node "Mai Mai, Papua Barat, Indonesia" place village 0.475 Indonesia FALSE
+national institute of aeronautics and space id Asia South-Eastern Asia FALSE 1 2021-02-03 198403505 way "LAPAN, 1, Jalan Pemuda, RW 08, Jati, Pulo Gadung, Jakarta Timur, Daerah Khusus Ibukota Jakarta, 13220, Indonesia" office government 0.416374248267951 Indonesia FALSE
+nda id Asia South-Eastern Asia FALSE 1 2021-02-03 136395382 way "Bandar Udara Bandaneira, Jl. Rajawali, Kampung Baru, Kepulauan Banda, Maluku, 97593, Indonesia" aeroway aerodrome 0.488670877038008 Indonesia FALSE
+padjadjaran university id Asia South-Eastern Asia FALSE 1 2021-02-03 233157303 way "Universitas Padjadjaran, Jalan Raya Jatinangor, Bandung, Jawa Barat, 45363, Indonesia" amenity university 0.101 Indonesia FALSE
+pdip id Asia South-Eastern Asia FALSE 1 2021-02-03 72671249 node "PDIP, Jalan Kinibalu, Banjarmasin, Kalimantan Selatan, 70114, Indonesia" office political_party 0.101 Indonesia FALSE
+pedot id Asia South-Eastern Asia FALSE 1 2021-02-03 10559819 node "Gunung Pedot, Jember, Jawa Timur, Indonesia" natural peak 0.4 Indonesia FALSE
+ppr id Asia South-Eastern Asia FALSE 1 2021-02-03 225747104 way "Bandar Udara Pasir Pangaraian, Jalan Rambah Utama, Kecamatan Rambah Samo, Rokan Hulu, Riau, Indonesia" aeroway aerodrome 0.324987614684334 Indonesia FALSE
+saiful islam id Asia South-Eastern Asia FALSE 1 2021-02-03 206069525 way "Dokter Hewan Saiful Islam, Jalan Awang Long, Gunung Elai, Kalimantan Timur, 75311, Indonesia" amenity veterinary 0.201 Indonesia FALSE
+southwest melas id Asia South-Eastern Asia FALSE 1 2021-02-03 13958295 node "Melas, Karo, Sumatera Utara, 22152, Indonesia" place village 0.375 Indonesia FALSE
+srg id Asia South-Eastern Asia FALSE 1 2021-02-03 196603793 way "Bandar Udara Ahmad Yani, Jalan Taman Avonia VI, RW 04, Jerakah, Jawa Tengah, 50144, Indonesia" aeroway aerodrome 0.394667642378454 Indonesia FALSE
+university of gadjah mada id Asia South-Eastern Asia FALSE 1 2021-02-03 207160405 way "Universitas Kanjuruhan, Jalan Sudanco Supriyadi, RW 06 Kel. Sukun, Sukun, Kota Malang, Bandungrejosari, Malang, Jawa Timur, 65147, Indonesia" amenity university 0.001 Indonesia FALSE
+biologicals e hu Europe Eastern Europe FALSE 1 2021-02-03 146927310 way "82, GlaxoSmithKline Biologicals Gyógyszergyártó és Forgalmazó Kft., Haraszt, Gödöllő, Gödöllői járás, Pest megye, Közép-Magyarország, 2100, Magyarország" landuse industrial 0.4 Magyarország FALSE
+eötvös university hu Europe Eastern Europe FALSE 1 2021-02-03 123965591 way "Eötvös Loránd Tudományegyetem Bölcsészettudományi Kar, 4-8, Múzeum körút, Belváros, V. kerület, Budapest, Közép-Magyarország, 1088, Magyarország" amenity university 0.659079404587545 Magyarország FALSE
+fodor hu Europe Eastern Europe FALSE 1 2021-02-03 162880526 way "Fodor, Teleki utca, Dunafalva, Bajai járás, Bács-Kiskun megye, Dél-Alföld, Alföld és Észak, 6513, Magyarország" amenity pub 0.101 Magyarország FALSE
+fold hu Europe Eastern Europe FALSE 1 2021-02-03 46893027 node "Föld, Ifjúsági sétány, Népliget, X. kerület, Budapest, Közép-Magyarország, 1101, Magyarország" tourism artwork 0.378282845036744 Magyarország FALSE
+kaposi hu Europe Eastern Europe FALSE 1 2021-02-03 66535112 node "Kaposi, Erdőbénye, Tokaji járás, Borsod-Abaúj-Zemplén megye, Észak-Magyarország, Alföld és Észak, 3932, Magyarország" place locality 0.225 Magyarország FALSE
+kek hu Europe Eastern Europe FALSE 1 2021-02-03 258398258 relation "Kék, Kemecsei járás, Szabolcs-Szatmár-Bereg megye, Észak-Alföld, Alföld és Észak, 4515, Magyarország" boundary administrative 0.448129702072077 Magyarország FALSE
+national university of public service hu Europe Eastern Europe FALSE 1 2021-02-03 258425305 relation "Nemzeti Közszolgálati Egyetem, 2, Ludovika tér, Orczy Fórum Városközpont, Orczy negyed, VIII. kerület, Budapest, Közép-Magyarország, 1083, Magyarország" amenity university 0.001 Magyarország FALSE
+nistar hu Europe Eastern Europe FALSE 1 2021-02-03 60976160 node "Nyistár, Bakonya, Pécsi járás, Baranya megye, Dél-Dunántúl, Dunántúl, 7675, Magyarország" place locality 0.125 Magyarország FALSE
+office of diversity hu Europe Eastern Europe FALSE 1 2021-02-03 157561731 way "Diversity, Ã<81>sotthalom, Mórahalmi járás, Csongrád-Csanád megye, Dél-Alföld, Alföld és Észak, 6783, Magyarország" natural grassland 0.3 Magyarország FALSE
+tass hu Europe Eastern Europe FALSE 1 2021-02-03 258122144 relation "Tass, Kunszentmiklósi járás, Bács-Kiskun megye, Dél-Alföld, Alföld és Észak, 6098, Magyarország" boundary administrative 0.532228989952608 Magyarország FALSE
+tokai hu Europe Eastern Europe FALSE 1 2021-02-03 258396132 relation "Tokaj, Tokaji járás, Borsod-Abaúj-Zemplén megye, Észak-Magyarország, Alföld és Észak, Magyarország" boundary administrative 0.519419743521435 Magyarország FALSE
+un refugee agency hu Europe Eastern Europe FALSE 1 2021-02-03 122135603 way "ENSZ Menekültügyi Főbiztosság, 5/A-D, Ipoly utca, Újlipótváros, XIII. kerület, Budapest, Közép-Magyarország, 1133, Magyarország" office government 0.001 Magyarország FALSE
+university of szeged hu Europe Eastern Europe FALSE 1 2021-02-03 258169251 relation "Szegedi Tudományegyetem, 13, Dugonics tér, Belváros, Szeged, Szegedi járás, Csongrád-Csanád megye, Dél-Alföld, Alföld és Észak, 6720, Magyarország" building university 0.577156057530702 Magyarország FALSE
+civil protection department ht Americas Caribbean FALSE 1 2021-02-03 212453122 way "Protection Civil SMA, Saint Michel de l’Attalaye, Commune de Saint Michel de l'Attalaye, Arrondissement de Marmelade, Département de l'Artibonite, HT4520, Ayiti" landuse residential 0.4 Ayiti FALSE
+commerce department ht Americas Caribbean FALSE 1 2021-02-03 169235488 way "Rue du Commerce, Grande Passe, 1re Paricot, Bois Marguerite, Commune Port-à -Piment, Arrondissement des Côteaux, Département du Sud, Ayiti" highway unclassified 0.2 Ayiti FALSE
+international medical corps ht Americas Caribbean FALSE 1 2021-02-03 16244363 node "International Medical Corps, RC 700A, 1re Maniche, Maniche, Commune Maniche, Arrondissement des Cayes, Département du Sud, Ayiti" amenity doctors 0.301 Ayiti FALSE
+iscf ht Americas Caribbean FALSE 1 2021-02-03 21279485 node "InstitutionScolaire Claire Fontaine, Ruelle Capois la mort, Cité Blue Hills, 3e Petite Anse, Cap-Haïtien, Commune Cap-Haïtien, Arrondissement de Cap-Haïtien, Département du Nord, HT1113, Ayiti" amenity school 0.001 Ayiti FALSE
+mandon ht Americas Caribbean FALSE 1 2021-02-03 5667738 node "Mandon, Commune Cavaillon, Arrondissement d’Aquin, Département du Sud, Ayiti" place village 0.375 Ayiti FALSE
+time department ht Americas Caribbean FALSE 1 2021-02-03 71519977 node "Break Time Bar Restaurant, 25, Rue Oreste Zamor, Les Lattes, 1re Juanaria, Hinche, Commune Hinche, Arrondissement de Hinche, Département du Centre, 5110, Ayiti" amenity restaurant 0.101 Ayiti FALSE
+brac hr Europe Southern Europe FALSE 1 2021-02-03 258816711 relation "BraÄ<8d>, Splitsko-dalmatinska županija, Hrvatska" place island 0.480082774710875 Hrvatska FALSE
+pag hr Europe Southern Europe FALSE 1 2021-02-03 258305699 relation "Pag, Zadarska županija, Hrvatska" place island 0.559094572124133 Hrvatska FALSE
+university of rijeka hr Europe Southern Europe FALSE 1 2021-02-03 103463556 way "Kampus Trsat, Tome Strižića, MarÄ<8d>i, Mjesni odbor Gornja Vežica, Grad Rijeka, Primorsko-goranska županija, 51216, Hrvatska" amenity university 0.101 Hrvatska FALSE
+university of split hr Europe Southern Europe FALSE 1 2021-02-03 124254987 way "SveuÄ<8d>iliÅ¡te u Splitu, VranÄ<8d>ićeva, Pisano Kame, Split 3, Split, Grad Split, Splitsko-dalmatinska županija, 21111, Hrvatska" amenity university 0.101 Hrvatska FALSE
+caprisa hn Americas Central America FALSE 1 2021-02-03 186241405 way "Caprisa, 4a Calle, Centro de Comayagüela, Comayagüela, Tegucigalpa, Distrito Central, Francisco Morazán, 12101, Honduras" shop yes 0.101 Honduras FALSE
+minister of industry gy Americas South America FALSE 1 2021-02-03 58959117 node "Minister office MOA, Shiv Chanderpaul Drive, Queenstown, City of Georgetown, Plaisance-Industry Local Government, Demerara-Mahaica, 413741, Guyana" office government 0.301 Guyana FALSE
+alexander fleming biomedical sciences research centre gr Europe Southern Europe FALSE 1 2021-02-03 174584668 way "ΕÏ<81>ευνητικό ΚÎντÏ<81>ο ΒιοϊατÏ<81>ικών Επιστημών «ΑλÎξανδÏ<81>ος ΦλÎμιγκ», 34, ΦλÎμινγκ, ΒάÏ<81>κιζα, Κοινότητα ΒάÏ<81>ης, Δημοτική Ενότητα ΒάÏ<81>ης, Δήμος ΒάÏ<81>ης - ΒοÏ<8d>λας - ΒουλιαγμÎνης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Ανατολικής Αττικής, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 16672, Ελλάδα" building office 0.001 Ελλάδα FALSE
+aristotle university of thessaloniki gr Europe Southern Europe FALSE 1 2021-02-03 89323602 way "Τμήμα Ψυχολογίας, ΗÏ<81>ακλείας, ΣαÏ<81>άντα Εκκλησίες, 1ο Δημοτικό ΔιαμÎÏ<81>ισμα Θεσσαλονίκης, Δημοτική Ενότητα Θεσαλονίκης, Δήμος Θεσσαλονίκης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Θεσσαλονίκης, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 546 36, Ελλάδα" amenity university 0.476021686869768 Ελλάδα FALSE
+athena swan gr Europe Southern Europe FALSE 1 2021-02-03 373873 node "Αθήνα, Αθήνα - Θεσσαλονίκη - ΕÏ<8d>ζωνοι, ΤσαλαβοÏ<8d>τα, 4ο Δημοτικό ΔιαμÎÏ<81>ισμα ΠεÏ<81>ιστεÏ<81>ίου, Δήμος ΠεÏ<81>ιστεÏ<81>ίου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΔυτικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 12131, Ελλάδα" highway motorway_junction 0.369728853996096 Ελλάδα FALSE
+bank of greece gr Europe Southern Europe FALSE 1 2021-02-03 258543457 relation "ΤÏ<81>άπεζα της Ελλάδος, Σταδίου, Ακαδημία, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 10561, Ελλάδα" building public 0.439838583226862 Ελλάδα FALSE
+cha gr Europe Southern Europe FALSE 1 2021-02-03 258578670 relation "ΧαÎ, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Ρόδου, ΠεÏ<81>ιφÎÏ<81>εια Î<9d>οτίου Αιγαίου, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αιγαίου, Ελλάδα" place island 0.325 Ελλάδα FALSE
+cyta gr Europe Southern Europe FALSE 1 2021-02-03 59992481 node "Cyta, 15, ΦιλυÏ<81>ών, Κάτω ΗλιοÏ<8d>πολη, ΕÏ<8d>οσμος, Κοινότητα Ευόσμου, Δημοτική Ενότητα Ευόσμου, Δήμος ΚοÏ<81>δελιοÏ<8d> - Ευόσμου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Θεσσαλονίκης, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 56224, Ελλάδα" shop mobile_phone 0.101 Ελλάδα FALSE
+delphi gr Europe Southern Europe FALSE 1 2021-02-03 123422309 way "Δελφοί, Λιβαδειάς - Άμφισσας, Κοινότητα Δελφών, Δημοτική Ενότητα Δελφών, Δήμος Δελφών, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Φωκίδας, ΠεÏ<81>ιφÎÏ<81>εια ΣτεÏ<81>εάς Ελλάδος, ΑποκεντÏ<81>ωμÎνη Διοίκηση Θεσσαλίας - ΣτεÏ<81>εάς Ελλάδος, 33054, Ελλάδα" tourism attraction 0.582802507745551 Ελλάδα FALSE
+earthquake administration gr Europe Southern Europe FALSE 1 2021-02-03 108990987 way "ΕÏ<81>γαστήÏ<81>ιο Αντισεισμικής Τεχνολογίας, ΚοκκινοποÏ<8d>λου, Δήμος ΖωγÏ<81>άφου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 15773, Ελλάδα" amenity laboratory 0.001 Ελλάδα FALSE
+eridani gr Europe Southern Europe FALSE 1 2021-02-03 97771831 way "ΗÏ<81>ιδανοÏ<8d>, Κολωνάκι, Αμπελόκηποι, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 11521, Ελλάδα" highway residential 0.1 Ελλάδα FALSE
+foodini gr Europe Southern Europe FALSE 1 2021-02-03 73698678 node "Foodini, Αμυκλών, ΡιζοÏ<8d>πολη, Συνοικία Ριζουπόλεως, 5º Δημοτικό ΔιαμÎÏ<81>ισμα Αθηνών, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 11142, Ελλάδα" amenity restaurant 0.101 Ελλάδα FALSE
+greek parliament gr Europe Southern Europe FALSE 1 2021-02-03 258491953 relation "Βουλή των Ελλήνων, Πλατεία Αγνώστου ΣτÏ<81>ατιώτου, Κολωνάκι, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, Ελλάδα" tourism attraction 0.520183376106203 Ελλάδα FALSE
+hellenic pasteur institute gr Europe Southern Europe FALSE 1 2021-02-03 258616327 relation "Eλληνικό ΙνστιτοÏ<8d>το ΠαστÎÏ<81>, 127, Ι. Αθανασιάδου, ΚουντουÏ<81>ιώτικα, Αμπελόκηποι, Αθήνα, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 11521, Ελλάδα" amenity research_institute 0.001 Ελλάδα FALSE
+ikaria gr Europe Southern Europe FALSE 1 2021-02-03 258844397 relation "ΙκαÏ<81>ία, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΙκαÏ<81>ίας, ΠεÏ<81>ιφÎÏ<81>εια Î’ÏŒÏ<81>ειου Αιγαίου, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αιγαίου, Ελλάδα" place island 0.454824436051658 Ελλάδα FALSE
+ipsos gr Europe Southern Europe FALSE 1 2021-02-03 17704082 node "Ύψος, Δήμος ΚÎÏ<81>κυÏ<81>ας, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚÎÏ<81>κυÏ<81>ας, ΠεÏ<81>ιφÎÏ<81>εια Ιονίων Î<9d>ήσων, ΑποκεντÏ<81>ωμÎνη Διοίκηση Πελοποννήσου, Δυτικής Ελλάδας και Ιονίου, 49083, Ελλάδα" place village 0.275 Ελλάδα FALSE
+oase gr Europe Southern Europe FALSE 1 2021-02-03 785263 node "Όαση, Δήμος Χανίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Χανίων, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 73100, Ελλάδα" place village 0.275 Ελλάδα FALSE
+republic of macedonia gr Europe Southern Europe FALSE 1 2021-02-03 23115231 node "Republic, ΕλευθεÏ<81>ίου ΒενιζÎλου, Παλιά ΑγοÏ<81>ά, Γιαννιτσά, Δήμος Î Îλλας, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Î Îλλας, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 58100, Ελλάδα" amenity cafe 0.101 Ελλάδα FALSE
+technical university of crete gr Europe Southern Europe FALSE 1 2021-02-03 177964332 way "Πολυτεχνείο ΚÏ<81>ήτης, Cluster A, ΚοÏ<81>ακιÎÏ‚, Δήμος Χανίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Χανίων, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 731 33, Ελλάδα" amenity university 0.001 Ελλάδα FALSE
+university of macedonia gr Europe Southern Europe FALSE 1 2021-02-03 90202405 way "Πανεπιστήμιο Μακεδονίας, 156, Εγνατία, ΜητÏ<81>οπολιτική ΠεÏ<81>ιοχή, 1ο Δημοτικό ΔιαμÎÏ<81>ισμα Θεσσαλονίκης, Δημοτική Ενότητα Θεσαλονίκης, Δήμος Θεσσαλονίκης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Θεσσαλονίκης, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 54636, Ελλάδα" amenity university 0.351947318522272 Ελλάδα FALSE
+university of manchester archaeological unit gr Europe Southern Europe FALSE 1 2021-02-03 631961 node "ΑÏ<81>χαιολογικό Μουσείο, 2, Ξανθουδίδου Στεφ., ΗÏ<81>άκλειο, Δημοτική Κοινότητα ἩÏ<81>ακλείου, Δήμος ΗÏ<81>ακλείου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΗÏ<81>ακλείου, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 71202, Ελλάδα" tourism museum 0.383021208265432 Ελλάδα FALSE
+xoma gr Europe Southern Europe FALSE 1 2021-02-03 115973337 way "xoma, ΜΑΚΡΙΑ ΛΑΧΙΔΙΑ, ΑÏ<81>Ï„Îμιδα, Δήμος Σπάτων - ΑÏ<81>Ï„Îμιδος, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Ανατολικής Αττικής, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 19016, Ελλάδα" highway track 0.21 Ελλάδα FALSE
+faa gn Africa Western Africa FALSE 1 2021-02-03 149031448 way "Faranah Airport, N2, Soléa, Sirakémoya, Faranah, Guinée" aeroway aerodrome 0.278015094618814 Guinée FALSE
+unc gn Africa Western Africa FALSE 1 2021-02-03 201161301 way "UNC, Rue RO. 370, Kaporo, Kaporo Centre, Ratoma, Conakry, BP 5810, Guinée" amenity university 0.258083983169266 Guinée FALSE
+greenland gl Americas Northern America FALSE 1 2021-02-03 258682464 relation Kalaallit Nunaat boundary administrative 0.677424867756203 Kalaallit Nunaat FALSE
+greenland institute of natural resources gl Americas Northern America FALSE 1 2021-02-03 153302829 way "Pinngortitaleriffik, 2, Kivioq, Nuussuaq, Nuuk, Sermersooq, 3905, Kalaallit Nunaat" office research 0.119931111449547 Kalaallit Nunaat FALSE
+pmel gl Americas Northern America FALSE 1 2021-02-03 133289772 way "Fuels Management PMEL, North Street, Kangerlussuaq, Qeqqata, Kalaallit Nunaat" building yes 0.101 Kalaallit Nunaat FALSE
+association of universities gh Africa Western Africa FALSE 1 2021-02-03 59776675 node "Association of African Universities, Trinity Avenue, Accra Metropolitan, Ga East, Greater Accra Region, BOX LG25, Ghana" office ngo 0.581311730611622 Ghana FALSE
+committee on natural resources gh Africa Western Africa FALSE 1 2021-02-03 64828499 node "Presidential Committee on Environment and Natural Resources, 5th Avenue Extension, Kanda Estates, Kokomlemle, Accra Metropolitan, Greater Accra Region, NE2 8AH, Ghana" office government 0.401 Ghana FALSE
+ernst & young gh Africa Western Africa FALSE 1 2021-02-03 183594557 way "Ernst & Young, Airport Residential Area, Accra Metropolitan, Greater Accra Region, Ghana" landuse commercial 0.4 Ghana FALSE
+innovations for poverty action gh Africa Western Africa FALSE 1 2021-02-03 212438214 way "Innovations for Poverty Action, Harun Pegu Avenue, Abouabo, Tamale, Northern Region, 232, Ghana" office ngo 0.401 Ghana FALSE
+national council for tertiary education gh Africa Western Africa FALSE 1 2021-02-03 171308631 way "National Council for Tertiary Education, Trinity Avenue, Accra Metropolitan, Ga East, Greater Accra Region, BOX LG25, Ghana" office government 0.501 Ghana FALSE
+neem gh Africa Western Africa FALSE 1 2021-02-03 164242490 way "Neem, Danyame, Kumasi, Ashanti Region, M9VH+94, Ghana" highway residential 0.2 Ghana FALSE
+noguchi memorial institute for medical research gh Africa Western Africa FALSE 1 2021-02-03 258616093 relation "Noguchi Memorial Institute for Medical Research, Akilagpa Sawyerr Road, Little Legon, East Legon, Accra Metropolitan, Greater Accra Region, BOX LG25, Ghana" building yes 0.601 Ghana FALSE
+university of bamako gh Africa Western Africa FALSE 1 2021-02-03 246851633 way "Knutsford University College, Bamako Avenue, East Legon, Accra Metropolitan, Greater Accra Region, BOX LG25, Ghana" amenity university 0.201 Ghana FALSE
+university of health and allied sciences gh Africa Western Africa FALSE 1 2021-02-03 169051652 way "University of Health and Allied Sciences, Denu - Ho Road, Adaklu, Volta Region, 6803, Ghana" tourism hostel 0.601 Ghana FALSE
+us department of the treasury gh Africa Western Africa FALSE 1 2021-02-03 66802555 node "Department of Feeder Roads (Head Offiice), Treasury Road, Ministries, Accra Metropolitan, Victoriaborg, Greater Accra Region, GA-183-8164, Ghana" office government 0.301 Ghana FALSE
+sarc gg Europe Northern Europe FALSE 1 2021-02-03 84803879 way "Sark, Guernsey" place island 0.487026464500426 Guernsey FALSE
+desi ge Asia Western Asia FALSE 1 2021-02-03 108632894 way "დესი, ქვემáƒ<9d> დესი, ყáƒ<90>ზბეგის მუნიციპáƒ<90>ლიტეტი, მცხეთáƒ<90>-მთიáƒ<90>ნეთი, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" waterway river 0.275 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+eliava institute ge Asia Western Asia FALSE 1 2021-02-03 145502768 way "გიáƒ<9d>რგი ელიáƒ<90>ვáƒ<90>ს სáƒ<90>ხელáƒ<9d>ბის ბáƒ<90>ქტერიáƒ<9d>ფáƒ<90>გიის, მიკრáƒ<9d>ბიáƒ<9d>ლáƒ<9d>გიისáƒ<90> დáƒ<90> ვირუსáƒ<9d>ლáƒ<9d>გიის ინსტიტუტი, 3, ლევáƒ<90>ნ გáƒ<9d>თუáƒ<90>ს ქუჩáƒ<90>, ვეძისი, ვáƒ<90>კე-სáƒ<90>ბურთáƒ<90>ლáƒ<9d>ს რáƒ<90>იáƒ<9d>ნი, თბილისი, 0160, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" amenity hospital 0.001 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+ge ge Asia Western Asia FALSE 1 2021-02-03 257665009 relation სáƒ<90>ქáƒ<90>რთველáƒ<9d> boundary administrative 0.738453797356621 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+irms ge Asia Western Asia FALSE 1 2021-02-03 24118191 node "IRMS, ვáƒ<90>ჟáƒ<90>-ფშáƒ<90>ველáƒ<90>ს გáƒ<90>მზირი, ვáƒ<90>ჟáƒ<90>-ფშáƒ<90>ველáƒ<90>ს კვáƒ<90>რტლები, ვáƒ<90>კე-სáƒ<90>ბურთáƒ<90>ლáƒ<9d>ს რáƒ<90>იáƒ<9d>ნი, თბილისი, 0186, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" place house 0.101 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+mardaleishvili medical center ge Asia Western Asia FALSE 1 2021-02-03 62767859 node "მáƒ<90>რდáƒ<90>ლეიშვილის უნრედის ტექნáƒ<9d>ლáƒ<9d>გიისáƒ<90> დáƒ<90> თერáƒ<90>პიის კლინიკáƒ<90>, 4, ლეáƒ<9d> კვáƒ<90>áƒáƒ<90>ძის ქუჩáƒ<90>, ვáƒ<90>კე-სáƒ<90>ბურთáƒ<90>ლáƒ<9d>ს რáƒ<90>იáƒ<9d>ნი, ქვემáƒ<9d> ლისი, მცხეთის მუნიციპáƒ<90>ლიტეტი, მცხეთáƒ<90>-მთიáƒ<90>ნეთი, 0017, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" amenity hospital 0.001 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+movement for justice ge Asia Western Asia FALSE 1 2021-02-03 15256134 node "მáƒ<9d>ძრáƒ<90>áƒ<9d>ბáƒ<90> სáƒ<90>მáƒ<90>რთლიáƒ<90>ნი სáƒ<90>ქáƒ<90>რთველáƒ<9d>სáƒ<90>თვის (Political Movement ""Justice for Georgia""), ლუკáƒ<90> áƒ<90>სáƒ<90>თიáƒ<90>ნის ქუჩáƒ<90>, ძველი ბáƒ<90>თუმის უბáƒ<90>ნი, ფერიáƒ<90>, ბáƒ<90>თუმი, áƒ<90>დლიáƒ<90>, áƒ<90>áƒáƒ<90>რის áƒ<90>ვტáƒ<9d>ნáƒ<9d>მიური რესპუბლიკáƒ<90>, 6008, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" amenity public_building 0.301 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+red list ge Asia Western Asia FALSE 1 2021-02-03 76324808 node "The Red List of Plants in Georgia, თბილისის ქუჩის მე-5 შეს, სáƒ<90>ხáƒ<90>ლვáƒ<90>შáƒ<9d>, ბáƒ<90>თუმი, áƒ<90>დლიáƒ<90>, áƒ<90>áƒáƒ<90>რის áƒ<90>ვტáƒ<9d>ნáƒ<9d>მიური რესპუბლიკáƒ<90>, 6411, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" tourism information 0.201 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+republic of georgia ge Asia Western Asia FALSE 1 2021-02-03 258029143 relation "Ð<90>бхазиÑ<8f> - Ð<90>Ò§Ñ<81>ны, სáƒ<90>ქáƒ<90>რთველáƒ<9d>" boundary administrative 0.620982812009427 სáƒ<90>ქáƒ<90>რთველáƒ<9d> FALSE
+university of grenada gd Americas Caribbean FALSE 1 2021-02-03 179679128 way "St George's University Grand Anse Campus, Maurice Bishop Highway, Grand Anse, 1473, Grenada" amenity university 0.489701883147039 Grenada FALSE
+4th circuit gb Europe Northern Europe FALSE 1 2021-02-03 2598024 way "4, The Circuit, Fulshaw Park, Wilmslow, Chorley, Cheshire East, North West England, England, SK9 6DB, United Kingdom" place house 0.101 United Kingdom FALSE
+abcam gb Europe Northern Europe FALSE 1 2021-02-03 64287809 node "Abcam, 200, Cambridge Science Park, Chesterton, Cambridge, Cambridgeshire, East of England, England, CB4 0GZ, United Kingdom" office company 0.101 United Kingdom FALSE
+aberystwyth university gb Europe Northern Europe FALSE 1 2021-02-03 105273952 way "Aberystwyth University, Llanbadarn Campus, Cefn Esgair, Llanbadarn Fawr, Aberystwyth, Ceredigion, Cymru / Wales, SY23 3JG, United Kingdom" amenity university 0.201 United Kingdom FALSE
+ad astra gb Europe Northern Europe FALSE 1 2021-02-03 252844154 way "Ad Astra, Pound Road, Over Wallop, Test Valley, Hampshire, South East, England, SO20 8JG, United Kingdom" building house 0.201 United Kingdom FALSE
+agri-food & biosciences institute gb Europe Northern Europe FALSE 1 2021-02-03 202394885 way "Agri-Food and Biosciences Institute, 50, Houston Road, Crossnacreevy, Belfast, County Down, Northern Ireland, BT6 9SH, United Kingdom" office government 0.401 United Kingdom FALSE
+aic gb Europe Northern Europe FALSE 1 2021-02-03 202294384 way "aic, East Of England Way, Orton Northgate, Orton Waterville, Peterborough, City of Peterborough, East of England, England, PE2 6HA, United Kingdom" building yes 0.111 United Kingdom FALSE
+air vent gb Europe Northern Europe FALSE 1 2021-02-03 145610257 way "Air Vent, Lordship Lane, Hornsey Park, Hornsey, London Borough of Haringey, London, Greater London, England, N22 5JP, United Kingdom" man_made chimney 0.201 United Kingdom FALSE
+alba gb Europe Northern Europe FALSE 1 2021-02-03 257273413 relation "Scotland, United Kingdom" boundary administrative 0.778974525409939 United Kingdom FALSE
+anglia gb Europe Northern Europe FALSE 1 2021-02-03 257775513 relation "England, United Kingdom" boundary administrative 0.838748907051256 United Kingdom FALSE
+armagh observatory gb Europe Northern Europe FALSE 1 2021-02-03 192758084 way "Armagh Observatory, College Hill, Armagh, County Armagh, Northern Ireland, BT61 9DG, United Kingdom" building yes 0.201 United Kingdom FALSE
+ascal gb Europe Northern Europe FALSE 1 2021-02-03 39636306 node "Ascal, Corrard, Belle Isle ED, County Fermanagh, Northern Ireland, BT94 5HY, United Kingdom" place locality 0.225 United Kingdom FALSE
+assembly gb Europe Northern Europe FALSE 1 2021-02-03 119076353 way "Assembly, Temple, Old Market, Bristol, City of Bristol, South West England, England, United Kingdom" landuse construction 0.3 United Kingdom FALSE
+association of the british pharmaceutical industry gb Europe Northern Europe FALSE 1 2021-02-03 122670685 way "Association of the British Pharmaceutical Industry, 12, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2DY, United Kingdom" building yes 0.601 United Kingdom FALSE
+astellas pharma gb Europe Northern Europe FALSE 1 2021-02-03 147148121 way "Astellas Pharma Europe, 2000, Hillswood Drive, Ottershaw, Runnymede, Surrey, South East, England, KT16 0RS, United Kingdom" building yes 0.201 United Kingdom FALSE
+astra zeneca gb Europe Northern Europe FALSE 1 2021-02-03 4552729 node "Astra Zeneca, Bakewell Road, Loughborough, Charnwood, Leicestershire, East Midlands, England, LE11 5TH, United Kingdom" highway bus_stop 0.201 United Kingdom FALSE
+better together gb Europe Northern Europe FALSE 1 2021-02-03 24364444 node "Better Together, Upper Hope Place, Georgian Quarter, Liverpool, North West England, England, L7, United Kingdom" tourism artwork 0.201 United Kingdom FALSE
+betty & gordon moore library gb Europe Northern Europe FALSE 1 2021-02-03 89660043 way "Betty and Gordon Moore Library, Wilberforce Road, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0WD, United Kingdom" amenity library 0.401 United Kingdom FALSE
+biological sciences gb Europe Northern Europe FALSE 1 2021-02-03 125084819 way "Biological Sciences, St Ives Gardens, Queen's Quarter, Belfast, County Antrim, Northern Ireland, BT9 5AD, United Kingdom" building university 0.201 United Kingdom FALSE
+birdlife international gb Europe Northern Europe FALSE 1 2021-02-03 14417131 node "BirdLife International, Wellbrook Way, Girton, South Cambridgeshire, Cambridgeshire, East of England, England, CB3 0GJ, United Kingdom" building yes 0.201 United Kingdom FALSE
+birkbeck college london gb Europe Northern Europe FALSE 1 2021-02-03 96971911 way "Birkbeck College, Malet Street, St Giles, St Pancras, London Borough of Camden, London, Greater London, England, WC1E 7HX, United Kingdom" amenity university 0.773518221802039 United Kingdom FALSE
+blackburn gb Europe Northern Europe FALSE 1 2021-02-03 118886 node "Blackburn, Blackburn with Darwen, North West England, England, BB1 7DP, United Kingdom" place town 0.621773723501146 United Kingdom FALSE
+bournemouth university gb Europe Northern Europe FALSE 1 2021-02-03 112509122 way "Bournemouth University (Talbot Campus), Gillett Road, Talbot Woods, Talbot Village, Bournemouth, Christchurch and Poole, South West England, England, BH3 7DR, United Kingdom" amenity university 0.621665177399236 United Kingdom FALSE
+brain sciences unit gb Europe Northern Europe FALSE 1 2021-02-03 100156548 way "MRC Cognition and Brain Sciences Unit, 15, Chaucer Road, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 7EF, United Kingdom" building university 0.535968355602442 United Kingdom FALSE
+british archaeological trust gb Europe Northern Europe FALSE 1 2021-02-03 135878352 way "Canal & River Trust, Blackwall, London Borough of Tower Hamlets, London, Greater London, England, E14 9ST, United Kingdom" landuse industrial 0.3 United Kingdom FALSE
+british library gb Europe Northern Europe FALSE 1 2021-02-03 84833518 way "British Library, 96, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2DB, United Kingdom" tourism attraction 0.769763707839348 United Kingdom FALSE
+buckinghamshire gb Europe Northern Europe FALSE 1 2021-02-03 258178243 relation "Buckinghamshire, South East, England, United Kingdom" boundary historic 0.696549595581997 United Kingdom FALSE
+building and housing research center gb Europe Northern Europe FALSE 1 2021-02-03 155007660 way "South Northants Housing Trust, Burcote Road, Towcester Research Park, Towcester, South Northamptonshire, Northamptonshire, East Midlands, England, NN12 6AZ, United Kingdom" building commercial 0.301 United Kingdom FALSE
+cambridge crystallographic data centre gb Europe Northern Europe FALSE 1 2021-02-03 119553360 way "Cambridge Crystallographic Data Centre, 12, Union Road, Newtown, Cambridge, Cambridgeshire, East of England, England, CB2 1EZ, United Kingdom" building yes 0.401 United Kingdom FALSE
+cambridge university press gb Europe Northern Europe FALSE 1 2021-02-03 177748716 way "Cambridge University Press, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 8BS, United Kingdom" landuse industrial 0.975395195503227 United Kingdom FALSE
+canterbury gb Europe Northern Europe FALSE 1 2021-02-03 257929986 relation "Canterbury, Kent, South East, England, United Kingdom" boundary administrative 0.689001871311268 United Kingdom FALSE
+centre for science and policy gb Europe Northern Europe FALSE 1 2021-02-03 130406915 way "Centre for Science and Policy, 11-12, Trumpington Street, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 1QA, United Kingdom" building university 0.501 United Kingdom FALSE
+china china gb Europe Northern Europe FALSE 1 2021-02-03 232368687 way "China China, 6, Station Road, Lyminge, Folkestone and Hythe, Kent, South East, England, CT18 8HP, United Kingdom" amenity restaurant 0.201 United Kingdom FALSE
+christian aid gb Europe Northern Europe FALSE 1 2021-02-03 115017495 way "Christian Aid, 35-41, Lower Marsh, Lambeth, London Borough of Lambeth, London, Greater London, England, SE1 7RL, United Kingdom" office ngo 0.201 United Kingdom FALSE
+city university london gb Europe Northern Europe FALSE 1 2021-02-03 4711510 node "Myddleton Street Building, City University London, Myddelton Street, Clerkenwell Green, Clerkenwell, London Borough of Islington, London, Greater London, England, EC1R 1UW, United Kingdom" place house 0.301 United Kingdom FALSE
+civil aviation gb Europe Northern Europe FALSE 1 2021-02-03 109886796 way "Civil Aviation, East Fortune Circuit, Crauchie, East Lothian, Scotland, EH39 5LF, United Kingdom" building yes 0.201 United Kingdom FALSE
+climatic change gb Europe Northern Europe FALSE 1 2021-02-03 99663934 way "Climatic Research Unit (CRU), Chancellors Drive, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" building yes 0.427161274702289 United Kingdom FALSE
+"collins, the nih" gb Europe Northern Europe FALSE 1 2021-02-03 258666253 relation "Collins, Northern Ireland, United Kingdom" boundary administrative 0.45 United Kingdom FALSE
+coventry uk gb Europe Northern Europe FALSE 1 2021-02-03 257209281 relation "Coventry, West Midlands Combined Authority, West Midlands, England, United Kingdom" boundary administrative 0.692751900650216 United Kingdom FALSE
+cowling gb Europe Northern Europe FALSE 1 2021-02-03 153851 node "Cowling, Craven, North Yorkshire, Yorkshire and the Humber, England, BD22 0BX, United Kingdom" place village 0.375 United Kingdom FALSE
+crossrail gb Europe Northern Europe FALSE 1 2021-02-03 236256742 way "Elizabeth Line, Church Manor Way, Abbey Wood, Royal Borough of Greenwich, London, Greater London, England, SE2 9LX, United Kingdom" railway construction 0.365618504568294 United Kingdom FALSE
+csa gb Europe Northern Europe FALSE 1 2021-02-03 112088848 way "Colonsay Airport, B8086, Lower Kilchattan, Scalasaig, Argyll and Bute, Scotland, PA61 7YR, United Kingdom" aeroway aerodrome 0.358888290194715 United Kingdom FALSE
+cse gb Europe Northern Europe FALSE 1 2021-02-03 109879705 way "Computer Science, University of York, Heslington, York, Yorkshire and the Humber, England, YO10 5GH, United Kingdom" building university 0.001 United Kingdom FALSE
+culham centre gb Europe Northern Europe FALSE 1 2021-02-03 688400 node "Culham, South Oxfordshire, Oxfordshire, South East, England, OX14 4LY, United Kingdom" place village 0.375 United Kingdom FALSE
+culham science centre gb Europe Northern Europe FALSE 1 2021-02-03 168790121 way "Culham Science Centre, Clifton Hampden, South Oxfordshire, Oxfordshire, South East, England, United Kingdom" landuse commercial 0.5 United Kingdom FALSE
+daily mail gb Europe Northern Europe FALSE 1 2021-02-03 24473561 node "Daily Mail, Weoley Castle Road, Weoley Castle, Birmingham, West Midlands Combined Authority, West Midlands, England, B29, United Kingdom" shop newsagent 0.201 United Kingdom FALSE
+dartmouth gb Europe Northern Europe FALSE 1 2021-02-03 139925 node "Dartmouth, South Hams, Devon, South West England, England, TQ6 9ES, United Kingdom" place town 0.580540443145906 United Kingdom FALSE
+dcms gb Europe Northern Europe FALSE 1 2021-02-03 54322395 node "Department for Digital, Culture, Media & Sport, 100, Parliament Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 2BQ, United Kingdom" office government 0.408175130056335 United Kingdom FALSE
+de montfort university gb Europe Northern Europe FALSE 1 2021-02-03 102186166 way "De Montfort University, Oxford Street, Bede Island, Leicester, City of Leicester, East Midlands, England, LE1 5XT, United Kingdom" amenity university 0.301 United Kingdom FALSE
+defence ministry gb Europe Northern Europe FALSE 1 2021-02-03 98588582 way "Ministry of Defence, Horse Guards Avenue, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2HB, United Kingdom" military office 0.731875732226719 United Kingdom FALSE
+democrats gb Europe Northern Europe FALSE 1 2021-02-03 23277141 node "Liberal Democrats, 8–10, Great George Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3AE, United Kingdom" office political_party 0.497946206068361 United Kingdom FALSE
+department gb Europe Northern Europe FALSE 1 2021-02-03 88415175 way "The Department, Lawton Street, Ropewalks, Liverpool, North West England, England, L1 1FS, United Kingdom" building yes 0.101 United Kingdom FALSE
+department of business innovation and skills gb Europe Northern Europe FALSE 1 2021-02-03 18987190 node "Department of Business, Innovation and Skills, 1, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1, United Kingdom" office government 0.601 United Kingdom FALSE
+"department of veterinary medicine, university of cambridge" gb Europe Northern Europe FALSE 1 2021-02-03 129270161 way "Department of Veterinary Medicine (Vet School), Conduit Head Road, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0EY, United Kingdom" amenity university 0.601 United Kingdom FALSE
+diabetes center gb Europe Northern Europe FALSE 1 2021-02-03 84497499 way "Diabetes Centre, Heath Road, Rushmere, Ipswich, Suffolk, East of England, England, IP4 5SS, United Kingdom" building hospital 0.101 United Kingdom FALSE
+diamond light source gb Europe Northern Europe FALSE 1 2021-02-03 258557940 relation "Diamond Light Source Synchrotron, Road Five, Chilton, Vale of White Horse, Oxfordshire, South East, England, OX11 0PW, United Kingdom" amenity research_institute 0.301 United Kingdom FALSE
+digital services gb Europe Northern Europe FALSE 1 2021-02-03 68602811 node "Digital Services, 116, Westmead Road, Benhilton, London Borough of Sutton, London, Greater London, England, SM1 4JE, United Kingdom" shop electronics 0.201 United Kingdom FALSE
+dla piper gb Europe Northern Europe FALSE 1 2021-02-03 26548047 node "DLA Piper, 101, Barbirolli Square, City Centre, Manchester, Greater Manchester, North West England, England, M2 3BG, United Kingdom" office lawyer 0.201 United Kingdom FALSE
+dmx gb Europe Northern Europe FALSE 1 2021-02-03 158234190 way "DMX Productions, Unit 2, 14-16, Bissell Street, Digbeth, Highgate, Birmingham, West Midlands Combined Authority, West Midlands, England, B5 7HP, United Kingdom" office company 0.101 United Kingdom FALSE
+earlham institute gb Europe Northern Europe FALSE 1 2021-02-03 153626366 way "Earlham Institute, Rosalind Franklin Road, Colney, Norwich, Norfolk, East of England, England, NR4 7UZ, United Kingdom" amenity research_institute 0.201 United Kingdom FALSE
+eaves gb Europe Northern Europe FALSE 1 2021-02-03 642644 node "Eaves, Wyre, Lancashire, North West England, England, PR4 0BE, United Kingdom" place village 0.375 United Kingdom FALSE
+edge hill university gb Europe Northern Europe FALSE 1 2021-02-03 132503554 way "Edge Hill University, St Helens Road, Ormskirk, West Lancashire, Lancashire, North West England, England, L39 4QP, United Kingdom" amenity university 0.716230582936297 United Kingdom FALSE
+eisai gb Europe Northern Europe FALSE 1 2021-02-03 66344478 node "Eisai, Mosquito Way, Comet Square, Hatfield, Welwyn Hatfield, Hertfordshire, East of England, England, AL10 9SN, United Kingdom" highway bus_stop 0.101 United Kingdom FALSE
+embo gb Europe Northern Europe FALSE 1 2021-02-03 848668 node "Embo, Highland, Scotland, IV25 3PS, United Kingdom" place village 0.510664855391163 United Kingdom FALSE
+emsl gb Europe Northern Europe FALSE 1 2021-02-03 65408688 node "EMSL, Arden Press Way, Phoenix Park Estate, Jubilee Industrial Centre, Norton, North Hertfordshire, Hertfordshire, East of England, England, SG6 1LH, United Kingdom" office yes 0.101 United Kingdom FALSE
+essex gb Europe Northern Europe FALSE 1 2021-02-03 257296477 relation "Essex, England, United Kingdom" boundary ceremonial 0.723732857491298 United Kingdom FALSE
+european centre for medium-range weather forecasts in reading gb Europe Northern Europe FALSE 1 2021-02-03 101206182 way "European Centre for Medium-Range Weather Forecasts, Shinfield, Reading, Wokingham, South East, England, RG2 9AX, United Kingdom" landuse industrial 1.1 United Kingdom FALSE
+faam gb Europe Northern Europe FALSE 1 2021-02-03 240912494 way "Faam, 131, Percy Road, Whitton High Street, Whitton, London Borough of Richmond upon Thames, London, Greater London, England, TW2 6HT, United Kingdom" shop art 0.101 United Kingdom FALSE
+giffords gb Europe Northern Europe FALSE 1 2021-02-03 153526702 way "Giffords, Haverhill Road, Stapleford, South Cambridgeshire, Cambridgeshire, East of England, England, CB22 5BX, United Kingdom" building house 0.101 United Kingdom FALSE
+glasgow university gb Europe Northern Europe FALSE 1 2021-02-03 96372396 way "University of Glasgow, Byres Road, Yorkhill, Dowanhill, Glasgow, Glasgow City, Scotland, G12 8TD, United Kingdom" amenity university 0.762549854310082 United Kingdom FALSE
+global challenges gb Europe Northern Europe FALSE 1 2021-02-03 70067724 node "Global Adventure Challenges Ltd, Hope Street, Lache, City of Chester, Chester, Cheshire West and Chester, North West England, England, CH4 8BU, United Kingdom" shop travel_agency 0.201 United Kingdom FALSE
+goldman sachs gb Europe Northern Europe FALSE 1 2021-02-03 98808694 way "Goldman Sachs, 120, Fleet Street, Blackfriars, City of London, Greater London, England, EC4A 2BE, United Kingdom" office company 0.458218474293395 United Kingdom FALSE
+goonhilly earth station gb Europe Northern Europe FALSE 1 2021-02-03 122363874 way "Goonhilly Satellite Earth Station, Mawgan-in-Meneage, Cornwall, South West England, England, United Kingdom" landuse commercial 0.624352223496241 United Kingdom FALSE
+grantham institute gb Europe Northern Europe FALSE 1 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.472343749103071 United Kingdom FALSE
+grantham museum gb Europe Northern Europe FALSE 1 2021-02-03 144368628 way "Grantham Museum, Saint Peter's Hill, South Kesteven, Lincolnshire, East Midlands, England, NG31 6QA, United Kingdom" tourism museum 0.201 United Kingdom FALSE
+grantham research institute gb Europe Northern Europe FALSE 1 2021-02-03 41936693 node "Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom" office research 0.572343749103071 United Kingdom FALSE
+graphene engineering innovation centre gb Europe Northern Europe FALSE 1 2021-02-03 184596819 way "Graphene Engineering Innovation Centre, Sackville Street, City Centre, Manchester, Greater Manchester, North West England, England, M1 7DN, United Kingdom" building construction 0.401 United Kingdom FALSE
+green bonds gb Europe Northern Europe FALSE 1 2021-02-03 6339326 node "Bonds, Barnacre-with-Bonds, Garstang, Wyre, Lancashire, North West England, England, PR3 1ZQ, United Kingdom" place hamlet 0.35 United Kingdom FALSE
+greenpeace uk gb Europe Northern Europe FALSE 1 2021-02-03 98060114 way "Greenpeace, Canonbury Villas, Highbury, London Borough of Islington, London, Greater London, England, N1 2PN, United Kingdom" building office 0.101 United Kingdom FALSE
+gryphon gb Europe Northern Europe FALSE 1 2021-02-03 1367040 node "The Gryphon, 9, Vera Avenue, Grange Park, London Borough of Enfield, London, Greater London, England, N21 1RE, United Kingdom" amenity restaurant 0.101 United Kingdom FALSE
+hampshire gb Europe Northern Europe FALSE 1 2021-02-03 258402538 relation "Hampshire, England, United Kingdom" boundary ceremonial 0.725068049293215 United Kingdom FALSE
+health protection agency gb Europe Northern Europe FALSE 1 2021-02-03 17913167 node "Health Protection Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.301 United Kingdom FALSE
+heart foundation gb Europe Northern Europe FALSE 1 2021-02-03 75654553 node "Heart Foundation, Walter Street, Harpurhey, Manchester, Greater Manchester, North West England, England, M9 4DL, United Kingdom" shop charity 0.201 United Kingdom FALSE
+high voltage laboratory gb Europe Northern Europe FALSE 1 2021-02-03 110289562 way "High Voltage Laboratory, University Crescent, Highfield, Southampton, South East, England, SO17 1TR, United Kingdom" building yes 0.301 United Kingdom FALSE
+hilton gb Europe Northern Europe FALSE 1 2021-02-03 6367561 node "Hilton, Inverness, Highland, Scotland, IV2 4PX, United Kingdom" place suburb 0.511602248356457 United Kingdom FALSE
+hli gb Europe Northern Europe FALSE 1 2021-02-03 226710397 way "HLI, Stogursey, Somerset West and Taunton, Somerset, South West England, England, United Kingdom" landuse industrial 0.3 United Kingdom FALSE
+horsham gb Europe Northern Europe FALSE 1 2021-02-03 257416768 relation "Horsham, West Sussex, South East, England, United Kingdom" boundary administrative 0.556493353758773 United Kingdom FALSE
+houses of parliament gb Europe Northern Europe FALSE 1 2021-02-03 258402540 relation "Palace of Westminster, The Terrace, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 0AA, United Kingdom" tourism attraction 0.655970619437777 United Kingdom FALSE
+idq gb Europe Northern Europe FALSE 1 2021-02-03 37948615 node "Idq, Kenyon Street, Jewellery Quarter, Aston, Birmingham, West Midlands Combined Authority, West Midlands, England, B18, United Kingdom" office company 0.101 United Kingdom FALSE
+imperial college london and university college london gb Europe Northern Europe FALSE 1 2021-02-03 301718758 relation "Imperial College London, Exhibition Road, Knightsbridge, City of Westminster, London, Greater London, England, SW7 2AZ, United Kingdom" amenity university 1.09521355701007 United Kingdom FALSE
+independent living gb Europe Northern Europe FALSE 1 2021-02-03 48022150 node "Independent Living, Heworth Road, Heworth, York, Yorkshire and the Humber, England, YO31 0AD, United Kingdom" shop mobility 0.201 United Kingdom FALSE
+information commissioner's office gb Europe Northern Europe FALSE 1 2021-02-03 19001980 node "Information Commissioner's Office, Water Lane, Fulshaw Park, Wilmslow, Cheshire East, North West England, England, SK9 5AF, United Kingdom" amenity office 0.401 United Kingdom FALSE
+innovate uk gb Europe Northern Europe FALSE 1 2021-02-03 176517550 way "Innovate, Chartermark Way, Colburn Business Park, Colburn, Richmondshire, North Yorkshire, Yorkshire and the Humber, England, DL9 4QJ, United Kingdom" building commercial 0.101 United Kingdom FALSE
+institute for fiscal studies gb Europe Northern Europe FALSE 1 2021-02-03 50576944 node "Institute for Fiscal Studies, 7, Store Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7DB, United Kingdom" office ngo 0.70799018260571 United Kingdom FALSE
+institute of development studies gb Europe Northern Europe FALSE 1 2021-02-03 258327927 relation "Institute of Development Studies, Arts Road, Stanmer, Brighton and Hove, South East, England, BN1 9RE, United Kingdom" building university 0.401 United Kingdom FALSE
+institute of hazard gb Europe Northern Europe FALSE 1 2021-02-03 97604219 way "Institute of Hazard and Risk Research, South Road, Houghall, City of Durham, Durham, County Durham, North East England, England, DH1 3TA, United Kingdom" building university 0.301 United Kingdom FALSE
+international animal rescue gb Europe Northern Europe FALSE 1 2021-02-03 62630833 node "International Animal Rescue, 121, High Street, New Town, Uckfield, Wealden, East Sussex, South East, England, TN22 1RE, United Kingdom" office yes 0.301 United Kingdom FALSE
+international institute for strategic studies gb Europe Northern Europe FALSE 1 2021-02-03 112205362 way "International Institute for Strategic Studies, 6, Temple Place, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 2PG, United Kingdom" office research 0.893742367962228 United Kingdom FALSE
+international maritime organization gb Europe Northern Europe FALSE 1 2021-02-03 102541491 way "International Maritime Organization, 4, Albert Embankment, Vauxhall, London Borough of Lambeth, London, Greater London, England, SE1 7SR, United Kingdom" building office 0.301 United Kingdom FALSE
+isc gb Europe Northern Europe FALSE 1 2021-02-03 147374618 way "St Mary's Airport, High Cross Lane, Parting Carn, St Mary's, Old Town, Isles of Scilly, South West England, England, TR21 0NG, United Kingdom" aeroway aerodrome 0.418002769416701 United Kingdom FALSE
+island press gb Europe Northern Europe FALSE 1 2021-02-03 159537 node "Press, North East Derbyshire, Derbyshire, East Midlands, England, S42 6AZ, United Kingdom" place village 0.375 United Kingdom FALSE
+isro satellite centre gb Europe Northern Europe FALSE 1 2021-02-03 54207550 node "The Satellite Centre, Westgate Road, Arthur's Hill, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE4 6AR, United Kingdom" shop yes 0.201 United Kingdom FALSE
+joint committee gb Europe Northern Europe FALSE 1 2021-02-03 117993195 way "WJEC, Western Avenue, Llandaff, Cardiff, Cymru / Wales, CF, United Kingdom" office quango 0.314317004425986 United Kingdom FALSE
+kavli institute for cosmology gb Europe Northern Europe FALSE 1 2021-02-03 108662646 way "Kavli Institute for Cosmology, IoA Path, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0HA, United Kingdom" building university 0.401 United Kingdom FALSE
+kew gb Europe Northern Europe FALSE 1 2021-02-03 114707 node "Kew, London Borough of Richmond upon Thames, London, Greater London, England, TW9 3AB, United Kingdom" place suburb 0.575721107070673 United Kingdom FALSE
+laboratory for molecular biology gb Europe Northern Europe FALSE 1 2021-02-03 85272032 node "MRC Laboratory for Molecular Cell Biology, Malet Place, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0AT, United Kingdom" amenity university 0.401 United Kingdom FALSE
+lancashire gb Europe Northern Europe FALSE 1 2021-02-03 258129935 relation "Lancashire, England, United Kingdom" boundary ceremonial 0.742602820947042 United Kingdom FALSE
+lanner gb Europe Northern Europe FALSE 1 2021-02-03 149878 node "Lanner, Cornwall, South West England, England, TR16 6DW, United Kingdom" place village 0.375 United Kingdom FALSE
+leeds gb Europe Northern Europe FALSE 1 2021-02-03 258136264 relation "Leeds, West Yorkshire, Yorkshire and the Humber, England, United Kingdom" boundary administrative 0.728801062334147 United Kingdom FALSE
+leicester university gb Europe Northern Europe FALSE 1 2021-02-03 162085793 way "University of Leicester, University Road, Highfields, Leicester, City of Leicester, East Midlands, England, LE1 7RH, United Kingdom" amenity university 0.695552033321719 United Kingdom FALSE
+lofar gb Europe Northern Europe FALSE 1 2021-02-03 138863067 way "LOFAR, Chilbolton, Test Valley, Hampshire, South East, England, United Kingdom" landuse observatory 0.47774807032046 United Kingdom FALSE
+london research institute gb Europe Northern Europe FALSE 1 2021-02-03 116604474 way "London Research Institute - Clare Hall Site, South Mimms, Ridge, Hertsmere, Hertfordshire, East of England, England, EN6 3LD, United Kingdom" landuse industrial 0.5 United Kingdom FALSE
+london school of economics and political science gb Europe Northern Europe FALSE 1 2021-02-03 258598818 relation "London School of Economics and Political Science, Houghton Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AE, United Kingdom" amenity university 1.28817687564795 United Kingdom FALSE
+los alamos study group gb Europe Northern Europe FALSE 1 2021-02-03 145794537 way "Study Centre Group Provision, Cheyne Path, Hanwell, London Borough of Ealing, London, Greater London, England, W7, United Kingdom" building school 0.201 United Kingdom FALSE
+loughborough gb Europe Northern Europe FALSE 1 2021-02-03 105872 node "Loughborough, Charnwood, Leicestershire, East Midlands, England, LE11 5BJ, United Kingdom" place town 0.577635896973777 United Kingdom FALSE
+lovell telescope gb Europe Northern Europe FALSE 1 2021-02-03 84170869 way "Lovell Telescope, Bomish Lane, Blackden Heath, Goostrey, Cheshire East, North West England, England, CW4 8FZ, United Kingdom" man_made telescope 0.610900543630094 United Kingdom FALSE
+lse gb Europe Northern Europe FALSE 1 2021-02-03 258598818 relation "London School of Economics and Political Science, Houghton Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AE, United Kingdom" amenity university 0.588176875647945 United Kingdom FALSE
+lshtm gb Europe Northern Europe FALSE 1 2021-02-03 185180502 way "London School of Hygiene and Tropical Medicine, Gower Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7HT, United Kingdom" amenity university 0.441052336501247 United Kingdom FALSE
+malaysia airlines gb Europe Northern Europe FALSE 1 2021-02-03 82530882 node "Malaysia Airlines, 247-249, Cromwell Road, The Boltons, Earl's Court, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW5 9GA, United Kingdom" office company 0.201 United Kingdom FALSE
+medicines and healthcare gb Europe Northern Europe FALSE 1 2021-02-03 17808193 node "Medicines and Healthcare Products Regulatory Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.629555066820797 United Kingdom FALSE
+medium-range weather forecasts in reading gb Europe Northern Europe FALSE 1 2021-02-03 101206182 way "European Centre for Medium-Range Weather Forecasts, Shinfield, Reading, Wokingham, South East, England, RG2 9AX, United Kingdom" landuse industrial 0.8 United Kingdom FALSE
+megaloceros gb Europe Northern Europe FALSE 1 2021-02-03 251919749 way "Megaloceros - Irish Elk (fawn), Thicket Road, Anerley, Crystal Palace, London Borough of Bromley, London, Greater London, England, SE20 8DP, United Kingdom" tourism artwork 0.101 United Kingdom FALSE
+merton college gb Europe Northern Europe FALSE 1 2021-02-03 258811698 relation "Merton College, Grove Passage, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4JF, United Kingdom" amenity university 0.446981559290857 United Kingdom FALSE
+metropolitan police gb Europe Northern Europe FALSE 1 2021-02-03 258571119 relation "Metropolitan Police, Greater London, England, United Kingdom" boundary police 0.516167966338533 United Kingdom FALSE
+middlesex university gb Europe Northern Europe FALSE 1 2021-02-03 97180538 way "Middlesex University, The Burroughs, Hendon Central, London Borough of Barnet, London, Greater London, England, NW4 4LA, United Kingdom" amenity university 0.672198296881392 United Kingdom FALSE
+montefiore medical center gb Europe Northern Europe FALSE 1 2021-02-03 113982822 way "East Cliff Practice, Dumpton Park Drive, East Cliff, Ramsgate, Thanet, Kent, South East, England, CT11 8AD, United Kingdom" amenity doctors 0.001 United Kingdom FALSE
+motorola gb Europe Northern Europe FALSE 1 2021-02-03 23450963 node "Motorola, St. Andrews, Broad Blunsdon, Swindon, South West England, England, SN25 4YF, United Kingdom" place neighbourhood 0.35 United Kingdom FALSE
+mrc cognition and brain sciences unit gb Europe Northern Europe FALSE 1 2021-02-03 100156548 way "MRC Cognition and Brain Sciences Unit, 15, Chaucer Road, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 7EF, United Kingdom" building university 0.835968355602442 United Kingdom FALSE
+mrc institute of hearing research gb Europe Northern Europe FALSE 1 2021-02-03 104741680 way "MRC Institute of Hearing Research, Science Road, Dunkirk, City of Nottingham, East Midlands, England, NG7 2JE, United Kingdom" building yes 0.501 United Kingdom FALSE
+museum of archaeology and anthropology gb Europe Northern Europe FALSE 1 2021-02-03 4139522 node "Museum of Archaeology and Anthropology, Downing Street, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 3DZ, United Kingdom" tourism museum 0.87774807032046 United Kingdom FALSE
+national association of head teachers gb Europe Northern Europe FALSE 1 2021-02-03 64457372 node "National Association of Head Teachers, Boltro Road, Lucastes, Haywards Heath, Mid Sussex, West Sussex, South East, England, RH16 1RG, United Kingdom" office union 0.501 United Kingdom FALSE
+national audit office gb Europe Northern Europe FALSE 1 2021-02-03 115991832 way "National Audit Office, 157-197, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9SP, United Kingdom" office government 0.644585942469205 United Kingdom FALSE
+national institute for advanced studies gb Europe Northern Europe FALSE 1 2021-02-03 156623105 way "Institute for Advanced Studies, 1, University Walk, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS2, United Kingdom" building university 0.401 United Kingdom FALSE
+national institute of agricultural botany gb Europe Northern Europe FALSE 1 2021-02-03 259467768 relation "NIAB (National Institute of Agricultural Botany), Howes Place, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0LD, United Kingdom" building yes 0.501 United Kingdom FALSE
+nec gb Europe Northern Europe FALSE 1 2021-02-03 257864413 relation "National Exhibition Centre, Station Way, Bickenhill and Marston Green, Birmingham, West Midlands Combined Authority, West Midlands, England, B40 1PA, United Kingdom" amenity exhibition_center 0.397362929796699 United Kingdom FALSE
+nestle gb Europe Northern Europe FALSE 1 2021-02-03 152769411 way "Nestle, Dalston, Carlisle, Cumbria, North West England, England, CA5 7NH, United Kingdom" landuse industrial 0.3 United Kingdom FALSE
+newcastle gb Europe Northern Europe FALSE 1 2021-02-03 257800552 relation "Newcastle upon Tyne, Tyne and Wear, North East England, England, United Kingdom" boundary administrative 0.720469585639904 United Kingdom FALSE
+nfu gb Europe Northern Europe FALSE 1 2021-02-03 119235228 way "NFU Mutual, Blackbrook Park Avenue, Blackbrook Business Park, Blackbrook, Ruishton, Somerset West and Taunton, Somerset, South West England, England, TA1 2FU, United Kingdom" office insurance 0.402323854176492 United Kingdom FALSE
+nhs trust gb Europe Northern Europe FALSE 1 2021-02-03 84981127 way "Cambridge Biomedical Campus, Hills Road (cycleway), Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 8QE, United Kingdom" amenity hospital 0.283827688081076 United Kingdom FALSE
+northrup grumman gb Europe Northern Europe FALSE 1 2021-02-03 71896950 node "Northrup Grumman, 118, Burlington Road, West Barnes, London Borough of Merton, London, Greater London, England, KT3, United Kingdom" office company 0.201 United Kingdom FALSE
+northumbria university gb Europe Northern Europe FALSE 1 2021-02-03 4155510 node "Northumbria University, Sandyford Road, Haymarket, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE1 8JG, United Kingdom" highway bus_stop 0.201 United Kingdom FALSE
+northumbria university in newcastle gb Europe Northern Europe FALSE 1 2021-02-03 4155510 node "Northumbria University, Sandyford Road, Haymarket, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE1 8JG, United Kingdom" highway bus_stop 0.401 United Kingdom FALSE
+oc robotics gb Europe Northern Europe FALSE 1 2021-02-03 109463158 way "OC Robotics, Unit 5, Emma-Chris Way, Abbey Wood Business Park, Filton, Bristol, South Gloucestershire, South West England, England, BS34 7JU, United Kingdom" building yes 0.201 United Kingdom FALSE
+office of medical services gb Europe Northern Europe FALSE 1 2021-02-03 174252715 way "Medical Services, Church Road, Aston, Birmingham, West Midlands Combined Authority, West Midlands, England, B6, United Kingdom" building yes 0.201 United Kingdom FALSE
+open data institute gb Europe Northern Europe FALSE 1 2021-02-03 51911699 node "Open Data Institute, 65, Clifton Street, Shoreditch, London Borough of Hackney, London, Greater London, England, EC2A 4JE, United Kingdom" office company 0.301 United Kingdom FALSE
+oxford circus gb Europe Northern Europe FALSE 1 2021-02-03 22497767 node "Oxford Circus, Oxford Street, Fitzrovia, City of Westminster, London, Greater London, England, W1B 2ER, United Kingdom" tourism information 0.685759448486215 United Kingdom FALSE
+oxford university press gb Europe Northern Europe FALSE 1 2021-02-03 94205924 way "Oxford University Press, Jericho, Oxford, Oxfordshire, South East, England, OX2 6DP, United Kingdom" landuse commercial 0.972109324380291 United Kingdom FALSE
+pakefield gb Europe Northern Europe FALSE 1 2021-02-03 148091667 way "Pakefield, Lowestoft, East Suffolk, Suffolk, East of England, England, United Kingdom" place suburb 0.432701719497591 United Kingdom FALSE
+panasonic electric works gb Europe Northern Europe FALSE 1 2021-02-03 193292786 way "Panasonic Electric Works, Sunrise Parkway, Linford Wood, Stantonbury, Milton Keynes, South East, England, MK14 6LS, United Kingdom" building yes 0.301 United Kingdom FALSE
+people's welfare gb Europe Northern Europe FALSE 1 2021-02-03 173813574 way "Old People's Welfare Centre, Nottingham Road, Daybrook, Arnold, City of Nottingham, Nottinghamshire, East Midlands, England, NG5 6JZ, United Kingdom" amenity community_centre 0.301 United Kingdom FALSE
+polar institute gb Europe Northern Europe FALSE 1 2021-02-03 86946864 way "Scott Polar Research Institute (SPRI), Lensfield Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 1ER, United Kingdom" building university 0.609070137722352 United Kingdom FALSE
+public health england gb Europe Northern Europe FALSE 1 2021-02-03 118029905 way "Public Health England, Idmiston, Wiltshire, South West England, England, SP4 0JG, United Kingdom" landuse industrial 0.5 United Kingdom FALSE
+queen's college gb Europe Northern Europe FALSE 1 2021-02-03 93331608 way "The Queen's College, High Street, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4AN, United Kingdom" amenity university 0.76362357530052 United Kingdom FALSE
+reed elsevier gb Europe Northern Europe FALSE 1 2021-02-03 26271747 node "Reed Elsevier, Jamestown Road, Chalk Farm, London Borough of Camden, London, Greater London, England, NW1 7DJ, United Kingdom" office company 0.201 United Kingdom FALSE
+regulatory agency gb Europe Northern Europe FALSE 1 2021-02-03 17808193 node "Medicines and Healthcare Products Regulatory Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom" office government 0.529555066820797 United Kingdom FALSE
+research europe gb Europe Northern Europe FALSE 1 2021-02-03 64980625 node "Toshiba Research Europe, 208, Cambridge Science Park, Chesterton, Cambridge, Cambridgeshire, East of England, England, CB4 0GZ, United Kingdom" office company 0.201 United Kingdom FALSE
+research pathogen gb Europe Northern Europe FALSE 1 2021-02-03 102722066 way "Peter Medawar Building for Pathogen Research, South Parks Road, City Centre, Oxford, Oxfordshire, South East, England, OX1 3RF, United Kingdom" building university 0.201 United Kingdom FALSE
+rothschild gb Europe Northern Europe FALSE 1 2021-02-03 131345270 way "N M Rothschild & Sons, St Swithin's Lane, Bishopsgate, City of London, Greater London, England, EC4N 8AL, United Kingdom" building commercial 0.511834385728338 United Kingdom FALSE
+royal botanic gardens gb Europe Northern Europe FALSE 1 2021-02-03 85407776 way "Royal Botanic Garden Edinburgh, Warriston Drive, Warriston, Stockbridge/Inverleith, City of Edinburgh, Scotland, EH3 5LY, United Kingdom" leisure garden 0.616158624493363 United Kingdom FALSE
+royal centre for defence medicine gb Europe Northern Europe FALSE 1 2021-02-03 192979920 way "Royal Centre for Defence Medicine, Longbridge, Birmingham, West Midlands Combined Authority, West Midlands, England, United Kingdom" landuse residential 0.7 United Kingdom FALSE
+royal college of surgeons gb Europe Northern Europe FALSE 1 2021-02-03 106178821 way "Royal College of Surgeons, 35-43, Portugal Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 3PE, United Kingdom" place house 0.779338672131387 United Kingdom FALSE
+royal courts of justice gb Europe Northern Europe FALSE 1 2021-02-03 258488410 relation "Royal Courts of Justice, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2LL, United Kingdom" amenity courthouse 0.821202519145559 United Kingdom FALSE
+royal dutch shell gb Europe Northern Europe FALSE 1 2021-02-03 18968246 node "Send Shell Petrol Station, Portsmouth Road, Send, Guildford, Surrey, South East, England, GU23 7JY, United Kingdom" amenity fuel 0.101 United Kingdom FALSE
+royal entomological society gb Europe Northern Europe FALSE 1 2021-02-03 99366475 way "Royal Entomological Society, Chiswell Green Lane, St Stephen, Chiswell Green, St Albans, Hertfordshire, East of England, England, AL2 3AJ, United Kingdom" building yes 0.301 United Kingdom FALSE
+royal free gb Europe Northern Europe FALSE 1 2021-02-03 249802441 way "Royal Free Hospital, Haverstock Hill, Belsize Park, London Borough of Camden, London, Greater London, England, NW3 4PT, United Kingdom" amenity hospital 0.583512305679518 United Kingdom FALSE
+royal free hospital gb Europe Northern Europe FALSE 1 2021-02-03 249802441 way "Royal Free Hospital, Haverstock Hill, Belsize Park, London Borough of Camden, London, Greater London, England, NW3 4PT, United Kingdom" amenity hospital 0.683512305679517 United Kingdom FALSE
+royal greenwich observatory gb Europe Northern Europe FALSE 1 2021-02-03 156694701 way "Royal Observatory Greenwich, Blackheath Avenue, East Greenwich, Royal Borough of Greenwich, London, Greater London, England, SE10 8XJ, United Kingdom" tourism museum 0.796673547671832 United Kingdom FALSE
+royal holloway university of london gb Europe Northern Europe FALSE 1 2021-02-03 85234417 way "Royal Holloway, Prune Hill, Ripley Springs, Bakeham House, Stroude, Runnymede, Surrey, South East, England, TW20 9TR, United Kingdom" amenity university 0.661486997579685 United Kingdom FALSE
+royal observatory gb Europe Northern Europe FALSE 1 2021-02-03 156694701 way "Royal Observatory Greenwich, Blackheath Avenue, East Greenwich, Royal Borough of Greenwich, London, Greater London, England, SE10 8XJ, United Kingdom" tourism museum 0.696673547671832 United Kingdom FALSE
+royal society a gb Europe Northern Europe FALSE 1 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.947225834784319 United Kingdom FALSE
+royal society and science gb Europe Northern Europe FALSE 1 2021-02-03 40152391 node "Blue plaque: Royal Society of Chemistry publishing, 290-292, Cambridge Science Park, Milton, South Cambridgeshire, Cambridgeshire, East of England, England, CB4 0FZ, United Kingdom" historic memorial 0.401 United Kingdom FALSE
+royal society b 1 gb Europe Northern Europe FALSE 1 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.947225834784319 United Kingdom FALSE
+royal society for the prevention of cruelty to animals gb Europe Northern Europe FALSE 1 2021-02-03 162454414 way "Scarborough & District RSPCA, Albemarle back Road, The Old Town, Scarborough, North Yorkshire, Yorkshire and the Humber, England, YO11 1YA, United Kingdom" building retail 0.201 United Kingdom FALSE
+royal society for the protection of birds gb Europe Northern Europe FALSE 1 2021-02-03 145438865 way "RSPB South Stack, South Stack Road, Trearddur, Holyhead, Ynys Môn / Isle of Anglesey, Cymru / Wales, LL65 1YH, United Kingdom" tourism attraction 0.101 United Kingdom FALSE
+royal society of edinburgh gb Europe Northern Europe FALSE 1 2021-02-03 19133034 node "Royal Society of Edinburgh, 22-26, George Street, New Town, New Town/Broughton, City of Edinburgh, Scotland, EH2 2PQ, United Kingdom" office charity 0.401 United Kingdom FALSE
+royal society of medicine gb Europe Northern Europe FALSE 1 2021-02-03 100091001 way "Royal Society of Medicine, 1, Wimpole Street, Mayfair, City of Westminster, London, Greater London, England, W1G 8GP, United Kingdom" building yes 0.401 United Kingdom FALSE
+royal statistical society gb Europe Northern Europe FALSE 1 2021-02-03 103932057 way "Royal Statistical Society, 12, Errol Street, Saint Luke's, Finsbury, London Borough of Islington, London, Greater London, England, EC1Y 8LX, United Kingdom" office association 0.301 United Kingdom FALSE
+royal united hospital gb Europe Northern Europe FALSE 1 2021-02-03 101624625 way "Royal United Hospital, Combe Park, Bath, Bath and North East Somerset, South West England, England, BA1 3NG, United Kingdom" amenity hospital 0.56358119422997 United Kingdom FALSE
+saatchi gb Europe Northern Europe FALSE 1 2021-02-03 84638610 way "Saatchi Gallery, King's Road, Hans Town, Chelsea, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW3 4RY, United Kingdom" tourism gallery 0.537540837084501 United Kingdom FALSE
+scarborough gb Europe Northern Europe FALSE 1 2021-02-03 258153305 relation "Scarborough, North Yorkshire, Yorkshire and the Humber, England, United Kingdom" boundary administrative 0.610764750724671 United Kingdom FALSE
+school of biological sciences gb Europe Northern Europe FALSE 1 2021-02-03 132715486 way "School of Biological Sciences, Tyndall Avenue, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS8 1TH, United Kingdom" building university 0.401 United Kingdom FALSE
+school of public health gb Europe Northern Europe FALSE 1 2021-02-03 246254593 way "School of Public Health, White City Estate, London Borough of Hammersmith and Fulham, London, Greater London, England, United Kingdom" landuse construction 0.6 United Kingdom FALSE
+science & technology facilities council gb Europe Northern Europe FALSE 1 2021-02-03 103985987 way "Royal Observatory, Edinburgh, Observatory Road, Blackford Hill, Blackford, City of Edinburgh, Scotland, EH9 3HJ, United Kingdom" tourism attraction 0.360151663261328 United Kingdom FALSE
+science policy centre gb Europe Northern Europe FALSE 1 2021-02-03 130406915 way "Centre for Science and Policy, 11-12, Trumpington Street, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 1QA, United Kingdom" building university 0.301 United Kingdom FALSE
+scott polar research institute gb Europe Northern Europe FALSE 1 2021-02-03 65100696 node "Scott Polar Research Institute, Lensfield Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 1EH, United Kingdom" emergency defibrillator 0.401 United Kingdom FALSE
+scottish crop research institute gb Europe Northern Europe FALSE 1 2021-02-03 243039744 way "Scottish Crop Research Institute, Kingoodie, Invergowrie, Perth and Kinross, Scotland, DD2 5DA, United Kingdom" landuse research 0.6 United Kingdom FALSE
+scottish national party gb Europe Northern Europe FALSE 1 2021-02-03 44686012 node "Scottish National Party, Brothock Bridge, Westport, Arbroath, Angus, Scotland, DD11 1NP, United Kingdom" office political_party 0.301 United Kingdom FALSE
+shaw gb Europe Northern Europe FALSE 1 2021-02-03 142176 node "Shaw, Oldham, Greater Manchester, North West England, England, OL2 7WS, United Kingdom" place town 0.502153233789513 United Kingdom FALSE
+slim jims gb Europe Northern Europe FALSE 1 2021-02-03 11297848 node "Slim Jim's, Whitecross Place, Bishopsgate, City of London, Greater London, England, EC2M 2PF, United Kingdom" leisure sports_centre 0.101 United Kingdom FALSE
+soa gb Europe Northern Europe FALSE 1 2021-02-03 103007279 way "Soa, Argyll and Bute, Scotland, United Kingdom" place island 0.425 United Kingdom FALSE
+socialist party gb Europe Northern Europe FALSE 1 2021-02-03 51925227 node "The Socialist Party, Clapham High Street, Clapham Park, London Borough of Lambeth, London, Greater London, England, SW4 7TY, United Kingdom" office political_party 0.201 United Kingdom FALSE
+soho gb Europe Northern Europe FALSE 1 2021-02-03 164417340 way "Soho, City of Westminster, London, Greater London, England, United Kingdom" place suburb 0.608698314216003 United Kingdom FALSE
+space research centre gb Europe Northern Europe FALSE 1 2021-02-03 104827767 way "Airbus Defence and Space (DMCii), 60, Priestley Road, Surrey Research Park, Worplesdon, Wood Street, Guildford, Surrey, South East, England, GU2 7AG, United Kingdom" office company 0.201 United Kingdom FALSE
+spt gb Europe Northern Europe FALSE 1 2021-02-03 124844971 way "Stockport Railway Station, Grand Central, Portwood, Stockport, Greater Manchester, North West England, England, SK3 9HZ, United Kingdom" building train_station 0.357411994477751 United Kingdom FALSE
+st andrews gb Europe Northern Europe FALSE 1 2021-02-03 114614 node "St Andrews, Fife, Scotland, KY16 9PA, United Kingdom" place town 0.693656743140345 United Kingdom FALSE
+st helens gb Europe Northern Europe FALSE 1 2021-02-03 258010551 relation "St Helens, North West England, England, United Kingdom" boundary administrative 0.675666298352635 United Kingdom FALSE
+st pancras international gb Europe Northern Europe FALSE 1 2021-02-03 45307830 node "London St. Pancras International, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2QS, United Kingdom" railway station 0.798004419460758 United Kingdom FALSE
+strait gb Europe Northern Europe FALSE 1 2021-02-03 220194897 way "The Strait, Windmill Hill, Wartling, Windmill Hill, Wealden, East Sussex, South East, England, BN27 4SB, United Kingdom" highway primary 0.2 United Kingdom FALSE
+surrey gb Europe Northern Europe FALSE 1 2021-02-03 258959916 relation "Surrey, South East, England, United Kingdom" boundary ceremonial 0.732622270075043 United Kingdom FALSE
+surrey satellite technology ltd gb Europe Northern Europe FALSE 1 2021-02-03 42885695 node "Surrey Satellite Technology Ltd, Woolmer Way, Woolmer Trading Estate, Whitehill, Bordon, East Hampshire, Hampshire, South East, England, GU35 9QE, United Kingdom" building industrial 0.401 United Kingdom FALSE
+surrey space centre gb Europe Northern Europe FALSE 1 2021-02-03 11415803 node "Surrey Space Centre, Spine Road, Guildford Park, Guildford, Surrey, South East, England, GU2 7XJ, United Kingdom" office research 0.301 United Kingdom FALSE
+sutton trust gb Europe Northern Europe FALSE 1 2021-02-03 254201689 way "Sutton House, 2 & 4, Homerton High Street, Lower Clapton, Homerton, London Borough of Hackney, London, Greater London, England, E9 6JQ, United Kingdom" tourism attraction 0.429260878198397 United Kingdom FALSE
+tb alliance gb Europe Northern Europe FALSE 1 2021-02-03 244997628 way "Alliance, Mill Lane, City Centre, Castle, Cardiff, Cymru / Wales, CF, United Kingdom" tourism artwork 0.36691348680426 United Kingdom FALSE
+telegram gb Europe Northern Europe FALSE 1 2021-02-03 116623602 way "Greyabbey Road, Ballywalter, County Down, Northern Ireland, BT22 2NT, United Kingdom" highway secondary 0.1 United Kingdom FALSE
+tern gb Europe Northern Europe FALSE 1 2021-02-03 240534072 way "Tern, Tenby, Pembrokeshire, Cymru / Wales, United Kingdom" place neighbourhood 0.35 United Kingdom FALSE
+the pirbright institute gb Europe Northern Europe FALSE 1 2021-02-03 96398766 way "The Pirbright Institute, Pirbright, Guildford, Surrey, South East, England, GU24 0NF, United Kingdom" landuse industrial 0.5 United Kingdom FALSE
+the royal society gb Europe Northern Europe FALSE 1 2021-02-03 3796847 node "The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom" building yes 0.947225834784319 United Kingdom FALSE
+the university of oxford gb Europe Northern Europe FALSE 1 2021-02-03 96249903 way "Oxford University Museum of Natural History, Parks Road, City Centre, Oxford, Oxfordshire, South East, England, OX1 3PW, United Kingdom" tourism museum 0.690225650640271 United Kingdom FALSE
+time team gb Europe Northern Europe FALSE 1 2021-02-03 63776799 node "Castle Hill (Time Team), Liddon Hill, Roundham, West Crewkerne, Crewkerne, South Somerset, Somerset, South West England, England, TA18 8RL, United Kingdom" historic archaeological_site 0.201 United Kingdom FALSE
+tokyo central wholesale market gb Europe Northern Europe FALSE 1 2021-02-03 154165677 way "Wholesale Market, Perry Barr, Birmingham, West Midlands Combined Authority, West Midlands, England, United Kingdom" landuse commercial 0.4 United Kingdom FALSE
+toshiba research europe gb Europe Northern Europe FALSE 1 2021-02-03 64980625 node "Toshiba Research Europe, 208, Cambridge Science Park, Chesterton, Cambridge, Cambridgeshire, East of England, England, CB4 0GZ, United Kingdom" office company 0.301 United Kingdom FALSE
+tree-ring laboratory gb Europe Northern Europe FALSE 1 2021-02-03 50297132 node "Newton's Apple Tree, Bushy Road, National Physical Laboratory, Hampton Hill, London Borough of Richmond upon Thames, London, Greater London, England, TW11 0NL, United Kingdom" natural tree 0.201 United Kingdom FALSE
+trojans gb Europe Northern Europe FALSE 1 2021-02-03 131238608 way "Liverpool Trojans Baseball Club, Bootle, Sefton, North West England, England, United Kingdom" landuse recreation_ground 0.3 United Kingdom FALSE
+u k gb Europe Northern Europe FALSE 1 2021-02-03 258411454 relation United Kingdom boundary administrative 1.07237801328373 United Kingdom FALSE
+ucl hospital gb Europe Northern Europe FALSE 1 2021-02-03 97008546 way "Petrie Museum of Egyptian Archeology, Malet Place, St Pancras, London Borough of Camden, London, Greater London, England, WC1E 6BT, United Kingdom" tourism museum 0.404546165234516 United Kingdom FALSE
+uk academy of medical sciences gb Europe Northern Europe FALSE 1 2021-02-03 223952996 way "Academy of Medical Sciences, 41, Portland Place, Fitzrovia, City of Westminster, London, Greater London, England, W1B 1AE, United Kingdom" office charity 0.401 United Kingdom FALSE
+uk biobank gb Europe Northern Europe FALSE 1 2021-02-03 139565700 way "UK Biobank, Europa Way, Stockport, Greater Manchester, North West England, England, SK3 0SA, United Kingdom" building warehouse 0.201 United Kingdom FALSE
+uk conservative party gb Europe Northern Europe FALSE 1 2021-02-03 150193380 way "Conservative Party, Glenlea Road, Well Hall, Royal Borough of Greenwich, London, Greater London, England, SE9 1DZ, United Kingdom" office political 0.201 United Kingdom FALSE
+uk department of health gb Europe Northern Europe FALSE 1 2021-02-03 139424486 way "Department Of Health, 39, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1, United Kingdom" office government 0.301 United Kingdom FALSE
+uk national graphene institute gb Europe Northern Europe FALSE 1 2021-02-03 301795627 way "National Graphene Institute, Booth Street East, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M13 9EP, United Kingdom" amenity research_institute 0.652151062176819 United Kingdom FALSE
+uk national institute of economic and social research gb Europe Northern Europe FALSE 1 2021-02-03 204474470 way "Institute Of Economic and Social Research, Dean Trench Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3HL, United Kingdom" building yes 0.601 United Kingdom FALSE
+uk space agency gb Europe Northern Europe FALSE 1 2021-02-03 79817723 node "UK Space Agency, North Star Avenue, Gorse Hill, Central Swindon North, Swindon, South West England, England, SN2 1EU, United Kingdom" office government 0.742006417463271 United Kingdom FALSE
+uk treasury gb Europe Northern Europe FALSE 1 2021-02-03 19225787 node "The Treasury, 59-61, High Street, London Borough of Sutton, London, Greater London, England, SM1 1DT, United Kingdom" amenity pub 0.101 United Kingdom FALSE
+uk university and college union gb Europe Northern Europe FALSE 1 2021-02-03 146247548 way "University and College Union, Carlow Street, Somers Town, London Borough of Camden, London, Greater London, England, NW1 7LL, United Kingdom" office trade_union 0.401 United Kingdom FALSE
+uk wellcome trust gb Europe Northern Europe FALSE 1 2021-02-03 165545925 way "Wellcome Trust, 215, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom" building yes 0.630084056292374 United Kingdom FALSE
+ulster university gb Europe Northern Europe FALSE 1 2021-02-03 59072243 node "Ulster University, York Street, Smithfield and Union, Carrick Hill, Belfast, County Antrim, Northern Ireland, BT15 1AS, United Kingdom" highway bus_stop 0.201 United Kingdom FALSE
+university autonomy gb Europe Northern Europe FALSE 1 2021-02-03 118976490 way "University of Salford, Orange, MediaCityUK, Salford Quays, Eccles, Salford, Greater Manchester, North West England, England, M50 2HF, United Kingdom" amenity university 0.101 United Kingdom FALSE
+university college london — gb Europe Northern Europe FALSE 1 2021-02-03 259450693 relation "University College London, Endsleigh Gardens, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0EB, United Kingdom" amenity university 0.615434238632773 United Kingdom FALSE
+university of bradford gb Europe Northern Europe FALSE 1 2021-02-03 107611269 way "University of Bradford, Tumbling Hill Street, Great Horton, Bradford, West Yorkshire, Yorkshire and the Humber, England, BD7 1DJ, United Kingdom" amenity university 0.7633898027116 United Kingdom FALSE
+university of bristol gb Europe Northern Europe FALSE 1 2021-02-03 50251699 node "University of Bristol, Woodland Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS2, United Kingdom" tourism information 0.301 United Kingdom FALSE
+university of buckingham gb Europe Northern Europe FALSE 1 2021-02-03 190534352 way "University of Buckingham, Nelson Street, Buckingham, Buckinghamshire, South East, England, MK18 1DB, United Kingdom" amenity university 0.730883005990736 United Kingdom FALSE
+university of greenwich gb Europe Northern Europe FALSE 1 2021-02-03 605157 node "University of Greenwich, Romney Road, East Greenwich, Royal Borough of Greenwich, London, Greater London, England, SE10 9JW, United Kingdom" amenity university 0.749987257448056 United Kingdom FALSE
+university of huddersfield gb Europe Northern Europe FALSE 1 2021-02-03 258496268 relation "Huddersfield University, Queensgate, Springwood, Aspley, Huddersfield, Kirklees, West Yorkshire, Yorkshire and the Humber, England, HD1 3DH, United Kingdom" amenity university 0.63609907778808 United Kingdom FALSE
+university of lancaster gb Europe Northern Europe FALSE 1 2021-02-03 95263873 way "Lancaster University, Scotforth Road, Lower Burrow, Hala, Bailrigg, Lancaster, Lancashire, North West England, England, LA2 0PH, United Kingdom" amenity university 0.201 United Kingdom FALSE
+university of northampton gb Europe Northern Europe FALSE 1 2021-02-03 175011057 way "The Pavillion, Boughton Green Road, Hill Top, Kingsthorpe, Northampton, Northamptonshire, East Midlands, England, NN2 7AL, United Kingdom" amenity bar 0.101 United Kingdom FALSE
+university of st. andrews gb Europe Northern Europe FALSE 1 2021-02-03 44520497 node "University of St Andrews, North Street, St Andrews, Fife, Scotland, KY16 9AJ, United Kingdom" amenity university 0.967907552390845 United Kingdom FALSE
+university of strathclyde gb Europe Northern Europe FALSE 1 2021-02-03 91823946 way "University of Strathclyde, High Street, Townhead, Glasgow, Glasgow City, Scotland, G4 0QT, United Kingdom" amenity university 0.780337454409521 United Kingdom FALSE
+university oxford gb Europe Northern Europe FALSE 1 2021-02-03 115937498 way "University College, Logic Lane, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4EX, United Kingdom" amenity university 0.683844730994415 United Kingdom FALSE
+us episcopal church gb Europe Northern Europe FALSE 1 2021-02-03 4563113 node "Episcopal Church, Panmure Street, Ashludie Farm, Monifieth, Angus, Scotland, DD5 4EB, United Kingdom" highway bus_stop 0.301 United Kingdom FALSE
+volkswagen gb Europe Northern Europe FALSE 1 2021-02-03 240063450 way "Isaac Agnew VW, Boucher Road, Upper Falls, Windsor, Belfast, County Antrim, Northern Ireland, BT12 6HR, United Kingdom" shop car 0.55042408908923 United Kingdom FALSE
+warwick gb Europe Northern Europe FALSE 1 2021-02-03 258180459 relation "Warwick, Warwickshire, West Midlands, England, United Kingdom" boundary administrative 0.584132173720047 United Kingdom FALSE
+warwickshire gb Europe Northern Europe FALSE 1 2021-02-03 257896615 relation "Warwickshire, West Midlands, England, United Kingdom" boundary administrative 0.685194555348613 United Kingdom FALSE
+washington university genome center gb Europe Northern Europe FALSE 1 2021-02-03 206300612 way "University of East Anglia, Wilberforce Road, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom" amenity university 0.604172803149122 United Kingdom FALSE
+washington university medical school gb Europe Northern Europe FALSE 1 2021-02-03 91134371 way "Medical School, Clifton Boulevard, Dunkirk, City of Nottingham, East Midlands, England, NG7 2UH, United Kingdom" amenity university 0.201 United Kingdom FALSE
+wellcome collection gb Europe Northern Europe FALSE 1 2021-02-03 26295657 node "Wellcome Collection, 183, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom" tourism museum 0.573149623765757 United Kingdom FALSE
+wellcome genome campus gb Europe Northern Europe FALSE 1 2021-02-03 84754756 way "Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, United Kingdom" landuse commercial 0.56358119422997 United Kingdom FALSE
+wellcome sanger gb Europe Northern Europe FALSE 1 2021-02-03 259312934 relation "Wellcome Trust Sanger Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SA, United Kingdom" amenity research_institute 0.611524674526993 United Kingdom FALSE
+wellcome trust centre for human genetics gb Europe Northern Europe FALSE 1 2021-02-03 24717265 node "Wellcome Trust Centre for Human Genetics, Roosevelt Drive, Highfield, Lye Valley, Oxford, Oxfordshire, South East, England, OX3 7BN, United Kingdom" place house 0.932422207003221 United Kingdom FALSE
+wellcome trust centre for human genetics in oxford gb Europe Northern Europe FALSE 1 2021-02-03 24717265 node "Wellcome Trust Centre for Human Genetics, Roosevelt Drive, Highfield, Lye Valley, Oxford, Oxfordshire, South East, England, OX3 7BN, United Kingdom" place house 1.13242220700322 United Kingdom FALSE
+wellcome trust uk gb Europe Northern Europe FALSE 1 2021-02-03 165545925 way "Wellcome Trust, 215, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom" building yes 0.630084056292374 United Kingdom FALSE
+whitehall gb Europe Northern Europe FALSE 1 2021-02-03 146097 node "Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2NH, United Kingdom" place locality 0.601129483245782 United Kingdom FALSE
+windsor gb Europe Northern Europe FALSE 1 2021-02-03 94155375 way "Windsor Castle, Thames Street, Clewer New Town, Eton, Windsor and Maidenhead, South East, England, SL4 1PR, United Kingdom" tourism attraction 0.649537394811591 United Kingdom FALSE
+wrexham glyndŵr university gb Europe Northern Europe FALSE 1 2021-02-03 126645813 way "Wrexham Glyndŵr University, Mold Road, Offa, Wrexham, Cymru / Wales, LL11 2AW, United Kingdom" amenity university 0.688219355609235 United Kingdom FALSE
+1752 group fr Europe Western Europe FALSE 1 2021-02-03 26457996 node "Le Group, Larnaldesq, Le Vibal, Millau, Aveyron, Occitanie, France métropolitaine, 12290, France" place locality 0.225 France FALSE
+acmd fr Europe Western Europe FALSE 1 2021-02-03 71917036 node "ACMD Chaudeyrac, D 500, Le Pont du Mont, Saint-Front, Le Puy-en-Velay, Haute-Loire, Auvergne-Rhône-Alpes, France métropolitaine, 43550, France" man_made street_cabinet 0.101 France FALSE
+adc fr Europe Western Europe FALSE 1 2021-02-03 259127644 relation "Agglomération du Choletais, Maine-et-Loire, Pays de la Loire, France métropolitaine, France" boundary local_authority 0.324670737896991 France FALSE
+afp fr Europe Western Europe FALSE 1 2021-02-03 109098482 way "Agence France-Presse, 24, Avenue des Français Libres, Petite Californie, Saint-Hélier, Thabor - Saint-Hélier - Alphonse Guérin, Quartiers Centre, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35000, France" office company 0.592517658210275 France FALSE
+aissa fr Europe Western Europe FALSE 1 2021-02-03 258381645 relation "Aixe-sur-Vienne, Limoges, Haute-Vienne, Nouvelle-Aquitaine, France métropolitaine, 87700, France" boundary administrative 0.492332154360411 France FALSE
+ames fr Europe Western Europe FALSE 1 2021-02-03 257943096 relation "Ames, Béthune, Pas-de-Calais, Hauts-de-France, France métropolitaine, 62190, France" boundary administrative 0.670680037787526 France FALSE
+anais fr Europe Western Europe FALSE 1 2021-02-03 257427833 relation "Anais, Rochefort, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17540, France" boundary administrative 0.635438301112098 France FALSE
+ansa fr Europe Western Europe FALSE 1 2021-02-03 258683808 relation "Ance, Ance-Féas, Oloron-Sainte-Marie, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64570, France" boundary administrative 0.54258541444388 France FALSE
+ansan fr Europe Western Europe FALSE 1 2021-02-03 257452491 relation "Ansan, Auch, Gers, Occitanie, France métropolitaine, 32270, France" boundary administrative 0.630031149843668 France FALSE
+arkema fr Europe Western Europe FALSE 1 2021-02-03 247250195 way "Arkema, Serquigny, Bernay, Eure, Normandie, France métropolitaine, 27470, France" landuse industrial 0.3 France FALSE
+avn fr Europe Western Europe FALSE 1 2021-02-03 102000501 way "Aéroport Avignon Provence, Chemin des Félons, Quartier Agroparc, Avignon, Vaucluse, Provence-Alpes-Côte d'Azur, France métropolitaine, 84000, France" aeroway aerodrome 0.375142530859403 France FALSE
+bains fr Europe Western Europe FALSE 1 2021-02-03 258323998 relation "Bains, Le Puy-en-Velay, Haute-Loire, Auvergne-Rhône-Alpes, France métropolitaine, 43370, France" boundary administrative 0.598308965599252 France FALSE
+barc fr Europe Western Europe FALSE 1 2021-02-03 257946952 relation "Barc, Bernay, Eure, Normandie, France métropolitaine, 27170, France" boundary administrative 0.648166057069124 France FALSE
+bio fr Europe Western Europe FALSE 1 2021-02-03 257951620 relation "Bio, Gourdon, Lot, Occitanie, France métropolitaine, 46500, France" boundary administrative 0.606009666236864 France FALSE
+biotechniques fr Europe Western Europe FALSE 1 2021-02-03 143597040 way "S.E.R.P. / Les Complexes Biotechniques, 3, Chemin de Notre-Dame d'Alem, Lotissement des Chênes, Courbieu, Castelsarrasin, Tarn-et-Garonne, Occitanie, France métropolitaine, 82100, France" building industrial 0.101 France FALSE
+biotropica fr Europe Western Europe FALSE 1 2021-02-03 149863985 way "Biotropica, D 110, Val-de-Reuil, Les Andelys, Eure, Normandie, France métropolitaine, France" tourism zoo 0.101 France FALSE
+bmc biol fr Europe Western Europe FALSE 1 2021-02-03 257271286 relation "Biol, La Tour-du-Pin, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38690, France" boundary administrative 0.63837155629697 France FALSE
+boehringer ingelheim fr Europe Western Europe FALSE 1 2021-02-03 236180040 way "12, Boehringer Ingelheim, Reims, Marne, Grand Est, France métropolitaine, 51100, France" landuse commercial 0.4 France FALSE
+bosc fr Europe Western Europe FALSE 1 2021-02-03 257494857 relation "Le Bosc, Lodève, Hérault, Occitanie, France métropolitaine, 34700, France" boundary administrative 0.613242845306654 France FALSE
+bri fr Europe Western Europe FALSE 1 2021-02-03 257987067 relation "Brie, Laon, Aisne, Hauts-de-France, France métropolitaine, 02870, France" boundary administrative 0.663841846568865 France FALSE
+business gene fr Europe Western Europe FALSE 1 2021-02-03 258579003 relation "Gené, Erdre-en-Anjou, Segré, Maine-et-Loire, Pays de la Loire, France métropolitaine, 49220, France" boundary administrative 0.492852965296036 France FALSE
+camarades fr Europe Western Europe FALSE 1 2021-02-03 82801014 node "Fosse aux Camarades, Saint-Étienne-à -Arnes, Vouziers, Ardennes, Grand Est, France métropolitaine, 08310, France" place locality 0.225 France FALSE
+casac fr Europe Western Europe FALSE 1 2021-02-03 258518811 relation "Cazac, Saint-Gaudens, Haute-Garonne, Occitanie, France métropolitaine, 31230, France" boundary administrative 0.545962513581625 France FALSE
+cavu fr Europe Western Europe FALSE 1 2021-02-03 243007804 way "Cavu, Morticcio Di Cava, Zonza, Sartène, Corse-du-Sud, Corse, France métropolitaine, 20124, France" landuse residential 0.3 France FALSE
+ceaa fr Europe Western Europe FALSE 1 2021-02-03 258116230 relation "Centre d'expertise autisme adulte (C.E.A.A.), Rue François Couhé, Goise, Goise Champommier Champclairot, Niort, Deux-Sèvres, Nouvelle-Aquitaine, France métropolitaine, 79000, France" building hospital 0.001 France FALSE
+center for studies fr Europe Western Europe FALSE 1 2021-02-03 79329921 node "EUISS, 100, Avenue de Suffren, Quartier du Gros-Caillou, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France" office government 0.408257033589149 France FALSE
+cgc fr Europe Western Europe FALSE 1 2021-02-03 258931479 relation "Challans-Gois Communauté, Loire-Atlantique, Pays de la Loire, France métropolitaine, France" boundary local_authority 0.297580560553068 France FALSE
+cgg fr Europe Western Europe FALSE 1 2021-02-03 125620979 way "Galileo - CGG, 27, Avenue Carnot, Atlantis, Massy, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91300, France" office company 0.101 France FALSE
+cgt fr Europe Western Europe FALSE 1 2021-02-03 68123191 node "Confédération Générale du Travail, Rue Léon Jouhaux, Centre Ville - La Fayette - Eblé, Angers, Maine-et-Loire, Pays de la Loire, France métropolitaine, 49100, France" office union 0.462615389253141 France FALSE
+chimie paristech fr Europe Western Europe FALSE 1 2021-02-03 255063606 way "Chimie ParisTech - Université PSL, Rue d'Ulm, Quartier du Val-de-Grâce, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France" amenity university 0.609552900499061 France FALSE
+ciel austral fr Europe Western Europe FALSE 1 2021-02-03 226066521 way "Route du Ciel (R. 66), Port-aux-Français, Terres australes et antarctiques françaises, France" highway tertiary 0.3 France FALSE
+cirad fr Europe Western Europe FALSE 1 2021-02-03 48847329 node "CIRAD, Chemin Grand Canal, La Bretagne, Saint-Denis, La Réunion, 97492, France" amenity university 0.101 France FALSE
+cires fr Europe Western Europe FALSE 1 2021-02-03 258395752 relation "Cirès, Saint-Gaudens, Haute-Garonne, Occitanie, France métropolitaine, 31110, France" boundary administrative 0.539169238495007 France FALSE
+climatic service fr Europe Western Europe FALSE 1 2021-02-03 296453392 node "Climatic, 212, Route de La Seyne, Entre les Horts, Ollioules, Toulon, Var, Provence-Alpes-Côte d'Azur, France métropolitaine, 83190, France" shop appliance 0.101 France FALSE
+codis fr Europe Western Europe FALSE 1 2021-02-03 109262595 way "Codis, Avenue du Douard, Zone industrielle des Paluds, Aubagne, Marseille, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13400, France" building yes 0.101 France FALSE
+continental europe fr Europe Western Europe FALSE 1 2021-02-03 18973745 node "Europe, Rue de Madrid, Quartier de l'Europe, Paris 8e Arrondissement, Paris, Île-de-France, France métropolitaine, 75008, France" railway station 0.508908372801738 France FALSE
+corps fr Europe Western Europe FALSE 1 2021-02-03 258086431 relation "Corps, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38970, France" boundary administrative 0.643147513931235 France FALSE
+cospar fr Europe Western Europe FALSE 1 2021-02-03 80463846 node "Committee on Space Research, 2, Place Maurice Quentin, Quartier des Halles, Quartier Les Halles, Paris 1er Arrondissement, Paris, Île-de-France, France métropolitaine, 75001, France" office research 0.462953287025885 France FALSE
+covidien fr Europe Western Europe FALSE 1 2021-02-03 38712267 node "Covidien, 1, Place de l'Hôpital, La Petite France, Krutenau, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67065, France" office company 0.425302870611459 France FALSE
+cru fr Europe Western Europe FALSE 1 2021-02-03 49528176 node "Le Cru, Lamontélarié, Castres, Tarn, Occitanie, France métropolitaine, 81260, France" place isolated_dwelling 0.3 France FALSE
+csti fr Europe Western Europe FALSE 1 2021-02-03 71480460 node "CSTI, Rampe de Zuoaves, Porette, Faubourg Scarafaglie, Corte, Haute-Corse, Corse, France métropolitaine, 20250, France" office association 0.101 France FALSE
+culture and sport fr Europe Western Europe FALSE 1 2021-02-03 107858191 way "Culture Sport, Rue du Château, Ganges, Lodève, Hérault, Occitanie, France métropolitaine, 34190, France" shop sports 0.201 France FALSE
+defense fr Europe Western Europe FALSE 1 2021-02-03 54227491 node "La Défense, Quartier Gambetta, Courbevoie, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92400, France" place suburb 0.510297600438359 France FALSE
+deme fr Europe Western Europe FALSE 1 2021-02-03 258963489 relation "La Dême, Indre-et-Loire, Centre-Val de Loire, France métropolitaine, France" waterway river 0.3 France FALSE
+dpp fr Europe Western Europe FALSE 1 2021-02-03 53822962 node "DPP, Saint-Leu, Saint-Paul, La Réunion, 97426, France" waterway waterfall 0.35 France FALSE
+dtt fr Europe Western Europe FALSE 1 2021-02-03 25906171 node "dtt, Rue des Provenceaux, Les Pleus, Fontainebleau, Seine-et-Marne, Île-de-France, France métropolitaine, 77300, France" office architect 0.111 France FALSE
+eaa fr Europe Western Europe FALSE 1 2021-02-03 74755684 node "Eaea, Hitiaa, Hitiaa O Te Ra, Îles du Vent, Polynésie Française, 98705, France" place neighbourhood 0.25 France FALSE
+ecw fr Europe Western Europe FALSE 1 2021-02-03 46390846 node "ECW, 309, Avenue Lavoisier, Parc d'activité des Estuaires - Espace du Mortier, Derval, Châteaubriant-Ancenis, Loire-Atlantique, Pays de la Loire, France métropolitaine, 44590, France" office company 0.101 France FALSE
+élysée palace fr Europe Western Europe FALSE 1 2021-02-03 258481424 relation "Palais de l'Élysée, Avenue de Marigny, Quartier de la Madeleine, Paris 8e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75008, France" tourism attraction 0.509937038508179 France FALSE
+ens fr Europe Western Europe FALSE 1 2021-02-03 258700882 relation "Ens, Bagnères-de-Bigorre, Hautes-Pyrénées, Occitanie, France métropolitaine, 65170, France" boundary administrative 0.63322651402867 France FALSE
+epure fr Europe Western Europe FALSE 1 2021-02-03 232595073 way "Epure, Allée Léopold Sédar Senghor, Gerland, Lyon 7e Arrondissement, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69007, France" building office 0.101 France FALSE
+ero fr Europe Western Europe FALSE 1 2021-02-03 258249267 relation "Hérault, Occitanie, France métropolitaine, France" boundary administrative 0.612674328718567 France FALSE
+esrf fr Europe Western Europe FALSE 1 2021-02-03 257718140 relation "European Synchrotron Radiation Facility, A 480, Polygone Scientifique, Secteur 1, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38000, France" building office 0.360151663261328 France FALSE
+european banking authority fr Europe Western Europe FALSE 1 2021-02-03 76900435 node "EBA, 20, Avenue André Prothin, La Défense 4, Quartier Gambetta, Courbevoie, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92927, France" office government 0.410978906513343 France FALSE
+facebook ai research fr Europe Western Europe FALSE 1 2021-02-03 45183919 node "Facebook Artificial Intelligence Research, 108-112, Avenue de Wagram, Quartier des Ternes, Paris 17e Arrondissement, Paris, Île-de-France, France métropolitaine, 75017, France" office company;research 0.301 France FALSE
+floc fr Europe Western Europe FALSE 1 2021-02-03 13960329 node "Floc, Pouillon, Arrondissement de Dax, Landes, Nouvelle-Aquitaine, France métropolitaine, 40350, France" place isolated_dwelling 0.3 France FALSE
+food research initiative fr Europe Western Europe FALSE 1 2021-02-03 61551953 node "Khatmandou, 22, Rue des Boulangers, Quartier Saint-Victor, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France" amenity restaurant 0.001 France FALSE
+fsc fr Europe Western Europe FALSE 1 2021-02-03 102019407 way "Figari - Sud Corse, D 22, Poggiale, Figari, Sartène, Corse-du-Sud, Corse, France métropolitaine, 20114, France" aeroway aerodrome 0.407681409931154 France FALSE
+ge healthcare fr Europe Western Europe FALSE 1 2021-02-03 143374856 way "GE Healthcare, Buc, Versailles, Yvelines, Île-de-France, France métropolitaine, 78530, France" landuse industrial 0.4 France FALSE
+gfp fr Europe Western Europe FALSE 1 2021-02-03 112738340 way "GFP, 2, Rue Joseph Fourier, Zone d'activités Chartres Est Secteur Le Jardin d’Entreprises, Chartres, Eure-et-Loir, Centre-Val de Loire, France métropolitaine, 28000, France" building yes 0.101 France FALSE
+grandes ecoles fr Europe Western Europe FALSE 1 2021-02-03 188423310 way "Grandes Écoles, Metz-Technopôle, Grange-aux-Bois, Grigy, Metz, Moselle, Grand Est, France métropolitaine, France" highway bus_stop 0.2 France FALSE
+greenpeace france fr Europe Western Europe FALSE 1 2021-02-03 66030093 node "GreenPeace France, 13, Rue d'Enghien, Quartier de la Porte-Saint-Denis, Paris 10e Arrondissement, Paris, Île-de-France, France métropolitaine, 75010, France" office ngo 0.201 France FALSE
+group fr Europe Western Europe FALSE 1 2021-02-03 26457996 node "Le Group, Larnaldesq, Le Vibal, Millau, Aveyron, Occitanie, France métropolitaine, 12290, France" place locality 0.225 France FALSE
+grrc fr Europe Western Europe FALSE 1 2021-02-03 64554689 node "Groupe de Réflexion sur la Recherche Cardiovasculaire, Rue des Colonnes du Trône, Quartier de Picpus, Paris 12e Arrondissement, Paris, Île-de-France, France métropolitaine, 75012, France" office foundation 0.001 France FALSE
+hec fr Europe Western Europe FALSE 1 2021-02-03 115502194 way "HEC Paris, Rue Curie, Val d'Albian, Saclay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91400, France" amenity college 0.581992451472996 France FALSE
+hec paris fr Europe Western Europe FALSE 1 2021-02-03 115502194 way "HEC Paris, Rue Curie, Val d'Albian, Saclay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91400, France" amenity college 0.681992451472996 France FALSE
+hermes fr Europe Western Europe FALSE 1 2021-02-03 257935464 relation "Hermes, Beauvais, Oise, Hauts-de-France, France métropolitaine, 60370, France" boundary administrative 0.656526838838103 France FALSE
+hewlett-packard fr Europe Western Europe FALSE 1 2021-02-03 100448886 way "Hewlett Packard, Eybens, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38320, France" landuse industrial 0.4 France FALSE
+huawei technologies fr Europe Western Europe FALSE 1 2021-02-03 57899451 node "Huawei Technologies, Quai du Point du Jour, Point du Jour, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" office company 0.201 France FALSE
+hust fr Europe Western Europe FALSE 1 2021-02-03 258051090 relation "Huest, Évreux, Eure, Normandie, France métropolitaine, 27930, France" boundary administrative 0.552302585820702 France FALSE
+inria fr Europe Western Europe FALSE 1 2021-02-03 258818694 relation "INRIA, 655, Avenue de l'Europe, Innovallée Montbonnot, Montbonnot-Saint-Martin, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38330, France" office research 0.49425812326797 France FALSE
+insa fr Europe Western Europe FALSE 1 2021-02-03 98992110 way "INSA, 135, Avenue de Rangueil, Rangueil, Sauzelong, Pech David, Pouvourville, Toulouse Sud-Est, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31400, France" amenity college 0.528807256594898 France FALSE
+institute for security studies fr Europe Western Europe FALSE 1 2021-02-03 79329921 node "EUISS, 100, Avenue de Suffren, Quartier du Gros-Caillou, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France" office government 0.408257033589149 France FALSE
+international agency for research on cancer fr Europe Western Europe FALSE 1 2021-02-03 106923016 way "Centre international de Recherche sur le Cancer, Cours Albert Thomas, Transvaal, Lyon 8e Arrondissement, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, France" office ngo 0.756343487668219 France FALSE
+interphone fr Europe Western Europe FALSE 1 2021-02-03 71822924 node "Interphone, 83, Avenue Albert Petit, Résidence du Port Galand, Bagneux, Antony, Hauts-de-Seine, Île-de-France, France métropolitaine, 92220, France" amenity internet_cafe 0.101 France FALSE
+interpol fr Europe Western Europe FALSE 1 2021-02-03 106770347 way "Interpol, Quai Charles de Gaulle, Cité Internationale, Lyon 6e Arrondissement, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69006, France" amenity police 0.694215113171225 France FALSE
+ipfm fr Europe Western Europe FALSE 1 2021-02-03 20680313 node "IPFM - CFA régional des métiers et de l'artisanat, 68, Allée des Forges, Les Mouissèques, La Seyne-sur-Mer, Toulon, Var, Provence-Alpes-Côte d'Azur, France métropolitaine, 83500, France" office educational_institution 0.101 France FALSE
+isac fr Europe Western Europe FALSE 1 2021-02-03 258407194 relation "Saint-Pardoux-Isaac, Marmande, Lot-et-Garonne, Nouvelle-Aquitaine, France métropolitaine, 47800, France" boundary administrative 0.507842182728223 France FALSE
+islamic state fr Europe Western Europe FALSE 1 2021-02-03 49429621 node "Islamic, Avenue de Berne, Saint-Maurice, La Rochelle, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17000, France" amenity library 0.101 France FALSE
+issi fr Europe Western Europe FALSE 1 2021-02-03 258465068 relation "Heussé, Le Teilleul, Avranches, Manche, Normandie, France métropolitaine, 50640, France" boundary administrative 0.540896235650295 France FALSE
+kedge business school fr Europe Western Europe FALSE 1 2021-02-03 98027822 way "Kedge Business School, Avenue Pey-Berland, Thouars, Talence, Bordeaux, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33400, France" amenity college 0.624032054467804 France FALSE
+la france insoumise fr Europe Western Europe FALSE 1 2021-02-03 67479137 node "La France Insoumise, 43, Rue de Dunkerque, Quartier Saint-Vincent-de-Paul, Paris 10e Arrondissement, Paris, Île-de-France, France métropolitaine, 75010, France" office political_party 0.301 France FALSE
+le canard enchaîné fr Europe Western Europe FALSE 1 2021-02-03 39428962 node "Le Canard Enchainé, 173, Rue Saint-Honoré, Quartier de la Madeleine, Paris 8e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75008, France" office newspaper 0.657752713427244 France FALSE
+le monde fr Europe Western Europe FALSE 1 2021-02-03 31554000 node "Le Monde, Lamastre, Tournon-sur-Rhône, Ardèche, Auvergne-Rhône-Alpes, France métropolitaine, 07270, France" place hamlet 0.45 France FALSE
+le quéré fr Europe Western Europe FALSE 1 2021-02-03 259354933 relation "La Quère, Coustouges, Céret, Pyrénées-Orientales, Occitanie, France métropolitaine, 66260, France" waterway river 0.4 France FALSE
+le tourneau fr Europe Western Europe FALSE 1 2021-02-03 17540630 node "Tourneau, Martizay, Le Blanc, Indre, Centre-Val de Loire, France métropolitaine, 36220, France" place hamlet 0.45 France FALSE
+lrem fr Europe Western Europe FALSE 1 2021-02-03 5716951 node "Permanance du député LREM Sylvain Waserman, Route de l'Hôpital, Krutenau, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67076, France" office political_party 0.101 France FALSE
+macron fr Europe Western Europe FALSE 1 2021-02-03 72308788 node "Macron, Rue des Pierres du Faing, Sainte-Marguerite, Saint-Dié-des-Vosges, Vosges, Grand Est, France métropolitaine, 88100, France" shop sports 0.101 France FALSE
+mars fr Europe Western Europe FALSE 1 2021-02-03 258293542 relation "Mars, Tournon-sur-Rhône, Ardèche, Auvergne-Rhône-Alpes, France métropolitaine, 07320, France" boundary administrative 0.612054242729639 France FALSE
+mercury fr Europe Western Europe FALSE 1 2021-02-03 258144896 relation "Mercury, Albertville, Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 73200, France" boundary administrative 0.594893283996417 France FALSE
+mgp fr Europe Western Europe FALSE 1 2021-02-03 258784757 relation "Métropole du Grand Paris, Paris, Île-de-France, France métropolitaine, France" boundary local_authority 0.455626604417121 France FALSE
+montpellier fr Europe Western Europe FALSE 1 2021-02-03 257963687 relation "Montpellier, Hérault, Occitanie, France métropolitaine, France" boundary administrative 0.741204187018582 France FALSE
+morgan sheng fr Europe Western Europe FALSE 1 2021-02-03 80011400 node "Morgan, Rue Guillaume Apollinaire, ZAC de Châteaufarine, Chateaufarine, Besançon, Doubs, Bourgogne-Franche-Comté, France métropolitaine, 25000, France" shop clothes 0.328876356713622 France FALSE
+morris minor fr Europe Western Europe FALSE 1 2021-02-03 208273363 way "Rue Morris, La Bergerie, Liffré, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35340, France" highway residential 0.2 France FALSE
+mountain research initiative fr Europe Western Europe FALSE 1 2021-02-03 25249463 node "Initiative pour la Recherche et l'Innovation sur le Logiciel Libre, 4, Place Jussieu, Quartier Saint-Victor, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France" office research 0.281472839091896 France FALSE
+naia fr Europe Western Europe FALSE 1 2021-02-03 7345492 node "Naia, Païta, Province Sud, Nouvelle-Calédonie, France" place suburb 0.375 France FALSE
+national prion clinic fr Europe Western Europe FALSE 1 2021-02-03 297718104 node "Le Prion, Fronville, Saint-Dizier, Haute-Marne, Grand Est, France métropolitaine, 52300, France" place locality 0.225 France FALSE
+neutron science d fr Europe Western Europe FALSE 1 2021-02-03 105884382 way "European Photon and Neutron Science Campus, 71, Avenue des Martyrs, Polygone Scientifique, Secteur 1, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38000, France" amenity research_institute 0.458083983169266 France FALSE
+ob association fr Europe Western Europe FALSE 1 2021-02-03 201036713 way "Robinson, Lac de Maine, La Bijouterie, Angers, Maine-et-Loire, Pays de la Loire, France métropolitaine, France" place island 0.425 France FALSE
+organisation for economic cooperation and development fr Europe Western Europe FALSE 1 2021-02-03 103637552 way "OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France" office government 0.669924309656139 France FALSE
+pacific community fr Europe Western Europe FALSE 1 2021-02-03 6458038 node "Communauté du Pacifique, Accès CPS, Anse Vata, Secteur Sud, Nouméa, Province Sud, Nouvelle-Calédonie, 98800, France" office quango 0.001 France FALSE
+pacific marine fr Europe Western Europe FALSE 1 2021-02-03 10446875 node "Pacific Marine, Rue Auguste Bénébig, Les Massanes, Vallée des Colons, Secteur Sud, Nouméa, Province Sud, Nouvelle-Calédonie, 98800, France" shop boat 0.201 France FALSE
+paris descartes university fr Europe Western Europe FALSE 1 2021-02-03 222560238 way "ESIEE Paris, 2, Rond-Point Centre de la Terre, Bois de Grâce, Cité Descartes, Noisy-le-Grand, Torcy, Seine-et-Marne, Île-de-France, France métropolitaine, 93160, France" amenity university 0.568804350670811 France FALSE
+paris diderot university fr Europe Western Europe FALSE 1 2021-02-03 63739364 node "École d'ingénieurs Denis-Diderot, 8, Place Paul Ricœur, Quartier de la Gare, Paris 13e Arrondissement, Paris, Île-de-France, France métropolitaine, 75013, France" amenity university 0.285440647712364 France FALSE
+paris school of economics fr Europe Western Europe FALSE 1 2021-02-03 107920608 way "École d'économie de Paris, 48, Boulevard Jourdan, Quartier du Parc-de-Montsouris, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France" amenity university 0.422734482343971 France FALSE
+paris-descartes university fr Europe Western Europe FALSE 1 2021-02-03 222560238 way "ESIEE Paris, 2, Rond-Point Centre de la Terre, Bois de Grâce, Cité Descartes, Noisy-le-Grand, Torcy, Seine-et-Marne, Île-de-France, France métropolitaine, 93160, France" amenity university 0.568804350670811 France FALSE
+paris-nanterre university fr Europe Western Europe FALSE 1 2021-02-03 99926629 way "Université Paris Nanterre, 200, Avenue de la République, Quartier de la République, Nanterre, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92000, France" amenity university 0.674615563538129 France FALSE
+paris-saclay university fr Europe Western Europe FALSE 1 2021-02-03 79902045 node "Institut Pascal de l'université Paris-Saclay, 530, Rue André Rivière, Campus Urbain de Paris-Saclay, Corbeville, Orsay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91405, France" amenity university 0.608908372801738 France FALSE
+paul sabatier university fr Europe Western Europe FALSE 1 2021-02-03 117894361 way "IUT Paul Sabatier, Impasse Marguerite Orcival, Auch, Gers, Occitanie, France métropolitaine, 32000, France" amenity university 0.501865618613023 France FALSE
+pharma fr Europe Western Europe FALSE 1 2021-02-03 65490459 node "La Pharma, Rue de l'Armistice, La Capelle, Vervins, Aisne, Hauts-de-France, France métropolitaine, 02260, France" amenity pharmacy 0.101 France FALSE
+pkp pn fr Europe Western Europe FALSE 1 2021-02-03 206141098 way "Puka Puka Airport, Pukapuka, Tuamotu-Gambier, Polynésie Française, 98774, France" aeroway aerodrome 0.276645429377189 France FALSE
+plos fr Europe Western Europe FALSE 1 2021-02-03 2997221 node "Plos, Murat-sur-Vèbre, Castres, Tarn, Occitanie, France métropolitaine, 81320, France" place hamlet 0.35 France FALSE
+pppl fr Europe Western Europe FALSE 1 2021-02-03 74437071 node "PPPL Paris Pontoise Poids Lourds, Rue Lavoisier, Herblay-sur-Seine, Argenteuil, Val-d'Oise, Île-de-France, France métropolitaine, 95220, France" shop car_repair 0.101 France FALSE
+psa fr Europe Western Europe FALSE 1 2021-02-03 189374806 way "PSA, Saint-Ouen-sur-Seine, Saint-Denis, Seine-Saint-Denis, Île-de-France, France métropolitaine, 93400, France" landuse industrial 0.606493714650957 France FALSE
+quai branly museum fr Europe Western Europe FALSE 1 2021-02-03 93256799 way "Musée du quai Branly - Jacques Chirac, 37, Quai Branly, Quartier de Grenelle, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75007, France" tourism museum 0.658842937598083 France FALSE
+quintiles fr Europe Western Europe FALSE 1 2021-02-03 104302474 way "Quintiles, Rue Jean-Dominique Cassini, Parc d'Innovation Technologique d'Illkirch, Illkirch-Graffenstaden, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67400, France" building yes 0.101 France FALSE
+raphaël paris fr Europe Western Europe FALSE 1 2021-02-03 57440846 node "Raphael, Boulevard de Magenta, Quartier Saint-Vincent-de-Paul, Paris 10e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75010, France" amenity bureau_de_change 0.101 France FALSE
+rff fr Europe Western Europe FALSE 1 2021-02-03 214475334 way "Sous-station RFF de Saint-Marcel, Le Moulin de Saint-Marin, Saint-Marcel, Châteauroux, Indre, Centre-Val de Loire, France métropolitaine, 36200, France" landuse industrial 0.3 France FALSE
+rgi fr Europe Western Europe FALSE 1 2021-02-03 96915278 way "RGI, Boulevard Principal, Rangiroa, Tuamotu-Gambier, Polynésie Française, 98775, France" aeroway aerodrome 0.101 France FALSE
+rin fr Europe Western Europe FALSE 1 2021-02-03 258366255 relation "Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, France" boundary administrative 0.625111737838686 France FALSE
+ruch fr Europe Western Europe FALSE 1 2021-02-03 258043564 relation "Ruch, Langon, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33350, France" boundary administrative 0.638658334123937 France FALSE
+sanofi pasteur fr Europe Western Europe FALSE 1 2021-02-03 100174620 way "Sanofi-Pasteur, Marcy-l'Étoile, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69280, France" landuse industrial 0.4 France FALSE
+science europe fr Europe Western Europe FALSE 1 2021-02-03 105173939 way "Pôle Science, Chemin du Collège, Parc Europe, Marcq-en-Barœul, Lille, Nord, Hauts-de-France, France métropolitaine, 59700, France" building yes 0.201 France FALSE
+sers fr Europe Western Europe FALSE 1 2021-02-03 258412644 relation "Sers, Argelès-Gazost, Hautes-Pyrénées, Occitanie, France métropolitaine, 65120, France" boundary administrative 0.627233681006203 France FALSE
+smap fr Europe Western Europe FALSE 1 2021-02-03 118272814 way "SMAP, 110, Rue des Genêts, Beausoleil, Les Chauveaux, Pons, Jonzac, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17800, France" shop car_parts 0.101 France FALSE
+smrb fr Europe Western Europe FALSE 1 2021-02-03 130132163 way "Scierie Mobile Romagny Bernardini, D 120, Charmoy la Ville, Charmoy, Autun, Saône-et-Loire, Bourgogne-Franche-Comté, France métropolitaine, 71710, France" building yes 0.001 France FALSE
+soas fr Europe Western Europe FALSE 1 2021-02-03 257992695 relation "Soues, Tarbes, Hautes-Pyrénées, Occitanie, France métropolitaine, 65430, France" boundary administrative 0.528176451195692 France FALSE
+un convention fr Europe Western Europe FALSE 1 2021-02-03 310196 node "Convention, Rue de Vaugirard, Quartier Saint-Lambert, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France" railway station 0.504979282964766 France FALSE
+université grenoble alpes fr Europe Western Europe FALSE 1 2021-02-03 44630717 node "Université Grenoble Alpes, Rue de la Piscine, Domaine universitaire de Grenoble, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, France" tourism information 0.301 France FALSE
+université paris-saclay fr Europe Western Europe FALSE 1 2021-02-03 126984936 way "Université Paris-Saclay, Orsay Gare, Corbeville, Orsay, Palaiseau, Essonne, ÃŽle-de-France, France métropolitaine, 91400, France" highway unclassified 0.4 France FALSE
+université paris-sud fr Europe Western Europe FALSE 1 2021-02-03 125512473 way "Université Paris 1 Panthéon-Sorbonne Centre Pierre Mendès-France, 90, Rue de Tolbiac, Cité Florale, Quartier de la Maison-Blanche, Paris 13e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75013, France" amenity university 0.420860870373788 France FALSE
+university grenoble-alpes fr Europe Western Europe FALSE 1 2021-02-03 22506396 node "Gières Gare Univ, Gières - Gare - Universités, Chamandier, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38610, France" amenity bicycle_rental 0.201 France FALSE
+university of bordeaux-montaigne fr Europe Western Europe FALSE 1 2021-02-03 258587883 relation "Université de Bordeaux - Institut d'Administration des Entreprises, Place Pey Berland, Triangle d'Or, Bordeaux Centre, Bordeaux, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33000, France" amenity university 0.101 France FALSE
+university of bourgogne in dijon fr Europe Western Europe FALSE 1 2021-02-03 95205346 way "Université de Bourgogne, Mazen - Sully, Mirande, Montmuzard, Dijon, Côte-d'Or, Bourgogne-Franche-Comté, France métropolitaine, 21000, France" amenity university 0.752513195064787 France FALSE
+university of cergy-pontoise fr Europe Western Europe FALSE 1 2021-02-03 254258149 way "CY Cergy Paris Université - Site de Saint Martin, 2, Avenue François Mitterrand, Saint-Martin, Pontoise, Val-d'Oise, Île-de-France, France métropolitaine, 95302, France" building university 0.201 France FALSE
+university of chiron fr Europe Western Europe FALSE 1 2021-02-03 80237376 node "IAE Savoie Mont Blanc, Chemin de Jacob, Le Biollay, Jacob-Bellecombette, Chambéry, Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 73000, France" amenity university 0.001 France FALSE
+university of franche-comté fr Europe Western Europe FALSE 1 2021-02-03 95205346 way "Université de Bourgogne, Mazen - Sully, Mirande, Montmuzard, Dijon, Côte-d'Or, Bourgogne-Franche-Comté, France métropolitaine, 21000, France" amenity university 0.652513195064787 France FALSE
+university of grenoble fr Europe Western Europe FALSE 1 2021-02-03 22506396 node "Gières Gare Univ, Gières - Gare - Universités, Chamandier, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38610, France" amenity bicycle_rental 0.101 France FALSE
+university of nice fr Europe Western Europe FALSE 1 2021-02-03 174797616 way "Bibliothèque universitaire, Avenue Valrose, Saint-Maurice, Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, 06108, France" amenity library 0.101 France FALSE
+university of paris seine fr Europe Western Europe FALSE 1 2021-02-03 228628229 way "Université René Descartes - Centre Henri Pieron, Avenue Édouard Vaillant, Point du Jour, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" amenity university 0.101 France FALSE
+university of provence fr Europe Western Europe FALSE 1 2021-02-03 174797616 way "Bibliothèque universitaire, Avenue Valrose, Saint-Maurice, Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, 06108, France" amenity library 0.101 France FALSE
+university of reims fr Europe Western Europe FALSE 1 2021-02-03 57788284 node "Campus Cesi / Exia Reims, Avenue Robert Schuman, Croix-Rouge, Reims, Marne, Grand Est, France métropolitaine, 51100, France" amenity university 0.101 France FALSE
+university of reims champagne-ardenne fr Europe Western Europe FALSE 1 2021-02-03 57788284 node "Campus Cesi / Exia Reims, Avenue Robert Schuman, Croix-Rouge, Reims, Marne, Grand Est, France métropolitaine, 51100, France" amenity university 0.101 France FALSE
+university of savoie fr Europe Western Europe FALSE 1 2021-02-03 106618355 way "Abbaye de Talloires, Chemin de la Colombière, Les Granges, Talloires, Talloires-Montmin, Annecy, Haute-Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 74290, France" historic monastery 0.36358119422997 France FALSE
+university paris descartes fr Europe Western Europe FALSE 1 2021-02-03 222560238 way "ESIEE Paris, 2, Rond-Point Centre de la Terre, Bois de Grâce, Cité Descartes, Noisy-le-Grand, Torcy, Seine-et-Marne, Île-de-France, France métropolitaine, 93160, France" amenity university 0.568804350670811 France FALSE
+university paris seine fr Europe Western Europe FALSE 1 2021-02-03 228628229 way "Université René Descartes - Centre Henri Pieron, Avenue Édouard Vaillant, Point du Jour, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" amenity university 0.101 France FALSE
+university paris-saclay fr Europe Western Europe FALSE 1 2021-02-03 259420663 relation "Université Paris-Saclay à Palaiseau, 10;2, Boulevard Thomas Gobert, Rocher de Lozère, Les Taupiniaux, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91120, France" amenity university 0.201 France FALSE
+zte corporation fr Europe Western Europe FALSE 1 2021-02-03 57728490 node "ZTE Corporation, Rue Tony Garnier, Centre Ville, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France" office company 0.201 France FALSE
+ictv fm Oceania Micronesia FALSE 1 2021-02-03 43642085 node "ICTV, Kaselehlia, Kolonia, Sapwohn kousapw, Pohnpei, 96941, Micronesia" amenity studio 0.101 Micronesia FALSE
+micronesia fm Oceania Micronesia FALSE 1 2021-02-03 258075744 relation Micronesia boundary administrative 0.707162448380302 Micronesia FALSE
+aaaa fi Europe Northern Europe FALSE 1 2021-02-03 298635624 relation "aaaa, Inari, Pohjois-Lapin seutukunta, Lappi, Lapin aluehallintovirasto, Manner-Suomi, Suomi / Finland" natural water 0.31 Suomi / Finland FALSE
+aalto university fi Europe Northern Europe FALSE 1 2021-02-03 203146197 way "Aalto-yliopisto, 24, Otakaari, Teekkarikylä, Otaniemi, Suur-Tapiola, Espoo, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 02150, Suomi / Finland" amenity university 0.547526724801917 Suomi / Finland FALSE
+auriga fi Europe Northern Europe FALSE 1 2021-02-03 225561228 way "Auriga, Keskusta, Turku, Turun seutukunta, Varsinais-Suomi, Lounais-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" landuse commercial 0.3 Suomi / Finland FALSE
+helsinki fi Europe Northern Europe FALSE 1 2021-02-03 256826686 relation "Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" boundary administrative 0.838500451911677 Suomi / Finland FALSE
+meteorological institute fi Europe Northern Europe FALSE 1 2021-02-03 84585571 node "Ilmatieteen laitos, 1, Erik Palménin aukio, Kumpula, Keskinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00560, Suomi / Finland" amenity research_institute 0.397069208513039 Suomi / Finland FALSE
+state research agency fi Europe Northern Europe FALSE 1 2021-02-03 54517775 node "The Finnish Brain Research and Rehabilitation Center Neuron, Kortesalmi, Kuopio, Kuopion seutukunta, Pohjois-Savo, Itä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" amenity hospital 0.101 Suomi / Finland FALSE
+suomi fi Europe Northern Europe FALSE 1 2021-02-03 257282877 relation Suomi / Finland boundary administrative 0.907327503568528 Suomi / Finland FALSE
+university of eastern finland fi Europe Northern Europe FALSE 1 2021-02-03 94568596 way "Itä-Suomen yliopisto, Siltakatu, Otsola, Joensuu, Joensuun seutukunta, Pohjois-Karjala, Itä-Suomen aluehallintovirasto, Manner-Suomi, 80101, Suomi / Finland" amenity university 0.462945678183792 Suomi / Finland FALSE
+university of oulu fi Europe Northern Europe FALSE 1 2021-02-03 259419685 relation "Oulun yliopisto, Biologintie, Linnanmaa, Oulu, Oulun seutukunta, Pohjois-Pohjanmaa, Pohjois-Suomen aluehallintovirasto, Manner-Suomi, 90575, Suomi / Finland" amenity university 0.563054296170656 Suomi / Finland FALSE
+vtt fi Europe Northern Europe FALSE 1 2021-02-03 127038522 way "VTT, Halssila, Jyväskylä, Jyväskylän seutukunta, Keski-Suomi, Länsi- ja Sisä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland" landuse industrial 0.3 Suomi / Finland FALSE
+african union et Africa Eastern Africa FALSE 1 2021-02-03 75704898 node "African Union, Roosevelt Street, ሜáŠáˆ²áŠ®, Addis Ababa / አዲስ አበባ, Kirkos, አዲስ አበባ / Addis Ababa, 7777, ኢትዮጵያ" highway bus_stop 0.201 ኢትዮጵያ FALSE
+awi et Africa Eastern Africa FALSE 1 2021-02-03 258756604 relation "Awi, አማራ áŠáˆ<8d>áˆ<8d> / Amhara, ኢትዮጵያ" boundary administrative 0.6 ኢትዮጵያ FALSE
+blue nile et Africa Eastern Africa FALSE 1 2021-02-03 241758218 way "ዓባዠወንá‹<9d>, South Gonder, አማራ áŠáˆ<8d>áˆ<8d> / Amhara, ኢትዮጵያ" waterway river 0.322734482343971 ኢትዮጵያ FALSE
+desert locust control organization for eastern africa et Africa Eastern Africa FALSE 1 2021-02-03 201488286 way "Desert Locust Control Organization for Eastern Africa, Mann St, Yeka, አዲስ አበባ / Addis Ababa, 12994, ኢትዮጵያ" office ngo 0.701 ኢትዮጵያ FALSE
+hesa et Africa Eastern Africa FALSE 1 2021-02-03 11634819 node "Hesa, Illubabor, ኦሮሚያ áŠáˆ<8d>áˆ<8d> / Oromia, ኢትዮጵያ" place locality 0.225 ኢትዮጵያ FALSE
+nbcs et Africa Eastern Africa FALSE 1 2021-02-03 63661472 node "ሰሜን ደረቅ áŒáŠ<90>ት, GL_08_1609 St., አባዲና አካባቢ, Gulale, አዲስ አበባ / Addis Ababa, 9837, ኢትዮጵያ" office company 0.001 ኢትዮጵያ FALSE
+orcid et Africa Eastern Africa FALSE 1 2021-02-03 54414796 node "Orcid, Ring Road, ለቡ, Nefas Silk, አዲስ አበባ / Addis Ababa, 17979, ኢትዮጵያ" amenity drinking_water 0.101 ኢትዮጵያ FALSE
+sanyo et Africa Eastern Africa FALSE 1 2021-02-03 24120991 node "Sanyo, South Wollo, አማራ áŠáˆ<8d>áˆ<8d> / Amhara, ኢትዮጵያ" place village 0.375 ኢትዮጵያ FALSE
+zemen bank et Africa Eastern Africa FALSE 1 2021-02-03 74362165 node "Zemen Bank, 4, ደብረ ዘá‹á‰µ, Bishoftu, East Shewa, ኦሮሚያ áŠáˆ<8d>áˆ<8d> / Oromia, 1034, ኢትዮጵያ" amenity bank 0.201 ኢትዮጵያ FALSE
+aacr es Europe Southern Europe FALSE 1 2021-02-03 49737503 node "Aacr Museo, Calle Pedro del Toro, Museo, Casco Antiguo, Sevilla, AndalucÃa, 41001, España" tourism hotel 0.101 España FALSE
+anu es Europe Southern Europe FALSE 1 2021-02-03 257798719 relation "Anue, Navarra - Nafarroa, España" boundary administrative 0.606726039533275 España FALSE
+barañao es Europe Southern Europe FALSE 1 2021-02-03 45025401 node "Barañao, Zeberio, Bizkaia, Euskadi, 48148, España" place hamlet 0.35 España FALSE
+barcelona supercomputing centre es Europe Southern Europe FALSE 1 2021-02-03 221612695 way "Barcelona Supercomputing Center, Plaça d'Eusebi Güell, Pedralbes, les Corts, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España" building university 0.502323854176492 España FALSE
+bp oil es Europe Southern Europe FALSE 1 2021-02-03 824247 node "BP OIL, Avenida de Bruselas, Algeciras, Campo de Gibraltar, Cádiz, AndalucÃa, 11204, España" amenity fuel 0.201 España FALSE
+cabells es Europe Southern Europe FALSE 1 2021-02-03 15572882 node "Cabells, Carrer d'Adoberies, Castelló de la Plana, la Plana Alta, Castelló / Castellón, Comunitat Valenciana, 12003, España" shop hairdresser 0.101 España FALSE
+caesar es Europe Southern Europe FALSE 1 2021-02-03 258240062 relation "El Casar, Guadalajara, Castilla-La Mancha, 19170, España" boundary administrative 0.513983450221256 España FALSE
+cajal es Europe Southern Europe FALSE 1 2021-02-03 12607846 node "El Cajal, Villanueva de Sigena, Los Monegros, Huesca, Aragón, España" place locality 0.225 España FALSE
+cerro pachón es Europe Southern Europe FALSE 1 2021-02-03 13167339 node "Cerro Pachón, Montán, l'Alt Millars, Castelló / Castellón, Comunitat Valenciana, 12447, España" place locality 0.325 España FALSE
+cirva es Europe Southern Europe FALSE 1 2021-02-03 258417283 relation "La Cierva, Cuenca, Castilla-La Mancha, España" boundary administrative 0.504190064709064 España FALSE
+dit es Europe Southern Europe FALSE 1 2021-02-03 70175876 node "el Dit, Cocentaina, el Comtat, Alacant / Alicante, Comunitat Valenciana, 03837, España" natural peak 0.4 España FALSE
+edar es Europe Southern Europe FALSE 1 2021-02-03 136344246 way "EDAR, Lagareiros, Carnota, Muros, A Coruña, Galicia, 15293, España" landuse industrial 0.3 España FALSE
+el pais es Europe Southern Europe FALSE 1 2021-02-03 13235441 node "El PaÃs, Alfarp, la Ribera Alta, València / Valencia, Comunitat Valenciana, 46197, España" place locality 0.225 España FALSE
+el país es Europe Southern Europe FALSE 1 2021-02-03 13235441 node "El PaÃs, Alfarp, la Ribera Alta, València / Valencia, Comunitat Valenciana, 46197, España" place locality 0.325 España FALSE
+european space astronomy centre es Europe Southern Europe FALSE 1 2021-02-03 98365761 way "European Space Astronomy Centre, Camino Bajo del Castillo, Villanueva de la Cañada, Cuenca del Guadarrama, Comunidad de Madrid, 28691, España" office research 0.787306266325387 España FALSE
+gmv of tres cantos es Europe Southern Europe FALSE 1 2021-02-03 258419857 relation "GMV, 11, Calle de Isaac Newton, Parque Tecnológico de Madrid, Tres Cantos, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28760, España" building office 0.301 España FALSE
+gran telescopio canarias es Europe Southern Europe FALSE 1 2021-02-03 159943083 way "Gran Telescopio Canarias, Carretera Acceso Observatorios, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España" man_made telescope 0.713959851504786 España FALSE
+gtc es Europe Southern Europe FALSE 1 2021-02-03 159943083 way "Gran Telescopio Canarias, Carretera Acceso Observatorios, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España" man_made telescope 0.413959851504786 España FALSE
+iberia es Europe Southern Europe FALSE 1 2021-02-03 258848049 relation "Iberia, España" place peninsula 0.73620614637597 España FALSE
+institute for integrative biology es Europe Southern Europe FALSE 1 2021-02-03 184476776 way "I2SysBio (Institute for Integrative Systems Biology), Carretera de LlÃria, Lloma Llarga, Paterna, l'Horta Oest, València / Valencia, Comunitat Valenciana, 46100, España" building university 0.401 España FALSE
+la palma es Europe Southern Europe FALSE 1 2021-02-03 258611106 relation "Palma, Illes Balears, España" boundary administrative 0.688150363287611 España FALSE
+las hoyas es Europe Southern Europe FALSE 1 2021-02-03 296339662 node "Las Hoyas, Castro de Filabres, AlmerÃa, AndalucÃa, España" natural peak 0.5 España FALSE
+mar-a-lago es Europe Southern Europe FALSE 1 2021-02-03 99521484 way "El Mar, Real Sitio de San Ildefonso, NavafrÃa, Castilla y León, España" natural water 0.4 España FALSE
+maryland es Europe Southern Europe FALSE 1 2021-02-03 33897926 node "Maryl, Rúa Enrique Mariñas Romero, San Vicenzo de Elviña, Matogrande, Elviña, A Coruña, Galicia, 15071, España" shop hairdresser 0.201 España FALSE
+nasdaq es Europe Southern Europe FALSE 1 2021-02-03 39263438 node "Nasdaq, 8, Calle el Trust, Barrio Quebrantada, Torrelavega, Campuzano, Torrelavega, Besaya, Cantabria, 39300, España" amenity pub 0.101 España FALSE
+observatorio del roque de los muchachos es Europe Southern Europe FALSE 1 2021-02-03 101274983 way "Observatorio del Roque de los Muchachos, Carretera a Fuente Nueva, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España" man_made observatory 1.0016086140509 España FALSE
+polytechnic university of madrid es Europe Southern Europe FALSE 1 2021-02-03 90835017 way "E.T.S. Arquitectura de Madrid, Avenida Juan de Herrera, Moncloa-Aravaca, Madrid, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28001, España" amenity university 0.46926833579344 España FALSE
+rockefellers es Europe Southern Europe FALSE 1 2021-02-03 74533251 node "Rockefeller's, Carrer de Cala Major, Cala Major, Palma, Illes Balears, 07015, España" amenity bar 0.001 España FALSE
+roque de los muchachos es Europe Southern Europe FALSE 1 2021-02-03 144787 node "Roque de los Muchachos, GarafÃa, Santa Cruz de Tenerife, Canarias, España" natural volcano 0.755515463321448 España FALSE
+roque de los muchachos observatory es Europe Southern Europe FALSE 1 2021-02-03 101274983 way "Observatorio del Roque de los Muchachos, Carretera a Fuente Nueva, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España" man_made observatory 0.801608614050897 España FALSE
+sabre es Europe Southern Europe FALSE 1 2021-02-03 30412035 node "el Sabre, el Bruc, Anoia, Barcelona, Catalunya, 08294, España" natural peak 0.4 España FALSE
+saint louis university — madrid campus es Europe Southern Europe FALSE 1 2021-02-03 211810109 way "Saint Louis University - Madrid Campus, Calle Amapola, Vallehermoso, ChamberÃ, Madrid, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28003, España" amenity university 0.501 España FALSE
+tres cantos es Europe Southern Europe FALSE 1 2021-02-03 257968513 relation "Tres Cantos, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28760, España" boundary administrative 0.689287430697433 España FALSE
+universitat oberta de catalunya es Europe Southern Europe FALSE 1 2021-02-03 107594771 way "Universitat Oberta de Catalunya, 156, Rambla del Poblenou, Provençals del Poblenou, Sant MartÃ, Barcelona, Barcelonès, Barcelona, Catalunya, 08018, España" amenity university 0.829969070439296 España FALSE
+university of castilla-la mancha es Europe Southern Europe FALSE 1 2021-02-03 162719450 way "Caseta del Estudiante, Plaza de la Libertad de Expresión, Barrio de San Antón, Cuenca, Castilla-La Mancha, 16002, España" amenity university 0.301 España FALSE
+university of lleida es Europe Southern Europe FALSE 1 2021-02-03 5028721 node "Institut Nacional d'Educació FÃsica de Catalunya, Carrer de Duke Ellington, la Caparrella, Lleida, Segrià , Lleida, Catalunya, 25192, España" amenity university 0.101 España FALSE
+university of santiago de compostela es Europe Southern Europe FALSE 1 2021-02-03 21708159 node "Instituto da Lingua Galega, Praza da Universidade, As Fontiñas, Santiago de Compostela, Santiago, A Coruña, Galicia, ES-15705, España" amenity university 0.301 España FALSE
+valero es Europe Southern Europe FALSE 1 2021-02-03 258259086 relation "Valero, Salamanca, Castilla y León, España" boundary administrative 0.608874521325786 España FALSE
+vespa es Europe Southern Europe FALSE 1 2021-02-03 30945621 node "la Vespa, el Bruc, Anoia, Barcelona, Catalunya, 08294, España" natural peak 0.4 España FALSE
+virgili university es Europe Southern Europe FALSE 1 2021-02-03 119324675 way "Universitat Rovira i Virgili - Campus Catalunya, 33,35, Avinguda de Catalunya, Tarragona, Tarragonès, Tarragona, Catalunya, 43002, España" amenity university 0.500597470725799 España FALSE
+vitae es Europe Southern Europe FALSE 1 2021-02-03 257978618 relation "Vita, Ã<81>vila, Castilla y León, España" boundary administrative 0.510062690742063 España FALSE
+zas es Europe Southern Europe FALSE 1 2021-02-03 15543479 node "Zas, Terra de Soneira, A Coruña, Galicia, 15850, España" place village 0.566457373637731 España FALSE
+eritrea er Africa Eastern Africa FALSE 1 2021-02-03 258214833 relation ኤáˆá‰µáˆ« Eritrea إرتريا boundary administrative 0.761582471804884 ኤáˆá‰µáˆ« Eritrea إرتريا FALSE
+ain shams university eg Africa Northern Africa FALSE 1 2021-02-03 97753625 way "جامعة عين شمس, شارع لطÙ<81>ÙŠ السيد, الدمرداش, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11657, مصر" amenity university 0.001 مصر FALSE
+arab league eg Africa Northern Africa FALSE 1 2021-02-03 96831895 way "جامعة الدول العربية, شارع التØرير, الاسماعيليه, باب اللوق, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11111, مصر" building public 0.001 مصر FALSE
+aswan high dam eg Africa Northern Africa FALSE 1 2021-02-03 85332921 way "السد العالى, أسوان, مصر" waterway dam 0.489725473759381 مصر FALSE
+g77 eg Africa Northern Africa FALSE 1 2021-02-03 71106617 node "G77, كمبوند ليان صبور, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11865, مصر" place house 0.101 مصر FALSE
+imc eg Africa Northern Africa FALSE 1 2021-02-03 34517193 node "IMC مركز تØديث الصناعة Industrial Modernization Center, شارع 276, المعادي الجديدة, القاهرة, Ù…ØاÙ<81>ظة القاهرة, NONE, مصر" office government 0.101 مصر FALSE
+innovation center eg Africa Northern Africa FALSE 1 2021-02-03 300924038 node "Innovation Center, 5B, القرية الذكية, 12677, مصر" place house 0.201 مصر FALSE
+mdrb eg Africa Northern Africa FALSE 1 2021-02-03 245704793 way "مساكن مضرب الأرز, دمنهور, البØيرة, مصر" place neighbourhood 0.25 مصر FALSE
+nile delta eg Africa Northern Africa FALSE 1 2021-02-03 258313988 relation "النيل, ÙƒÙ<81>ر البدارنة, القليوبية, مصر" natural water 0.2 مصر FALSE
+nile university eg Africa Northern Africa FALSE 1 2021-02-03 103600394 way "Nile University, طريق القاهرة, الاسكندرية الصØراوي الجانبي, مدينة السادات وعدنان مدني, مدينة السادات, Ù…ØاÙ<81>ظة المنوÙ<81>ية, 12577, مصر" amenity university 0.201 مصر FALSE
+quess eg Africa Northern Africa FALSE 1 2021-02-03 6642686 node "سهل القس أبو سعيد, الوادي الجديد, مصر" place locality 0.125 مصر FALSE
+zewail city eg Africa Northern Africa FALSE 1 2021-02-03 127163265 way "ميدان اØمد زويل, ØÙŠ شمال, دسوق, مصر" highway primary 0.1 مصر FALSE
+aru co ee Europe Northern Europe FALSE 1 2021-02-03 258517952 relation "Aru küla, Saaremaa vald, Saare maakond, 94245, Eesti" boundary administrative 0.523032671836241 Eesti FALSE
+atla ee Europe Northern Europe FALSE 1 2021-02-03 258103109 relation "Atla küla, Saaremaa vald, Saare maakond, 93322, Eesti" boundary administrative 0.530084056292374 Eesti FALSE
+irta ee Europe Northern Europe FALSE 1 2021-02-03 258424418 relation "Irta küla, Lääneranna vald, Pärnu maakond, 88407, Eesti" boundary administrative 0.422734482343971 Eesti FALSE
+university of tartu ee Europe Northern Europe FALSE 1 2021-02-03 255255542 way "Tartu Ãœlikool, 18, Ãœlikooli, Kesklinn, Tartu linn, Tartu maakond, 50090, Eesti" amenity university 0.63960797450445 Eesti FALSE
+pinta ec Americas South America FALSE 1 2021-02-03 258646339 relation "Isla Pinta, Parroquia Santa Rosa, Cantón Santa Cruz, Galápagos, Ecuador" place island 0.483021208265432 Ecuador FALSE
+al-quds dz Africa Northern Africa FALSE 1 2021-02-03 57263858 node "ØÙŠ القدس, Metlili ⵎⴻⵜâµ<8d>ⵉâµ<8d>ⵉ متليلي, Daïra Metlili Châamba, Ghardaïa ⵜⴰⵖⴻⵔⴷⴰⵢⵜ غرداية, 47200, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" place suburb 0.375 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+esr dz Africa Northern Africa FALSE 1 2021-02-03 180843078 way "escadron de sécurité routière, Øـي الامــل, Biskra ⵜⵉⴱⴻⵙⴽⴻⵔⵜ بسكرة, Daïra Biskra, Biskra ⴱⴻⵙⴽⵔⴰ بسكرة, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" landuse military 0.2 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+hippo dz Africa Northern Africa FALSE 1 2021-02-03 258539007 relation "Annaba ⵄⴻâµ<8d>âµ<8d>ⴰⴲⴰ عنابة, Daïra Annaba, Annaba ⵄⴻâµ<8f>âµ<8f>ⴰⴱⴰ عنابة, 23000, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" boundary administrative 0.516124885138461 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+ivpp dz Africa Northern Africa FALSE 1 2021-02-03 161838236 way "IVPP, Route de Bouchaoui, Ouled Fayet ⵓâµ<8d>ⴻⴷ ⴼⴰⵢⴻⵜ أولاد Ù<81>ايت, Cheraga, Alger, 16094, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" man_made works 0.101 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+ministry of commerce dz Africa Northern Africa FALSE 1 2021-02-03 107081067 way "Ministère du Commerce, Rue Salem Abdelhamid, Cité Zerhouni Mokhtar (Les Bananiers), Lotissement les Mandariniers, Pins Maritimes الصنوبر البØري, Mohammadia ⵎⵓⵃⴻⵎⵎⴰⴷⵢⴰ المØمدية, Dar El Beïda, Alger, 16312, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر" office government 0.101 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر FALSE
+aditec do Americas Caribbean FALSE 1 2021-02-03 184873253 way "Aditec, Calle Ludovino Fernandez, Urbanización Fernández, Los Jardines, Santo Domingo de Guzmán, 10130, República Dominicana" office company 0.101 República Dominicana FALSE
+barrick gold do Americas Caribbean FALSE 1 2021-02-03 176507195 way "Barrick Gold, CotuÃ, Sánchez RamÃrez, República Dominicana" landuse industrial 0.4 República Dominicana FALSE
+ross university school of medicine dm Americas Caribbean FALSE 1 2021-02-03 258789693 relation "Ross University School of Medicine, Michael Douglas Boulevard, Picard, Saint John Parish, Dominica" building university 0.501 Dominica FALSE
+aarhus dk Europe Northern Europe FALSE 1 2021-02-03 131516 node "Aarhus, Aarhus Kommune, Region Midtjylland, 8000, Danmark" place city 0.695326566736205 Danmark FALSE
+aarhus university hospital dk Europe Northern Europe FALSE 1 2021-02-03 258651824 relation "Aarhus Universitet, Paludan-Müllers Vej, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8200, Danmark" amenity university 0.616309477187943 Danmark FALSE
+aau dk Europe Northern Europe FALSE 1 2021-02-03 103460471 way "Aalborg Universitet, Fredrik Bajers Vej, Sønder Tranders, Aalborg, Aalborg Kommune, Region Nordjylland, 9220, Danmark" amenity university 0.439098689594578 Danmark FALSE
+bioscience dk Europe Northern Europe FALSE 1 2021-02-03 147018786 way "Bioscience, Ny Munkegade, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8000, Danmark" building college 0.101 Danmark FALSE
+danisco dk Europe Northern Europe FALSE 1 2021-02-03 101179015 way "Danisco, Hammershøis Kaj, Christianshavn, København, Københavns Kommune, Region Hovedstaden, 1402, Danmark" office company 0.101 Danmark FALSE
+european environment agency dk Europe Northern Europe FALSE 1 2021-02-03 10371743 node "EEA, 6, Kongens Nytorv, Frederiksstaden, København, Københavns Kommune, Region Hovedstaden, 1050, Danmark" office government 0.48741287579359 Danmark FALSE
+guinness world records dk Europe Northern Europe FALSE 1 2021-02-03 45101701 node "Guinness World Records, Østergade, Frederiksstaden, København, Københavns Kommune, Region Hovedstaden, 1100, Danmark" tourism museum 0.301 Danmark FALSE
+kongens lyngby dk Europe Northern Europe FALSE 1 2021-02-03 112538 node "Kongens Lyngby, Lyngby-Taarbæk Kommune, Region Hovedstaden, 2800, Danmark" place suburb 0.647005149903199 Danmark FALSE
+odense dk Europe Northern Europe FALSE 1 2021-02-03 135778 node "Odense, Odense Kommune, Region Syddanmark, 5000, Danmark" place city 0.677626182871731 Danmark FALSE
+orion nebula dk Europe Northern Europe FALSE 1 2021-02-03 118205711 way "Orion, Holstebro, Holstebro Kommune, 7500, Danmark" highway residential 0.2 Danmark FALSE
+ted dk Europe Northern Europe FALSE 1 2021-02-03 101596912 way "Thisted Lufthavn, Hjardemålvej, Thisted Kommune, Region Nordjylland, Danmark" aeroway aerodrome 0.412795139465266 Danmark FALSE
+turing dk Europe Northern Europe FALSE 1 2021-02-03 108351430 way "Turing, Helsingforsgade, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8200, Danmark" building college 0.101 Danmark FALSE
+university of aarhus dk Europe Northern Europe FALSE 1 2021-02-03 116534449 way "Aarhus Universitet, N.J. Fjords Gade, Frederiksbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8000, Danmark" amenity university 0.101 Danmark FALSE
+wais dk Europe Northern Europe FALSE 1 2021-02-03 113043336 way "Wais, Stubbæk, Aabenraa Kommune, Region Syddanmark, 6200, Danmark" highway residential 0.2 Danmark FALSE
+aachen university de Europe Western Europe FALSE 1 2021-02-03 56863988 node "Burschenschaft Markomannia Aachen Greifswald, 12, Karl-Marx-Platz, Innenstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" amenity fraternity 0.101 Deutschland FALSE
+ahl de Europe Western Europe FALSE 1 2021-02-03 259336777 relation "Ahl, Bad Soden-Salmünster, Main-Kinzig-Kreis, Hessen, Deutschland" boundary administrative 0.4 Deutschland FALSE
+alcon de Europe Western Europe FALSE 1 2021-02-03 172470569 way "Alcon, Hochdorf, Freiburg im Breisgau, Baden-Württemberg, 79108, Deutschland" landuse industrial 0.3 Deutschland FALSE
+alphago de Europe Western Europe FALSE 1 2021-02-03 81074242 node "alphago, 18, Hauptstraße, Kenten, Bergheim, Rhein-Erft-Kreis, Nordrhein-Westfalen, 50126, Deutschland" shop security 0.111 Deutschland FALSE
+antiproton de Europe Western Europe FALSE 1 2021-02-03 258877064 relation "FAIR, Wixhausen, Darmstadt, Hessen, 64291, Deutschland" landuse construction 0.256321943137092 Deutschland FALSE
+applied space technology and microgravity de Europe Western Europe FALSE 1 2021-02-03 258848507 relation "Zentrum für angewandte Raumfahrttechnologie und Mikrogravitation, 2, Am Fallturm, Lehe, Horn-Lehe, Stadtbezirk Bremen-Ost, Bremen, 28359, Deutschland" office research 0.101 Deutschland FALSE
+awg de Europe Western Europe FALSE 1 2021-02-03 94962156 way "AWG, Zeile, Beiersdorf, Oppach-Beiersdorf, Görlitz, Sachsen, 02736, Deutschland" highway residential 0.2 Deutschland FALSE
+bayer schering pharma de Europe Western Europe FALSE 1 2021-02-03 258846355 relation "178, Bayer Pharma AG, Wedding, Mitte, Berlin, 13353, Deutschland" landuse industrial 0.464431309768303 Deutschland FALSE
+begemann de Europe Western Europe FALSE 1 2021-02-03 243706481 way "Begemann, Stoddartstraße, Pivitsheide V.H., Pivitsheide V. L. Kussel, Detmold, Kreis Lippe, Nordrhein-Westfalen, 32758, Deutschland" amenity shelter 0.101 Deutschland FALSE
+bmas de Europe Western Europe FALSE 1 2021-02-03 258375961 relation "Bundesministerium für Arbeit und Soziales, Mauerstraße, Mitte, Berlin, 10117, Deutschland" building public 0.001 Deutschland FALSE
+bristol-myers squibb de Europe Western Europe FALSE 1 2021-02-03 69556244 node "Bristol-Myers Squibb, 29, Arnulfstraße, Finanzamt München, Maxvorstadt, München, Bayern, 80636, Deutschland" office pharmacy 0.759130436192281 Deutschland FALSE
+center of applied space technology and microgravity de Europe Western Europe FALSE 1 2021-02-03 258848507 relation "Zentrum für angewandte Raumfahrttechnologie und Mikrogravitation, 2, Am Fallturm, Lehe, Horn-Lehe, Stadtbezirk Bremen-Ost, Bremen, 28359, Deutschland" office research 0.101 Deutschland FALSE
+cfi de Europe Western Europe FALSE 1 2021-02-03 40272800 node "Christliche Fachkräfte International e.V., 3B, Wächterstraße, Dobel, Stuttgart-Mitte, Stuttgart, Baden-Württemberg, Deutschland" office ngo 0.181472839091896 Deutschland FALSE
+christian-albrechts university de Europe Western Europe FALSE 1 2021-02-03 258412488 relation "Christian-Albrechts-Universität zu Kiel, Hasseldieksdammer Weg, Schreventeich, Kiel, Schleswig-Holstein, 24116, Deutschland" amenity university 0.739675942498043 Deutschland FALSE
+climate and energy de Europe Western Europe FALSE 1 2021-02-03 5585166 node "Wuppertal Institut für Klima, Umwelt, Energie, 19, Döppersberg, Südstadt, Gemarkung Elberfeld, Wuppertal, Nordrhein-Westfalen, 42103, Deutschland" office research 0.418669334531229 Deutschland FALSE
+danone de Europe Western Europe FALSE 1 2021-02-03 116486470 way "Danone, Kastenau, Rosenheim, Bayern, 83022, Deutschland" landuse industrial 0.3 Deutschland FALSE
+deutsche bank de Europe Western Europe FALSE 1 2021-02-03 101028871 way "Deutsche Bank, 29-41, Lindenallee, Stadtkern, Stadtbezirk I, Essen, Nordrhein-Westfalen, 45127, Deutschland" historic heritage 0.417338060184506 Deutschland FALSE
+dlr german aerospace center de Europe Western Europe FALSE 1 2021-02-03 258165325 relation "Deutsches Zentrum für Luft- und Raumfahrt, Grengel, Porz, Köln, Nordrhein-Westfalen, 51147, Deutschland" landuse industrial 0.419657429852984 Deutschland FALSE
+dpg de Europe Western Europe FALSE 1 2021-02-03 61019793 node "Deutsche Parlamentarische Gesellschaft, 2, Friedrich-Ebert-Platz, Mitte, Berlin, 10117, Deutschland" office association 0.271596680569804 Deutschland FALSE
+dresden university of technology de Europe Western Europe FALSE 1 2021-02-03 258652719 relation "Technische Universität Dresden, Kleinpestitz/Mockritz, Plauen, Dresden, Sachsen, Deutschland" amenity university 0.622496087225507 Deutschland FALSE
+drever de Europe Western Europe FALSE 1 2021-02-03 192099725 way "Drever Siepen, Peddensiepen, Lüdenscheid, Märkischer Kreis, Nordrhein-Westfalen, 58513, Deutschland" waterway stream 0.3 Deutschland FALSE
+dzne de Europe Western Europe FALSE 1 2021-02-03 259082916 relation "Deutsches Zentrum für Neurodegenerative Erkrankungen, 1, Venusberg-Campus, Venusberg, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53127, Deutschland" office research 0.001 Deutschland FALSE
+east germany de Europe Western Europe FALSE 1 2021-02-03 258412985 relation "E, Elstertrebnitz, Pegau, Landkreis Leipzig, Sachsen, Deutschland" landuse residential 0.386379445861941 Deutschland FALSE
+ems de Europe Western Europe FALSE 1 2021-02-03 258521052 relation "Ems, 48291, Deutschland" waterway river 0.550731319596144 Deutschland FALSE
+environment and energy de Europe Western Europe FALSE 1 2021-02-03 5585166 node "Wuppertal Institut für Klima, Umwelt, Energie, 19, Döppersberg, Südstadt, Gemarkung Elberfeld, Wuppertal, Nordrhein-Westfalen, 42103, Deutschland" office research 0.418669334531229 Deutschland FALSE
+eshg de Europe Western Europe FALSE 1 2021-02-03 114126662 way "Evangelisches Studienhaus Göttingen, 30, Obere Karspüle, Theaterstraße, Innenstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland" building residential 0.001 Deutschland FALSE
+european network de Europe Western Europe FALSE 1 2021-02-03 112610344 way "European Network Services, Gewerbestraße, Bergfelde, Hohen Neuendorf, Oberhavel, Brandenburg, 16540, Deutschland" building yes 0.201 Deutschland FALSE
+european research organisation de Europe Western Europe FALSE 1 2021-02-03 229063373 way "Europäische Südsternwarte, 2, Karl-Schwarzschild-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.001 Deutschland FALSE
+evolution institute de Europe Western Europe FALSE 1 2021-02-03 118088771 way "Institut für Evolution und Biodiversität, 1, Hüfferstraße, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland" building university 0.101 Deutschland FALSE
+fdp de Europe Western Europe FALSE 1 2021-02-03 79106534 node "FDP, Kirschgartenstraße, Hofheim am Taunus, Main-Taunus-Kreis, Hessen, 65719, Deutschland" office political_party 0.101 Deutschland FALSE
+federal office for radiation protection de Europe Western Europe FALSE 1 2021-02-03 100961001 way "Bundesamt für Strahlenschutz, 120-130, Köpenicker Allee, Karlshorst, Lichtenberg, Berlin, 10318, Deutschland" amenity research_institute 0.348159836291227 Deutschland FALSE
+flexible solutions de Europe Western Europe FALSE 1 2021-02-03 39749983 node "Randstad, Kuhstraße, Altstadt, Lüneburg, Niedersachsen, 21335, Deutschland" office employment_agency 0.001 Deutschland FALSE
+foreign office de Europe Western Europe FALSE 1 2021-02-03 100405265 way "Auswärtiges Amt, 1, Werderscher Markt, Mitte, Berlin, 10117, Deutschland" office government 0.533666708979672 Deutschland FALSE
+forest degradation de Europe Western Europe FALSE 1 2021-02-03 48683621 node "Entwürdigung, L 3170, Rasdorf, Landkreis Fulda, Hessen, 36169, Deutschland" tourism artwork 0.001 Deutschland FALSE
+forest stewardship council de Europe Western Europe FALSE 1 2021-02-03 78115705 node "Forest Stewardship Council (FSC), 134, Adenauerallee, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" office association 0.301 Deutschland FALSE
+fraunhofer institute de Europe Western Europe FALSE 1 2021-02-03 124413328 way "Fraunhofer-Institute, Heidenhofstraße, Mooswald-Ost, Mooswald, Freiburg im Breisgau, Baden-Württemberg, 79110, Deutschland" amenity parking 0.201 Deutschland FALSE
+friedrich miescher laboratory de Europe Western Europe FALSE 1 2021-02-03 104029631 way "Friedrich-Miescher-Laboratorium, 9, Max-Planck-Ring, Max-Planck-Institut, Schönblick / Winkelwiese, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland" building yes 0.487997652924817 Deutschland FALSE
+ge free de Europe Western Europe FALSE 1 2021-02-03 98138672 way "Freiwillige Feuerwehr Gelting, 45, Geltinger Straße, Gelting, Pliening, Landkreis Ebersberg, Bayern, 85652, Deutschland" amenity fire_station 0.101 Deutschland FALSE
+gebrüder meier de Europe Western Europe FALSE 1 2021-02-03 97290833 way "Gebrüder-Meier-Weg, Edmundsthal-Siemerswalde, Geesthacht, Herzogtum Lauenburg, Schleswig-Holstein, 21502, Deutschland" highway living_street 0.3 Deutschland FALSE
+geomar helmholtz center for ocean research kiel de Europe Western Europe FALSE 1 2021-02-03 92382691 way "GEOMAR Helmholtz Zentrum für Ozeanforschung Kiel, 20, Düsternbrooker Weg, Düsternbrook, Kiel, Schleswig-Holstein, 24105, Deutschland" amenity university 0.401 Deutschland FALSE
+geomar helmholtz centre for ocean research kiel de Europe Western Europe FALSE 1 2021-02-03 92382691 way "GEOMAR Helmholtz Zentrum für Ozeanforschung Kiel, 20, Düsternbrooker Weg, Düsternbrook, Kiel, Schleswig-Holstein, 24105, Deutschland" amenity university 0.401 Deutschland FALSE
+german institute for economic research de Europe Western Europe FALSE 1 2021-02-03 2653124 node "Deutsches Institut für Wirtschaftsforschung, 58, Mohrenstraße, Mitte, Berlin, 10117, Deutschland" office research 0.473725631690798 Deutschland FALSE
+german primate centre de Europe Western Europe FALSE 1 2021-02-03 101999477 way "Deutsches Primatenzentrum GmbH, 7, Hans-Adolf-Krebs-Weg, Weende, Weende / Deppoldshausen, Göttingen, Landkreis Göttingen, Niedersachsen, 37077, Deutschland" building yes 0.101 Deutschland FALSE
+giss de Europe Western Europe FALSE 1 2021-02-03 106040825 way "Giss, Wölfershausen, Heringen, Landkreis Hersfeld-Rotenburg, Hessen, 36266, Deutschland" waterway stream 0.3 Deutschland FALSE
+goethe university of frankfurt de Europe Western Europe FALSE 1 2021-02-03 60505320 node "Goethe Welcome Centre, Theodor-W.-Adorno-Platz, Westend Nord, Innenstadt 2, Frankfurt am Main, Hessen, 60323, Deutschland" amenity university 0.201 Deutschland FALSE
+göttingen state de Europe Western Europe FALSE 1 2021-02-03 258366673 relation "Göttingen, Landkreis Göttingen, Niedersachsen, Deutschland" boundary administrative 0.719432791454798 Deutschland FALSE
+göttingen university de Europe Western Europe FALSE 1 2021-02-03 101743013 way "Mathematische Fakultät, 3-5, Bunsenstraße, Südstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland" building university 0.101 Deutschland FALSE
+guest de Europe Western Europe FALSE 1 2021-02-03 863347 node "Guest, Diedrichshagen, Weitenhagen, Landhagen, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17491, Deutschland" place hamlet 0.35 Deutschland FALSE
+hamburg de Europe Western Europe FALSE 1 2021-02-03 116376 node "Hamburg, 20095, Deutschland" place city 0.825525646308822 Deutschland FALSE
+heidelberg university in germany de Europe Western Europe FALSE 1 2021-02-03 6159717 node "SRH Hochschule, 6, Ludwig-Guttmann-Straße, Wieblingen, Heidelberg, Baden-Württemberg, 69123, Deutschland" amenity university 0.514317004425986 Deutschland FALSE
+heinrich böll foundation de Europe Western Europe FALSE 1 2021-02-03 97689731 way "Heinrich-Böll-Stiftung, 8, Schumannstraße, Mitte, Berlin, 10117, Deutschland" building civic 0.201 Deutschland FALSE
+heinrich heine university de Europe Western Europe FALSE 1 2021-02-03 95164755 way "Heinrich-Heine-Straße, Stadtrandsiedlung, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" highway residential 0.3 Deutschland FALSE
+heinrich-böll foundation de Europe Western Europe FALSE 1 2021-02-03 97689731 way "Heinrich-Böll-Stiftung, 8, Schumannstraße, Mitte, Berlin, 10117, Deutschland" building civic 0.201 Deutschland FALSE
+helmholtz center munich de Europe Western Europe FALSE 1 2021-02-03 106041248 way "Helmholtzstraße, Bezirksteil Marsfeld, Maxvorstadt, München, Bayern, 80636, Deutschland" highway residential 0.2 Deutschland FALSE
+hertie school of governance de Europe Western Europe FALSE 1 2021-02-03 7730086 node "Hertie School of Governance, 180, Friedrichstraße, Mitte, Berlin, 10117, Deutschland" amenity college 0.76173885138595 Deutschland FALSE
+hong kong university de Europe Western Europe FALSE 1 2021-02-03 1222442 node "Hong-Kong, Feldstraße, Südliche Mühlenvorstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" amenity fast_food 0.201 Deutschland FALSE
+human brain project de Europe Western Europe FALSE 1 2021-02-03 152018298 way "The Human Brain Project, 227b, Im Neuenheimer Feld, Neuenheimer Feld, Neuenheim, Heidelberg, Baden-Württemberg, 69120, Deutschland" building yes 0.301 Deutschland FALSE
+icecube de Europe Western Europe FALSE 1 2021-02-03 111332551 way "IceCube, Wasserstraße, Wiemelhausen, Bochum, Nordrhein-Westfalen, 44789, Deutschland" man_made water_works 0.101 Deutschland FALSE
+icp de Europe Western Europe FALSE 1 2021-02-03 67708109 node "ICP, 11, Auf der Breit, Gewerbegebiet Breit, Durlach, Karlsruhe, Baden-Württemberg, 76227, Deutschland" office company 0.101 Deutschland FALSE
+ifom de Europe Western Europe FALSE 1 2021-02-03 106305867 way "Institut für Forschung in der Operativen Medizin, Ostmerheimer Straße, Merheim, Kalk, Köln, Nordrhein-Westfalen, 51109, Deutschland" amenity university 0.001 Deutschland FALSE
+ims de Europe Western Europe FALSE 1 2021-02-03 258521052 relation "Ems, 48291, Deutschland" waterway river 0.450731319596144 Deutschland FALSE
+institute for futures studies de Europe Western Europe FALSE 1 2021-02-03 98779886 way "Institut für Zukunftsstudien und Technologiebewertung (IZT), 26, Schopenhauerstraße, Schlachtensee, Steglitz-Zehlendorf, Berlin, 14129, Deutschland" office research 0.001 Deutschland FALSE
+international mathematical union de Europe Western Europe FALSE 1 2021-02-03 66091109 node "International Mathematical Union, 11A, Hausvogteiplatz, Mitte, Berlin, 10117, Deutschland" office association 0.667391061753173 Deutschland FALSE
+ion research de Europe Western Europe FALSE 1 2021-02-03 258877064 relation "FAIR, Wixhausen, Darmstadt, Hessen, 64291, Deutschland" landuse construction 0.256321943137092 Deutschland FALSE
+jma de Europe Western Europe FALSE 1 2021-02-03 236857200 way "JMA, Jocksdorf, Neiße-Malxetal, Döbern-Land, Spree-Neiße, Brandenburg, 03159, Deutschland" landuse farmyard 0.3 Deutschland FALSE
+karlsruhe university de Europe Western Europe FALSE 1 2021-02-03 127366738 way "Karlshochschule International University, 36-38, Karlstraße, Innenstadt-West Westlicher Teil, Innenstadt-West, Karlsruhe, Baden-Württemberg, 76133, Deutschland" amenity university 0.508817475555606 Deutschland FALSE
+kiel university de Europe Western Europe FALSE 1 2021-02-03 95613087 way "Fachhochschule Kiel, Grenzstraße, Neumühlen-Dietrichsdorf, Kiel, Schleswig-Holstein, 24149, Deutschland" amenity university 0.414691670621569 Deutschland FALSE
+kiost de Europe Western Europe FALSE 1 2021-02-03 17130552 node "Kiost, 59, Ostendstraße, Stuttgart-Ost, Ostheim, Stuttgart-Ost, Stuttgart, Baden-Württemberg, 70188, Deutschland" shop kiosk 0.101 Deutschland FALSE
+lbc de Europe Western Europe FALSE 1 2021-02-03 84509711 way "Flughafen Lübeck-Blankensee, Blankenseer Straße, Blankensee, Sankt Jürgen, Lübeck, Schleswig-Holstein, 23562, Deutschland" aeroway aerodrome 0.412065652038613 Deutschland FALSE
+leda de Europe Western Europe FALSE 1 2021-02-03 257850836 relation "Leda, Landkreis Leer, Niedersachsen, 26789, Deutschland" waterway river 0.401403950541444 Deutschland FALSE
+leibniz institute de Europe Western Europe FALSE 1 2021-02-03 103261509 way "Leibniz-Institut für Astrophysik Potsdam, Rosa-Luxemburg-Straße, Neubabelsberg, Babelsberg Nord, Babelsberg, Potsdam, Brandenburg, 14482, Deutschland" amenity research_institute 0.383208261767925 Deutschland FALSE
+leibniz university de Europe Western Europe FALSE 1 2021-02-03 108957038 way "Leibniz-Institut für Plasmaforschung und Technologie (INP), 2, Felix-Hausdorff-Straße, Nördliche Mühlenvorstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" building yes 0.295871082899258 Deutschland FALSE
+leibniz university of hanover de Europe Western Europe FALSE 1 2021-02-03 97020033 way "Leibniz Universität Hannover, ""Parkhaus"", Appelstraße, Nordstadt, Nord, Hannover, Region Hannover, Niedersachsen, 30167, Deutschland" amenity university 0.594591508955585 Deutschland FALSE
+ludwig-maximilians university de Europe Western Europe FALSE 1 2021-02-03 63038249 node "Ludwig-Maximilians-Universität, 1, Geschwister-Scholl-Platz, Bezirksteil Universität, Maxvorstadt, München, Bayern, 80539, Deutschland" amenity university 0.201 Deutschland FALSE
+machine intelligence de Europe Western Europe FALSE 1 2021-02-03 99945955 way "Munich School of Robotics and Machine Intelligence (MSRM), Technische Universität München, 134, Heßstraße, Bezirksteil Schwere-Reiter-Straße, Schwabing-West, München, Bayern, 80797, Deutschland" building yes 0.201 Deutschland FALSE
+masai mara national reserve de Europe Western Europe FALSE 1 2021-02-03 74900850 node "Masai Mara, Hodenhagen, Samtgemeinde Ahlden, Heidekreis, Niedersachsen, 29693, Deutschland" place locality 0.325 Deutschland FALSE
+max planck institute for informatics de Europe Western Europe FALSE 1 2021-02-03 102150427 way "Max-Planck-Institut für Informatik, E1 4, Campus, Universität, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66123, Deutschland" building university 0.638041195081873 Deutschland FALSE
+max planck institute for mathematics de Europe Western Europe FALSE 1 2021-02-03 4330352 node "Max-Planck-Institut für Mathematik, 7, Vivatsgasse, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53111, Deutschland" amenity university 0.582526166251558 Deutschland FALSE
+max planck institute for molecular biomedicine de Europe Western Europe FALSE 1 2021-02-03 154889269 way "Max-Planck-Institut für molekulare Biomedizin (Eastwing), 54, Von-Esmarch-Straße, Sentruper Höhe, Münster-West, Münster, Nordrhein-Westfalen, 48149, Deutschland" building hospital 0.201 Deutschland FALSE
+max planck institute for nuclear physics de Europe Western Europe FALSE 1 2021-02-03 100288338 way "Max-Planck-Institut für Kernphysik, 1, Saupfercheckweg, Speyererhof, Altstadt, Heidelberg, Baden-Württemberg, 69117, Deutschland" amenity research_institute 0.566268984478359 Deutschland FALSE
+max planck institute for quantum optics de Europe Western Europe FALSE 1 2021-02-03 150324329 way "Max-Planck-Institut für Quantenoptik, 1, Hans-Kopfermann-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.633532730730458 Deutschland FALSE
+max planck institute for the physics of complex systems de Europe Western Europe FALSE 1 2021-02-03 93934599 way "Max-Planck-Institut für Physik komplexer Systeme, 38, Nöthnitzer Straße, Plauen, Dresden, Sachsen, 01187, Deutschland" amenity research_institute 0.201 Deutschland FALSE
+max planck institute for the study of religious and ethnic diversity de Europe Western Europe FALSE 1 2021-02-03 259291204 relation "Max-Planck-Institut zur Erforschung multireligiöser und multiethnischer Gesellschaften, Hermann-Föge-Weg, Oststadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland" amenity university 0.59324803174626 Deutschland FALSE
+max planck institute of neurobiology de Europe Western Europe FALSE 1 2021-02-03 6221673 node "Max-Planck-Institut für Neurobiologie, 18, Am Klopferspitz, Martinsried, Planegg, Landkreis München, Bayern, 82152, Deutschland" amenity university 0.517252435362624 Deutschland FALSE
+max planck institute of plasma physics de Europe Western Europe FALSE 1 2021-02-03 62003775 node "Max-Planck-Institut für Plasmaphysik, 1, Wendelsteinstraße, Koitenhagen, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17491, Deutschland" office research 0.646843791996006 Deutschland FALSE
+max planck unit de Europe Western Europe FALSE 1 2021-02-03 1288676 node "Max Planck, Platanenallee, Stadtfriedhof, Weststadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37081, Deutschland" historic memorial 0.62815879877835 Deutschland FALSE
+max-planck institute for mathematics de Europe Western Europe FALSE 1 2021-02-03 4330352 node "Max-Planck-Institut für Mathematik, 7, Vivatsgasse, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53111, Deutschland" amenity university 0.582526166251558 Deutschland FALSE
+medigene de Europe Western Europe FALSE 1 2021-02-03 80346809 node "Medigene AG, 11, Lochhamer Straße, Martinsried, Planegg, Landkreis München, Bayern, 82152, Deutschland" office company 0.101 Deutschland FALSE
+milan kováč de Europe Western Europe FALSE 1 2021-02-03 3165617 node "Hazienda, 3, Moosdorfstraße, Oberalting, Seefeld, Wörthsee, Landkreis Starnberg, Bayern, 82229, Deutschland" amenity restaurant 0.001 Deutschland FALSE
+milinski de Europe Western Europe FALSE 1 2021-02-03 67441170 node "Milinski, 5, Am Germanenring, Bruchköbel, Main-Kinzig-Kreis, Hessen, 63486, Deutschland" shop car 0.101 Deutschland FALSE
+molecular genetics center de Europe Western Europe FALSE 1 2021-02-03 95773291 way "Max-Planck-Institut für molekulare Zellbiologie und Genetik, 108, Pfotenhauerstraße, Johannstadt-Nord, Johannstadt, Altstadt, Dresden, Sachsen, 01307, Deutschland" office research 0.324670737896991 Deutschland FALSE
+molecular sciences institute de Europe Western Europe FALSE 1 2021-02-03 258455101 relation "Buchmann Institute for Molecular Life Sciences (BMLS), 15, Max-von-Laue-Straße, Niederursel, Nord-West, Frankfurt am Main, Hessen, 60438, Deutschland" building university 0.301 Deutschland FALSE
+mpq de Europe Western Europe FALSE 1 2021-02-03 150324329 way "Max-Planck-Institut für Quantenoptik, 1, Hans-Kopfermann-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland" amenity research_institute 0.333532730730458 Deutschland FALSE
+msm de Europe Western Europe FALSE 1 2021-02-03 114779520 way "Marineschule Mürwik, Sonwik, Flensburg, Schleswig-Holstein, 24944, Deutschland" landuse military 0.403405604298285 Deutschland FALSE
+national biodiversity institute de Europe Western Europe FALSE 1 2021-02-03 118088771 way "Institut für Evolution und Biodiversität, 1, Hüfferstraße, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland" building university 0.001 Deutschland FALSE
+national centre for biotechnology de Europe Western Europe FALSE 1 2021-02-03 96724133 way "Centrum für Biotechnologie (CeBiTec), 27, Universitätsstraße, Schildesche, Bielefeld, Nordrhein-Westfalen, 33615, Deutschland" amenity university 0.001 Deutschland FALSE
+nature network de Europe Western Europe FALSE 1 2021-02-03 47672659 node "EarthLink e.V. – The People & Nature Network, 14, Frohschammerstraße, Bezirksteil Am Riesenfeld, Milbertshofen-Am Hart, München, Bayern, 80807, Deutschland" club yes 0.201 Deutschland FALSE
+neg de Europe Western Europe FALSE 1 2021-02-03 64853201 node "NEG, 118, Hansastraße, Günnigfeld, Bochum-Wattenscheid, Nordrhein-Westfalen, 44866, Deutschland" shop electronics 0.101 Deutschland FALSE
+nims de Europe Western Europe FALSE 1 2021-02-03 258826114 relation "Nims, Eifelkreis Bitburg-Prüm, Rheinland-Pfalz, 54597, Deutschland" waterway river 0.372343749103071 Deutschland FALSE
+nru de Europe Western Europe FALSE 1 2021-02-03 119195573 way "NRU, 18, Werner-von-Siemens-Straße, Industriepark Saarwellingen, Saarwellingen, Landkreis Saarlouis, Saarland, 66793, Deutschland" building yes 0.101 Deutschland FALSE
+palermo university de Europe Western Europe FALSE 1 2021-02-03 16882978 node "Restaurant Palermo, 11 - 13, Ernst-Thälmann-Ring, Schönwalde II, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17491, Deutschland" amenity restaurant 0.101 Deutschland FALSE
+physics preparatory group de Europe Western Europe FALSE 1 2021-02-03 102405708 way "Fachbereich 11, Physikalisches Institut, 10;10a, Wilhelm-Klemm-Straße, Sentruper Höhe, Münster-West, Münster, Nordrhein-Westfalen, 48149, Deutschland" building university 0.001 Deutschland FALSE
+planck institute de Europe Western Europe FALSE 1 2021-02-03 6750725 node "Max-Planck-Institut für Festkörperforschung, 1, Heisenbergstraße, Max-Planck-Institute, Büsnau, Vaihingen, Stuttgart, Baden-Württemberg, 70569, Deutschland" office research 0.201 Deutschland FALSE
+pricewaterhousecoopers de Europe Western Europe FALSE 1 2021-02-03 135320867 way "PricewaterhouseCoopers, 5, Fuhrberger Straße, Kleefeld, Buchholz-Kleefeld, Hannover, Region Hannover, Niedersachsen, 30625, Deutschland" building yes 0.450501936383412 Deutschland FALSE
+pris de Europe Western Europe FALSE 1 2021-02-03 259252002 relation "Pries, Kiel, Schleswig-Holstein, 24159, Deutschland" boundary administrative 0.306301518086152 Deutschland FALSE
+rankl de Europe Western Europe FALSE 1 2021-02-03 300250708 node "Rankl, 8, Südliche Münchner Straße, Grünwald, Landkreis München, Bayern, 82031, Deutschland" shop window_blind 0.101 Deutschland FALSE
+rbm de Europe Western Europe FALSE 1 2021-02-03 106627798 way "Flugplatz Straubing-Wallmühle, SRs 20, Öberau, Straubing, Bayern, 94315, Deutschland" aeroway aerodrome 0.33674906391142 Deutschland FALSE
+rwe de Europe Western Europe FALSE 1 2021-02-03 94139651 way "92, RWE, Benzelrath, Frechen, Rhein-Erft-Kreis, Nordrhein-Westfalen, 50226, Deutschland" landuse industrial 0.3 Deutschland FALSE
+saarland university de Europe Western Europe FALSE 1 2021-02-03 96695261 way "Universität des Saarlandes, Echohüttenweg, Universität, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66123, Deutschland" amenity university 0.587909367964507 Deutschland FALSE
+saarland university medical center de Europe Western Europe FALSE 1 2021-02-03 96695261 way "Universität des Saarlandes, Echohüttenweg, Universität, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66123, Deutschland" amenity university 0.587909367964507 Deutschland FALSE
+schering de Europe Western Europe FALSE 1 2021-02-03 2932912 node "Schering, Rimsting, Landkreis Rosenheim, Bayern, 83253, Deutschland" place isolated_dwelling 0.3 Deutschland FALSE
+stic de Europe Western Europe FALSE 1 2021-02-03 104228249 way "STIC, Strausberg, Märkisch-Oderland, Brandenburg, 15344, Deutschland" landuse commercial 0.3 Deutschland FALSE
+telegraph de Europe Western Europe FALSE 1 2021-02-03 1217959 node "Telegraph, Döschnitz, Schwarzatal, Landkreis Saalfeld-Rudolstadt, Thüringen, 07429, Deutschland" natural peak 0.4 Deutschland FALSE
+thales alenia de Europe Western Europe FALSE 1 2021-02-03 121548045 way "Thales Alenia Space, Ditzingen, Landkreis Ludwigsburg, Baden-Württemberg, 71254, Deutschland" landuse commercial 0.647092386151836 Deutschland FALSE
+treves de Europe Western Europe FALSE 1 2021-02-03 258446038 relation "Trier, Rheinland-Pfalz, Deutschland" boundary administrative 0.610664693690996 Deutschland FALSE
+united nations university de Europe Western Europe FALSE 1 2021-02-03 211684840 way "Universität der Vereinten Nationen, Hermann-Ehlers-Straße, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.465720786441952 Deutschland FALSE
+university library de Europe Western Europe FALSE 1 2021-02-03 96667358 way "Universitätsbibliothek der Freien Universität Berlin, 39, Garystraße, Dahlem, Steglitz-Zehlendorf, Berlin, 14195, Deutschland" amenity library 0.280014158487789 Deutschland FALSE
+university of augsburg de Europe Western Europe FALSE 1 2021-02-03 130471545 way "Universität, Universitätsstraße, Universitätsviertel, Augsburg, Bayern, 86159, Deutschland" railway platform 0.101 Deutschland FALSE
+university of bonn in germany de Europe Western Europe FALSE 1 2021-02-03 20122302 node "Rheinische Friedrich-Wilhelms-Universität Bonn, Arkadenhof, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.890223294922313 Deutschland FALSE
+university of bonn medical centre de Europe Western Europe FALSE 1 2021-02-03 20122302 node "Rheinische Friedrich-Wilhelms-Universität Bonn, Arkadenhof, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland" amenity university 0.790223294922313 Deutschland FALSE
+university of duisburg-essen de Europe Western Europe FALSE 1 2021-02-03 127148044 way "Universität Duisburg-Essen, L+M-Bereich, Gneisenaustraße, Einschornsteinsiedlung, Neudorf-Nord, Duisburg-Mitte, Duisburg, Nordrhein-Westfalen, 47057, Deutschland" amenity university 0.201 Deutschland FALSE
+university of dusseldorf de Europe Western Europe FALSE 1 2021-02-03 23771253 node "Wohnanlage Gurlittstraße - Studierendenwerk Düsseldorf, 14 - 18, Gurlittstraße, Bilk, Stadtbezirk 3, Düsseldorf, Nordrhein-Westfalen, 40223, Deutschland" amenity university 0.001 Deutschland FALSE
+university of frankfurt de Europe Western Europe FALSE 1 2021-02-03 84474458 way "Frankfurt University of Applied Sciences, Nibelungenallee, Nordend West, Innenstadt 3, Frankfurt am Main, Hessen, 60318, Deutschland" amenity university 0.612019878936673 Deutschland FALSE
+university of hohenheim de Europe Western Europe FALSE 1 2021-02-03 123666613 way "Universität Hohenheim, Mühlweg, Hohenheim, Plieningen, Stuttgart, Aichtal, Baden-Württemberg, 70599, Deutschland" amenity university 0.54210101824834 Deutschland FALSE
+university of munich de Europe Western Europe FALSE 1 2021-02-03 100982165 way "TU München Institut für Pharmakologie, Dietlindenstraße, Bezirksteil Münchener Freiheit, Schwabing-Freimann, München, Bayern, 80802, Deutschland" amenity university 0.001 Deutschland FALSE
+university of oldenburg de Europe Western Europe FALSE 1 2021-02-03 94259203 way "Carl von Ossietzky Universität Oldenburg, 99, Uhlhornsweg, Haarenfeld, Haarentor, Oldenburg, Niedersachsen, 26129, Deutschland" amenity university 0.537234715266229 Deutschland FALSE
+university of passau de Europe Western Europe FALSE 1 2021-02-03 125831895 way "Universität Passau, Rektor-Karl-Heinz-Pollok-Straße, Hacklberg, Passau, Bayern, 94032, Deutschland" amenity university 0.53059885426854 Deutschland FALSE
+university of rostock de Europe Western Europe FALSE 1 2021-02-03 2247559 node "Agrar- und Umweltwissenschaftliche Fakultät, Justus-von-Liebig-Weg, Südstadt, Ortsbeirat 12 : Südstadt, Rostock, Mecklenburg-Vorpommern, 18059, Deutschland" amenity university 0.101 Deutschland FALSE
+university of trier de Europe Western Europe FALSE 1 2021-02-03 204737708 way "Hochschule Trier, Schneidershof, Pallien, West-Pallien, Trier, Rheinland-Pfalz, 54293, Deutschland" amenity university 0.517252435362624 Deutschland FALSE
+university of veterinary medicine hanover de Europe Western Europe FALSE 1 2021-02-03 97041389 way "Tierärztliche Hochschule Hannover, 15, Schwesternhausstraße, Bult, Südstadt-Bult, Hannover, Region Hannover, Niedersachsen, 30173, Deutschland" amenity university 0.340053860433783 Deutschland FALSE
+ute university de Europe Western Europe FALSE 1 2021-02-03 52416287 node "Physiotherapie Ute Westebbe, 28, Marienstraße, Nördliche Mühlenvorstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland" amenity doctors 0.101 Deutschland FALSE
+warf de Europe Western Europe FALSE 1 2021-02-03 81212375 node "Warf, Neuharlingersiel, Samtgemeinde Esens, Landkreis Wittmund, Niedersachsen, 26427, Deutschland" place farm 0.3 Deutschland FALSE
+westfälische wilhelms university de Europe Western Europe FALSE 1 2021-02-03 258955070 relation "Westfälische Wilhelms-Universität, 2, Schlossplatz, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland" amenity university 0.75844573834098 Deutschland FALSE
+brontosaurus cz Europe Eastern Europe FALSE 1 2021-02-03 44738526 node "Brontosaurus, JetÅ™ichovice, okres DÄ›Ä<8d>Ãn, Ústecký kraj, Severozápad, 40716, ÄŒesko" natural peak 0.4 ÄŒesko FALSE
+cas institute of microbiology cz Europe Eastern Europe FALSE 1 2021-02-03 208449178 way "Mikrobiologický ústav AV ČR, v.v.i. (laboratoř gnotobiologie), Doly, Nový Hrádek, okres Náchod, Královéhradecký kraj, Severovýchod, 54922, Česko" amenity research_institute 0.001 Česko FALSE
+cibus cz Europe Eastern Europe FALSE 1 2021-02-03 1243731 node "ÄŒÃbuz, Skalice, okres Hradec Králové, Královéhradecký kraj, Severovýchod, 50303, ÄŒesko" place village 0.275 ÄŒesko FALSE
+ctvt cz Europe Eastern Europe FALSE 1 2021-02-03 108596514 way "Lesnà ČtvÅ¥, Vápenná, okres JesenÃk, Olomoucký kraj, StÅ™ednà Morava, ÄŒesko" landuse residential 0.2 ÄŒesko FALSE
+czech academy of sciences cz Europe Eastern Europe FALSE 1 2021-02-03 97095811 way "Akademie vÄ›d ÄŒeské republiky, DivadelnÃ, Staré MÄ›sto, Hlavnà mÄ›sto Praha, Praha, 11665, ÄŒesko" building yes 0.455436556781574 ÄŒesko FALSE
+der spiegel cz Europe Eastern Europe FALSE 1 2021-02-03 44819975 node "Zrcadlo, Tisá, okres Ústà nad Labem, Ústecký kraj, Severozápad, 40336, Česko" natural peak 0.3 Česko FALSE
+icos cz Europe Eastern Europe FALSE 1 2021-02-03 75655700 node "ICOS, 251, 5. kvÄ›tna, PleÅ¡ivec, ÄŒeský Krumlov, okres ÄŒeský Krumlov, JihoÄ<8d>eský kraj, Jihozápad, 381 01, ÄŒesko" amenity social_facility 0.101 ÄŒesko FALSE
+institute of anatomy cz Europe Eastern Europe FALSE 1 2021-02-03 258199235 relation "Institute of Anatomy, U Nemocnice, Nové Město, Hlavnà město Praha, Praha, 11121, Česko" building civic 0.301 Česko FALSE
+more aqua cz Europe Eastern Europe FALSE 1 2021-02-03 102824192 way "Moře, Rašovy, Turkovice, okres Pardubice, Pardubický kraj, Severovýchod, Česko" natural water 0.2 Česko FALSE
+rcp cz Europe Eastern Europe FALSE 1 2021-02-03 238495840 way "RCP, Florenc, KarlÃn, Hlavnà mÄ›sto Praha, Praha, ÄŒesko" landuse construction 0.3 ÄŒesko FALSE
+sec cz Europe Eastern Europe FALSE 1 2021-02-03 16251886 node "SeÄ<8d>, nám. Prof. ÄŒ. Strouhala, SeÄ<8d>, okres Chrudim, Pardubický kraj, Severovýchod, 53807, ÄŒesko" tourism camp_site;caravan_site;attraction 0.463856464536119 ÄŒesko FALSE
+spiegel cz Europe Eastern Europe FALSE 1 2021-02-03 44819975 node "Zrcadlo, Tisá, okres Ústà nad Labem, Ústecký kraj, Severozápad, 40336, Česko" natural peak 0.3 Česko FALSE
+sprint cz Europe Eastern Europe FALSE 1 2021-02-03 119878029 way "Sprint, Jimramov, SedliÅ¡tÄ›, Jimramov, okres ŽÄ<8f>ár nad Sázavou, Kraj VysoÄ<8d>ina, Jihovýchod, ÄŒesko" landuse industrial 0.3 ÄŒesko FALSE
+troja cz Europe Eastern Europe FALSE 1 2021-02-03 258008039 relation "Troja, Hlavnà město Praha, Praha, 17100, Česko" boundary administrative 0.521401226677294 Česko FALSE
+unicode cz Europe Eastern Europe FALSE 1 2021-02-03 101090349 way "UNICODE Systems, StÅ™Ãtež u TÅ™ebÃÄ<8d>e, StÅ™Ãtež, okres TÅ™ebÃÄ<8d>, Kraj VysoÄ<8d>ina, Jihovýchod, ÄŒesko" landuse industrial 0.3 ÄŒesko FALSE
+wikimedia cz Europe Eastern Europe FALSE 1 2021-02-03 53573639 node "Wikimedia ČR, 1705/21, Slovenská, Vinohrady, Hlavnà město Praha, Praha, 12000, Česko" office ngo 0.101 Česko FALSE
+wine institute cz Europe Eastern Europe FALSE 1 2021-02-03 296282907 node "Wine Institute, 797, Kodaňská, Vršovice, Hlavnà město Praha, Praha, 10100, Česko" shop wine 0.201 Česko FALSE
+cyprus institute cy Asia Western Asia FALSE 1 2021-02-03 236429001 way "The Cyprus Institute, F119, Governor's Beach, Λεμεσός, ΚÏ<8d>Ï€Ï<81>ος, 4524, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs" building yes 0.201 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+international business times cy Asia Western Asia FALSE 1 2021-02-03 172052208 way "Διεθνής ΑεÏ<81>ολιμÎνας Πάφου, E603, Κοινότητα Τίμης, Πάφος, ΚÏ<8d>Ï€Ï<81>ος, 8507, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs" aeroway aerodrome 0.402062797383891 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+olivo labs cy Asia Western Asia FALSE 1 2021-02-03 145941969 way "Labs, Thessalias Street, Lykavitos, Λευκωσία, Δήμος Λευκωσίας, Λευκωσία - LefkoÅŸa, Λευκωσία, ΚÏ<8d>Ï€Ï<81>ος, 1048, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs" amenity university 0.101 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs FALSE
+cu cu Americas Caribbean FALSE 1 2021-02-03 258428385 relation Cuba boundary administrative 0.844839051690795 Cuba FALSE
+precioso cu Americas Caribbean FALSE 1 2021-02-03 74151205 node "Precioso, Varadero, Cárdenas, Matanzas, 42211, Cuba" place hamlet 0.35 Cuba FALSE
+antonio nariño university co Americas South America FALSE 1 2021-02-03 11561601 node "Antonio Nariño, VÃa A Chinchina, Estambul, Comuna La Macarena, Manizales, Centrosur, Caldas, Región Andina, 176002, Colombia" amenity university 0.201 Colombia FALSE
+calipso co Americas South America FALSE 1 2021-02-03 259165216 relation "Calipso, Comuna 13, PerÃmetro Urbano Santiago de Cali, Cali, Sur, Valle del Cauca, PacÃfica, Colombia" boundary administrative 0.4 Colombia FALSE
+dc co Americas South America FALSE 1 2021-02-03 258397765 relation "Bogotá Distrito Capital, Región Andina, 11001, Colombia" boundary administrative 0.683174342915783 Colombia FALSE
+natural products branch co Americas South America FALSE 1 2021-02-03 77766964 node "Madre Sierra productos naturales, Carrera 5, Palomino, Dibulla, La Guajira, Caribe, 446009, Colombia" amenity pharmacy 0.101 Colombia FALSE
+nebula genomics co Americas South America FALSE 1 2021-02-03 12402461 node "GENOMICS, Carrera 42, Tequendama, Comuna 19, PerÃmetro Urbano Santiago de Cali, Cali, Sur, Valle del Cauca, PacÃfica, 76000, Colombia" amenity hospital 0.101 Colombia FALSE
+pva co Americas South America FALSE 1 2021-02-03 101597975 way "Aeropuerto El Embrujo, VÃa Circunvalar de Providencia, Bailey, Rocky Point, Archipiélago de San Andrés, Providencia y Santa Catalina, Colombia" aeroway aerodrome 0.345950553181826 Colombia FALSE
+university of quindío co Americas South America FALSE 1 2021-02-03 191022266 way "Universidad la Gran Colombia - Ciudadela del Saber La Santa MarÃa, Armenia - Aeropuerto, Armenia, Capital, QuindÃo, Región Andina, 630008, Colombia" amenity university 0.101 Colombia FALSE
+aipi cn Asia Eastern Asia FALSE 1 2021-02-03 302227361 node "矮陂, æƒ å·žå¸‚, 广东çœ<81>, ä¸å›½" place village 0.275 ä¸å›½ FALSE
+air cn Asia Eastern Asia FALSE 1 2021-02-03 97128317 way "æ©Ÿå ´ Airport, 翔天路 Sky Plaza Road, 離島å<8d>€ Islands District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" railway station 0.479338672131387 ä¸å›½ FALSE
+anhui cn Asia Eastern Asia FALSE 1 2021-02-03 296043921 relation "安徽çœ<81>, ä¸å›½" boundary administrative 0.659871277196784 ä¸å›½ FALSE
+autodesk research cn Asia Eastern Asia FALSE 1 2021-02-03 156971777 way "欧特克软件ä¸å›½ç ”å<8f>‘ä¸å¿ƒ, 峨山路 91 弄, 花木镇, 浦东新区, 200122, ä¸å›½" building commercial 0.001 ä¸å›½ FALSE
+beijing forestry university cn Asia Eastern Asia FALSE 1 2021-02-03 183393105 way "北京林业大å¦, 白蜡大é<81>“, 八家æ<9d>‘, 海淀区, 北京市, 010-62332281, ä¸å›½" amenity university 0.39975765213835 ä¸å›½ FALSE
+beijing huayi cn Asia Eastern Asia FALSE 1 2021-02-03 131049528 way "Beijing -Chengde Expressway, 郑家庄æ<9d>‘, 怀柔区 / Huairou, 北京市, ä¸å›½" highway motorway 0.2 ä¸å›½ FALSE
+beijing institute of technology cn Asia Eastern Asia FALSE 1 2021-02-03 97776882 way "北京ç<90>†å·¥å¤§å¦, 5, ä¸å…³æ<9d>‘å<8d>—大街, 万柳地区, 海淀区, 北京市, 100872, ä¸å›½" amenity university 0.429216387348702 ä¸å›½ FALSE
+caa cn Asia Eastern Asia FALSE 1 2021-02-03 258898604 relation "ä¸å›½ç¾Žæœ¯å¦é™¢, å<8d>—山路, 清波街é<81>“, 上城区, æ<9d>州市, 浙江çœ<81>, 310002, ä¸å›½" amenity university 0.4192479107425 ä¸å›½ FALSE
+cha university cn Asia Eastern Asia FALSE 1 2021-02-03 114396997 way "茶港路, æ¦æ±‰å¤§å¦, ç<8f>žç<8f>ˆå±±è¡—é<81>“, æ¦æ˜ŒåŒº, 湖北çœ<81>, 430072, ä¸å›½" highway residential 0.1 ä¸å›½ FALSE
+chc cn Asia Eastern Asia FALSE 1 2021-02-03 257605389 relation ä¸å›½ boundary administrative 0.87882659637803 ä¸å›½ FALSE
+china central television cn Asia Eastern Asia FALSE 1 2021-02-03 156562290 way "ä¸å¤®å¹¿æ’电视总å<8f>°å¤<8d>兴路办公区, 海淀区, 北京市, ä¸å›½" landuse commercial 0.543449477148185 ä¸å›½ FALSE
+china geological survey cn Asia Eastern Asia FALSE 1 2021-02-03 74604676 node "China Geological Survey, 一环路北三段, 星辰苑, 人民北路街é<81>“, æˆ<90>都市, å››å·<9d>çœ<81>, 610084, ä¸å›½" office government 0.301 ä¸å›½ FALSE
+china institute of water resources and hydropower research cn Asia Eastern Asia FALSE 1 2021-02-03 72695777 node "China Institute of Water Resources and Hydropower Research, 1, 玉渊æ½å<8d>—è·¯, 海淀区, 北京市, 100038, ä¸å›½" office Institute 0.801 ä¸å›½ FALSE
+china national computer congress cn Asia Eastern Asia FALSE 1 2021-02-03 196797629 way "ä¸å›½å…±äº§å…šç¬¬äºŒæ¬¡å…¨å›½ä»£è¡¨å¤§ä¼šä¼šå<9d>€, 30, 延安高架路, é<9d>™å®‰åŒº, 200070, ä¸å›½" historic memorial 0.259145294756841 ä¸å›½ FALSE
+china national offshore oil corporation cn Asia Eastern Asia FALSE 1 2021-02-03 52352480 node "ä¸å›½æµ·æ²¹ CNOOC, 花城æœ<8d>务区, 花都区, 广州市, 广东çœ<81>, ä¸å›½" amenity fuel 0.001 ä¸å›½ FALSE
+china west normal university cn Asia Eastern Asia FALSE 1 2021-02-03 258825506 relation "å<8d>Žä¸œå¸ˆèŒƒå¤§å¦, 3663, ä¸å±±åŒ—è·¯, é•¿å®<81>区, 200062, ä¸å›½" amenity university 0.470582098448222 ä¸å›½ FALSE
+chinese academy of sciences institute of chemistry cn Asia Eastern Asia FALSE 1 2021-02-03 218888877 way "ä¸å›½ç§‘å¦é™¢åŒ–å¦ç ”究所, ä¸å…³æ<9d>‘北二æ<9d>¡, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" amenity research_institute 0.222549534893346 ä¸å›½ FALSE
+chinese academy of sciences' institute of theoretical physics cn Asia Eastern Asia FALSE 1 2021-02-03 213466451 way "ä¸å›½ç§‘å¦é™¢ç<90>†è®ºç‰©ç<90>†ç ”究所, 55å<8f>·, ä¸å…³æ<9d>‘东路, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½" office research 0.001 ä¸å›½ FALSE
+citic securities cn Asia Eastern Asia FALSE 1 2021-02-03 149771411 way "ä¸ä¿¡è¯<81>券大厦, 8å<8f>·, ä¸å¿ƒä¸‰è·¯, å<8d>“越时代广场, ç¦<8f>田区, 深圳市, 广东çœ<81>, 518048, ä¸å›½" building commercial 0.001 ä¸å›½ FALSE
+csns cn Asia Eastern Asia FALSE 1 2021-02-03 209031547 way "CSNS, 大朗镇, 东莞市, 广东çœ<81>, ä¸å›½" highway residential 0.2 ä¸å›½ FALSE
+cuhk cn Asia Eastern Asia FALSE 1 2021-02-03 259201755 relation "香港ä¸æ–‡å¤§å¸ The Chinese University of Hong Kong, å<90><90>露港公路 Tolo Highway, 馬料水 Ma Liu Shui, 馬éž<8d>å±± Ma On Shan, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" amenity university 0.515796938688453 ä¸å›½ FALSE
+department of public security cn Asia Eastern Asia FALSE 1 2021-02-03 149888559 way "深圳市公安局出入境管ç<90>†å¤„, 4016, 解放路, 蔡屋围, æ¡‚å›è¡—é<81>“, 罗湖区, 深圳市, 广东çœ<81>, 518000, ä¸å›½" office government 0.001 ä¸å›½ FALSE
+donghua university cn Asia Eastern Asia FALSE 1 2021-02-03 156972924 way "东å<8d>Žå¤§å¦, 凯旋路, é•¿å®<81>区, 200050, ä¸å›½" amenity university 0.409150861243221 ä¸å›½ FALSE
+dsn cn Asia Eastern Asia FALSE 1 2021-02-03 121641844 way "鄂尔多斯伊金éœ<8d>洛机场, 阿大一级公路, 乌兰木伦镇, 伊金éœ<8d>洛旗, 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½" aeroway aerodrome 0.444828356030634 ä¸å›½ FALSE
+education bureau cn Asia Eastern Asia FALSE 1 2021-02-03 181667938 way "Education Bureau, Bayi Bridge, 水北街é<81>“, 邵æ¦å¸‚, å<8d>—平市, ç¦<8f>建çœ<81>, ä¸å›½" office government 0.201 ä¸å›½ FALSE
+ets cn Asia Eastern Asia FALSE 1 2021-02-03 25065834 node "å°–æ<9d>± East Tsim Sha Tsui, 梳士巴利é<81>“ Salisbury Road, 尖沙咀æ<9d>± East Tsim Sha Tsui, 尖沙咀 Tsim Sha Tsui, 油尖旺å<8d>€ Yau Tsim Mong District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" railway yes 0.40331698832418 ä¸å›½ FALSE
+first affiliated hospital of guangzhou medical university cn Asia Eastern Asia FALSE 1 2021-02-03 199861213 way "广州医科大å¦é™„属第一医院, é<9d>–æµ·è·¯, 人民街é<81>“, 越秀区, 广州市, 广东çœ<81>, 510115, ä¸å›½" amenity hospital 0.158083983169266 ä¸å›½ FALSE
+first affiliated hospital of zhejiang university cn Asia Eastern Asia FALSE 1 2021-02-03 203868614 way "浙江大å¦é™„属第一医院, 庆春路, å°<8f>è<90>¥è¡—é<81>“, 上城区, æ<9d>州市, 浙江çœ<81>, 310003, ä¸å›½" amenity hospital 0.001 ä¸å›½ FALSE
+first affiliated hospital of zhengzhou university cn Asia Eastern Asia FALSE 1 2021-02-03 210240098 way "郑州大å¦ç¬¬ä¸€é™„属医院, 1å<8f>·, 龙湖ä¸çŽ¯è·¯, 金水区, 郑州市, æ²³å<8d>—çœ<81>, 450003, ä¸å›½" amenity hospital 0.001 ä¸å›½ FALSE
+foreign correspondents club cn Asia Eastern Asia FALSE 1 2021-02-03 182742528 way "香港外國記者會 The Foreign Correspondents' Club, Hong Kong, 2, 下亞厘畢é<81>“ Lower Albert Road, SoHo, ä¸ç’° Central, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" building yes 0.301 ä¸å›½ FALSE
+gan cn Asia Eastern Asia FALSE 1 2021-02-03 258491397 relation "江西çœ<81>, ä¸å›½" boundary administrative 0.660896625230364 ä¸å›½ FALSE
+gansu cn Asia Eastern Asia FALSE 1 2021-02-03 257817395 relation "甘肃çœ<81>, ä¸å›½" boundary administrative 0.655464380043053 ä¸å›½ FALSE
+genome biology cn Asia Eastern Asia FALSE 1 2021-02-03 177252901 way "å®¶èš•åŸºå› ç»„å›½å®¶é‡<8d>点实验室, 乡建路, 北碚区, é‡<8d>庆ä¸å¿ƒåŸŽåŒº, é‡<8d>庆市, 400715, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+google china cn Asia Eastern Asia FALSE 1 2021-02-03 67831332 node "Google, 555, 軒尼詩é<81>“ Hennessy Road, 摩利臣山 Morrison Hill, 銅鑼ç<81>£ Causeway Bay, ç<81>£ä»”å<8d>€ Wan Chai District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" office company 0.101 ä¸å›½ FALSE
+guangdong technion israel institute of technology cn Asia Eastern Asia FALSE 1 2021-02-03 204544197 way "广东以色列ç<90>†å·¥å¦é™¢, 241å<8f>·, 大å¦è·¯, 鮀江街é<81>“, 金平区, 汕头市, 广东çœ<81>, 515063, ä¸å›½" amenity university 0.35112554102268 ä¸å›½ FALSE
+guangxi cn Asia Eastern Asia FALSE 1 2021-02-03 257932217 relation "广西壮æ—<8f>自治区, ä¸å›½" boundary administrative 0.653225316203717 ä¸å›½ FALSE
+guangzhou women and children's medical center cn Asia Eastern Asia FALSE 1 2021-02-03 217534561 way "妇儿ä¸å¿ƒ, 金穗路隧é<81>“, ç<8f> 江新城, 冼æ<9d>‘è¡—é<81>“, 天河区, 广州市, 广东çœ<81>, 510623, ä¸å›½" building train_station 0.35609057542022 ä¸å›½ FALSE
+hainan university cn Asia Eastern Asia FALSE 1 2021-02-03 143082445 way "æµ·å<8d>—大å¦, 海甸四西路 - Haidian 4th West Road, 人民路街é<81>“, 海甸岛, 美兰区, æµ·å<8f>£å¸‚, æµ·å<8d>—çœ<81>, 570208, ä¸å›½" amenity university 0.400132318333933 ä¸å›½ FALSE
+hei cn Asia Eastern Asia FALSE 1 2021-02-03 258184662 relation "黑龙江çœ<81>, ä¸å›½" boundary administrative 0.646855260728525 ä¸å›½ FALSE
+high court cn Asia Eastern Asia FALSE 1 2021-02-03 113553479 way "高ç‰æ³•é™¢ The High Court, 金é<90>˜é<81>“ Queensway, ä¸å<8d>Šå±± Mid-Levels Central, 金é<90>˜ Admiralty, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity courthouse 0.557784396815435 ä¸å›½ FALSE
+hohai university cn Asia Eastern Asia FALSE 1 2021-02-03 127543175 way "河海大å¦, 汉å<8f>£è¥¿è·¯, 鼓楼区, å<8d>—京市, 210098, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+hong kong baptist university cn Asia Eastern Asia FALSE 1 2021-02-03 19213852 node "é¦™æ¸¯æµ¸æœƒå¤§å¸ Hong Kong Baptist University, 安明街 On Ming Street, 石門 Shek Mun, 牛皮沙æ<9d>‘ Ngau Pei Sha Village, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" railway subway_entrance 0.401 ä¸å›½ FALSE
+hong kong polytechnic university cn Asia Eastern Asia FALSE 1 2021-02-03 99717473 way "香港ç<90>†å·¥å¤§å¸ The Hong Kong Polytechnic University, 11, 育æ‰<8d>é<81>“ Yuk Choi Road, 紅磡ç<81>£ Hung Hom Bay, 尖沙咀 Tsim Sha Tsui, 油尖旺å<8d>€ Yau Tsim Mong District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" amenity university 0.890914282128039 ä¸å›½ FALSE
+hong kong university of science and technology cn Asia Eastern Asia FALSE 1 2021-02-03 51695244 node "é¦™æ¸¯ç§‘æŠ€å¤§å¸ Hong Kong University of Science and Technology, 大å¸é<81>“ University Road, 碧水新æ<9d>‘ Pik Shui San Tsuen, 大埔仔 Tai Po Tsai, 西貢å<8d>€ Sai Kung District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" highway bus_stop 0.701 ä¸å›½ FALSE
+huashan hospital cn Asia Eastern Asia FALSE 1 2021-02-03 258491124 relation "花山区 (Huashan), 马éž<8d>山市, 243000, ä¸å›½" boundary administrative 0.511447002935904 ä¸å›½ FALSE
+hunan normal university cn Asia Eastern Asia FALSE 1 2021-02-03 71437400 node "æ¹–å<8d>—师大, 木兰路, 长沙市, 岳麓区, 长沙市, æ¹–å<8d>—çœ<81>, 410006, ä¸å›½" railway station 0.001 ä¸å›½ FALSE
+hunan university cn Asia Eastern Asia FALSE 1 2021-02-03 70146415 node "æ¹–å<8d>—大å¦, æ•™å¦1å<8f>·, 长沙市, 岳麓区, 长沙市, æ¹–å<8d>—çœ<81>, 410082, ä¸å›½" railway station 0.20962395537125 ä¸å›½ FALSE
+hupo cn Asia Eastern Asia FALSE 1 2021-02-03 259081826 relation "ç<90>¥ç<8f>€é•‡, 麦积区, 天水市, 甘肃çœ<81>, ä¸å›½" boundary administrative 0.228876356713622 ä¸å›½ FALSE
+icc cn Asia Eastern Asia FALSE 1 2021-02-03 96538994 way "ç’°ç<90>ƒè²¿æ˜“å»£å ´ International Commerce Centre, 1, 柯士甸é<81>“西 Austin Road West, 西ä¹<9d>é¾<8d> West Kowloon, 油麻地 Yau Ma Tei, 油尖旺å<8d>€ Yau Tsim Mong District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" building tower 0.466329902238883 ä¸å›½ FALSE
+ihcc cn Asia Eastern Asia FALSE 1 2021-02-03 96538994 way "ç’°ç<90>ƒè²¿æ˜“å»£å ´ International Commerce Centre, 1, 柯士甸é<81>“西 Austin Road West, 西ä¹<9d>é¾<8d> West Kowloon, 油麻地 Yau Ma Tei, 油尖旺å<8d>€ Yau Tsim Mong District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" building tower 0.466329902238883 ä¸å›½ FALSE
+ihec cn Asia Eastern Asia FALSE 1 2021-02-03 150867020 way "宜春明月山机场, 锦绣大é<81>“, 湖田镇, è¢<81>州区, 宜春市, 江西çœ<81>, ä¸å›½" aeroway aerodrome 0.443317794581981 ä¸å›½ FALSE
+ihu cn Asia Eastern Asia FALSE 1 2021-02-03 258689452 relation "义乌市, 金å<8d>Žå¸‚, 浙江çœ<81>, ä¸å›½" boundary administrative 0.490850025928259 ä¸å›½ FALSE
+institute of atmospheric physics cn Asia Eastern Asia FALSE 1 2021-02-03 228833038 way "ä¸å›½ç§‘å¦é™¢å¤§æ°”物ç<90>†ç ”究所, æœ<9d>阳区, 北京市, ä¸å›½" landuse commercial 0.2 ä¸å›½ FALSE
+institute of biotechnology cn Asia Eastern Asia FALSE 1 2021-02-03 152857882 way "é¦™æ¸¯ç”Ÿç‰©ç§‘æŠ€ç ”ç©¶é™¢ Hong Kong Institute of Biotechnology, 生物科技路 Biotechnology Avenue, 馬料水 Ma Liu Shui, 馬éž<8d>å±± Ma On Shan, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, DD29 1007, ä¸å›½" building yes 0.301 ä¸å›½ FALSE
+institute of geographic sciences and natural resources research cn Asia Eastern Asia FALSE 1 2021-02-03 141475601 way "ä¸å›½ç§‘å¦é™¢åœ°ç<90>†ç§‘å¦ä¸Žèµ„æº<90>ç ”ç©¶æ‰€, 大屯路, 天创世缘, æœ<9d>阳区, 北京市, 100101, ä¸å›½" office research 0.001 ä¸å›½ FALSE
+institute of higher education cn Asia Eastern Asia FALSE 1 2021-02-03 134120775 way "浙江ç»<8f>è´¸è<81>Œä¸šæŠ€æœ¯å¦é™¢, å¦æž—è¡—, 白æ<9d>¨è¡—é<81>“, 钱塘新区, æ<9d>州市, 浙江çœ<81>, 310018, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+jianghan university cn Asia Eastern Asia FALSE 1 2021-02-03 78769329 node "江汉大å¦é™„属医院, 香港路, 西马街é<81>“, 江岸区, 湖北çœ<81>, 430021, ä¸å›½" amenity hospital 0.001 ä¸å›½ FALSE
+jiangxi cn Asia Eastern Asia FALSE 1 2021-02-03 258491397 relation "江西çœ<81>, ä¸å›½" boundary administrative 0.660896625230364 ä¸å›½ FALSE
+king's college cn Asia Eastern Asia FALSE 1 2021-02-03 134145090 way "英皇書院 King's College, 63A, 般咸é<81>“ Bonham Road, 西å<8d>Šå±± Mid-Levels West, 西營盤 Sai Ying Pun, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity school 0.668648909480289 ä¸å›½ FALSE
+kuomintang cn Asia Eastern Asia FALSE 1 2021-02-03 162507523 way "ä¸å›½å›½æ°‘党一大旧å<9d>€, 龙虎墙, 大塘街é<81>“, 越秀区, 广州市, 广东çœ<81>, 510375, ä¸å›½" tourism museum 0.254365194683011 ä¸å›½ FALSE
+lanzhou veterinary research institute cn Asia Eastern Asia FALSE 1 2021-02-03 185815023 way "ä¸å›½å†œä¸šç§‘å¦é™¢å…°å·žå…½åŒ»ç ”究所, 1, å¾<90>家å<9d>ª, ç›<90>场路街é<81>“, 兰州市, 城关区, 兰州市, 甘肃çœ<81>, 730046, ä¸å›½" office research 0.001 ä¸å›½ FALSE
+legislative council cn Asia Eastern Asia FALSE 1 2021-02-03 113505472 way "立法會綜å<90>ˆå¤§æ¨“ Legislative Council Complex, 添美é<81>“ Tim Mei Avenue, ä¸å<8d>Šå±± Mid-Levels Central, 金é<90>˜ Admiralty, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity townhall 0.715868379984702 ä¸å›½ FALSE
+liaocheng university cn Asia Eastern Asia FALSE 1 2021-02-03 169515004 way "è<81>ŠåŸŽå¤§å¦è¥¿æ ¡åŒº, 花å›å<8d>—路辅路, 东昌府区, è<81>ŠåŸŽå¸‚, 山东çœ<81>, 252000, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+nanjing university of science and technology cn Asia Eastern Asia FALSE 1 2021-02-03 258596617 relation "å<8d>—京ç<90>†å·¥å¤§å¦, å…‰å<8d>Žè·¯, 秦淮区, 玄æ¦åŒº, å<8d>—京市, 210012, ä¸å›½" amenity university 0.416302457462662 ä¸å›½ FALSE
+nantong university cn Asia Eastern Asia FALSE 1 2021-02-03 160989544 way "å<8d>—通大å¦, å°<8f>æµ·è¡—é<81>“, å´‡å·<9d>区, å<8d>—通市, 226000, ä¸å›½" leisure park 0.15 ä¸å›½ FALSE
+national astronomical observatories cn Asia Eastern Asia FALSE 1 2021-02-03 48659152 node "国家天文å<8f>°, 北辰西路, æœ<9d>阳区, 北京市, 100012, ä¸å›½" amenity research_institute 0.001 ä¸å›½ FALSE
+national autonomous university cn Asia Eastern Asia FALSE 1 2021-02-03 68277017 node "æ— äººå€¼å®ˆå›¾ä¹¦é¦†, 1088, å¦è‹‘大é<81>“, 深圳大å¦åŸŽ, 桃å›è¡—é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518000, ä¸å›½" amenity library 0.001 ä¸å›½ FALSE
+national institute of biological sciences cn Asia Eastern Asia FALSE 1 2021-02-03 21241550 node "National Institute of Biological Sciences (NIBS), 7, 科å¦å›è·¯, 西å<8d>Šå£<81>店æ<9d>‘, 昌平区, 北京市, 102206, ä¸å›½" building office 0.501 ä¸å›½ FALSE
+nei cn Asia Eastern Asia FALSE 1 2021-02-03 59452923 node "内æ<81>©, å<8d>—å®<81>市, 广西壮æ—<8f>自治区, ä¸å›½" place village 0.275 ä¸å›½ FALSE
+ocean university of china cn Asia Eastern Asia FALSE 1 2021-02-03 203984036 way "ä¸å›½æµ·æ´‹å¤§å¦, 5, 鱼山路, 市å<8d>—区, é<9d>’岛市, 山东çœ<81>, 266001, ä¸å›½" amenity university 0.403405604298285 ä¸å›½ FALSE
+open university of hong kong cn Asia Eastern Asia FALSE 1 2021-02-03 156773961 way "é¦™æ¸¯å…¬é–‹å¤§å¸ The Open University of Hong Kong, 81, å¿ å<9d>è¡— Chung Hau Street, 何文田山 Ho Man Tin Hill, 何文田 Ho Man Tin, ä¹<9d>é¾<8d>城å<8d>€ Kowloon City District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½" building university 0.888105956498361 ä¸å›½ FALSE
+people's daily cn Asia Eastern Asia FALSE 1 2021-02-03 52429330 node "人民日报广东分社站②, 黄埔大é<81>“西, 天河å<8d>—è¡—é<81>“, 天河区, 广州市, 广东çœ<81>, 510620, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+political consultative conference cn Asia Eastern Asia FALSE 1 2021-02-03 183739682 way "胶澳总ç<9d>£åºœæ—§å<9d>€ï¼ˆçŽ°é<9d>’岛市人大ã€<81>政å<8d><8f>办公楼), 沂水路, 市å<8d>—区, é<9d>’岛市, 山东çœ<81>, 266001, ä¸å›½" office government 0.001 ä¸å›½ FALSE
+qub cn Asia Eastern Asia FALSE 1 2021-02-03 299390583 way "é°‚éšæ¶Œ Quarry Bay, 896, 英皇é<81>“ King's Road, 七姊妹 Tsat Tsz Mui, é°‚éšæ¶Œ Quarry Bay, æ<9d>±å<8d>€ Eastern District, 香港島 Hong Kong Island, 香港 Hong Kong, ä¸å›½" building train_station 0.398332012645065 ä¸å›½ FALSE
+rac cn Asia Eastern Asia FALSE 1 2021-02-03 21930851 node "é¦¬å ´ Racecourse, 大埔公路ï¼<8d>沙田段 Tai Po Road – Sha Tin, è<90>½è·¯ä¸‹ Lok Lo Ha, ä¹<9d>è‚š Kau To, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½" railway station 0.471239527648604 ä¸å›½ FALSE
+renmin university cn Asia Eastern Asia FALSE 1 2021-02-03 4331354 node "人民大å¦, 北三环, 万柳地区, 海淀区, 北京市, 100872, ä¸å›½" railway stop 0.001 ä¸å›½ FALSE
+scarborough shoal cn Asia Eastern Asia FALSE 1 2021-02-03 302688259 way "黄岩岛(民主ç¤<81>) - Scarborough Shoal, 三沙市, æµ·å<8d>—çœ<81>, ä¸å›½" place island 0.633219531977835 ä¸å›½ FALSE
+school of microelectronics cn Asia Eastern Asia FALSE 1 2021-02-03 159138504 way "微电å<90>å¦é™¢, å<8d>—æ´‹å<8d>—è·¯, 紫竹科技å›åŒº, 闵行区, 200240, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+school of pharmacy cn Asia Eastern Asia FALSE 1 2021-02-03 204162763 way "School of Pharmacy, å<8d>—å¦é™¢è¡—, 江å<8d>—大å¦èµ¤é©¬å˜´é<81>—å<9d>€, 滨湖区, æ— é”¡å¸‚, 江è‹<8f>çœ<81>, 214000, ä¸å›½" building yes 0.301 ä¸å›½ FALSE
+second military medical university cn Asia Eastern Asia FALSE 1 2021-02-03 165511350 way "第二军医大å¦, 800, 翔殷路, 五角场街é<81>“, æ<9d>¨æµ¦åŒº, 200433, ä¸å›½" amenity university 0.403582454919981 ä¸å›½ FALSE
+shandong university cn Asia Eastern Asia FALSE 1 2021-02-03 61783127 node "山东大å¦, è“<9d>è°·è·¯, å<8d>³å¢¨åŒº, é<9d>’岛市, 山东çœ<81>, 266200, ä¸å›½" railway station 0.001 ä¸å›½ FALSE
+shenzhen university cn Asia Eastern Asia FALSE 1 2021-02-03 73604974 node "深大, 科技å<8d>—一路, 粤海街é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518000, ä¸å›½" railway station 0.001 ä¸å›½ FALSE
+siae cn Asia Eastern Asia FALSE 1 2021-02-03 119339783 way "机场, 西禹高速, 临潼区 (Chang'an), 西安市, 陕西çœ<81>, ä¸å›½" aeroway aerodrome 0.402243537687533 ä¸å›½ FALSE
+songshan national nature reserve cn Asia Eastern Asia FALSE 1 2021-02-03 226360739 way "北京æ<9d>¾å±±å›½å®¶çº§è‡ªç„¶ä¿<9d>护区, 延庆区, 北京市, ä¸å›½" boundary protected_area 0.298558873147647 ä¸å›½ FALSE
+southern china cn Asia Eastern Asia FALSE 1 2021-02-03 258717462 relation "å<8d>—å<8d>€ Southern District, 香港島 Hong Kong Island, 香港 Hong Kong, ä¸å›½" boundary administrative 0.57805930713623 ä¸å›½ FALSE
+southern medical university cn Asia Eastern Asia FALSE 1 2021-02-03 51886881 node "å<8d>—方医科大å¦ç«™, 沙太北路, 京溪街é<81>“, 白云区, 广州市, 广东çœ<81>, 510515, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+southern university of china cn Asia Eastern Asia FALSE 1 2021-02-03 193573154 way "å<8d>—方科技大å¦, 1088, å¦è‹‘大é<81>“, 深圳大å¦åŸŽ, 桃å›è¡—é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518055, ä¸å›½" amenity university 0.310439474412231 ä¸å›½ FALSE
+state academy of sciences cn Asia Eastern Asia FALSE 1 2021-02-03 52408051 node "科å¦é™¢ç«™, 天æº<90>è·¯, 龙洞街é<81>“, 天河区, 广州市, 广东çœ<81>, 510650, ä¸å›½" highway bus_stop 0.001 ä¸å›½ FALSE
+state administration of taxation cn Asia Eastern Asia FALSE 1 2021-02-03 181175059 way "State Administration of Taxation, G316, 通泰街é<81>“, 邵æ¦å¸‚, å<8d>—平市, ç¦<8f>建çœ<81>, ä¸å›½" office government 0.401 ä¸å›½ FALSE
+tiangong cn Asia Eastern Asia FALSE 1 2021-02-03 83432983 node "ç”°å…±, å<8d>—å®<81>市, 广西壮æ—<8f>自治区, ä¸å›½" place village 0.275 ä¸å›½ FALSE
+tianhe ii cn Asia Eastern Asia FALSE 1 2021-02-03 258569294 relation "天河区, 广州市, 广东çœ<81>, ä¸å›½" boundary administrative 0.472775653790836 ä¸å›½ FALSE
+tianjin university cn Asia Eastern Asia FALSE 1 2021-02-03 103498362 way "天津大å¦, 湖滨é<81>“, å<8d>—开区 (Nankai), 天津市, 300084, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+tianjin university in china cn Asia Eastern Asia FALSE 1 2021-02-03 144399984 way "ä¸å›½æ°‘航大å¦, 津北公路, 东丽区, 东丽区 (Dongli), 天津市, 300300, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+tibet autonomous region cn Asia Eastern Asia FALSE 1 2021-02-03 296714732 relation "西è—<8f>自治区, ä¸å›½" boundary administrative 0.627670964975274 ä¸å›½ FALSE
+tongji cn Asia Eastern Asia FALSE 1 2021-02-03 58307078 node "童集, å<90>ˆè‚¥å¸‚, ä¸å›½" place village 0.275 ä¸å›½ FALSE
+tongji medical college cn Asia Eastern Asia FALSE 1 2021-02-03 121878064 way "å<8d>Žä¸ç§‘技大å¦å<90>ŒæµŽåŒ»å¦é™¢, 航空路, å®<9d>丰街é<81>“, ç¡šå<8f>£åŒº, 江汉区, 湖北çœ<81>, 430030, ä¸å›½" amenity university 0.3004701084432 ä¸å›½ FALSE
+uiuc cn Asia Eastern Asia FALSE 1 2021-02-03 207804111 way "浙江大å¦ä¼Šåˆ©è¯ºä¼Šå¤§å¦åŽ„å·´çº³é¦™æ§Ÿæ ¡åŒºè<81>”å<90>ˆå¦é™¢, å<8d>—环路, 鹃湖科技城, æµ·å®<81>市, 嘉兴市, 浙江çœ<81>, 314400, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+university of hong kong in china cn Asia Eastern Asia FALSE 1 2021-02-03 258613825 relation "é¦™æ¸¯å¤§å¸ The University of Hong Kong, åˆ—å ¤é “é<81>“ Lyttelton Road, 西å<8d>Šå±± Mid-Levels West, 西營盤 Sai Ying Pun, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" amenity university 1.02967834592939 ä¸å›½ FALSE
+university of macau cn Asia Eastern Asia FALSE 1 2021-02-03 259347553 relation "Universidade de Ciência e Tecnologia de Macau æ¾³é–€ç§‘æŠ€å¤§å¸ Macau University of Science and Technology, é›žé ¸é¦¬è·¯ Estrada da Ponta da Cabrita, 北安 Pac On, å˜‰æ¨¡å ‚å<8d>€ Nossa Senhora do Carmo, 氹仔 Taipa, 澳門 Macau, 999078, ä¸å›½" amenity university 0.666591667934692 ä¸å›½ FALSE
+university of nanjing cn Asia Eastern Asia FALSE 1 2021-02-03 110545344 way "å<8d>—京大å¦, å<8d>«å··, 鼓楼区, 玄æ¦åŒº, å<8d>—京市, 210093, ä¸å›½" amenity university 0.498289975489913 ä¸å›½ FALSE
+university of the chinese academy of sciences cn Asia Eastern Asia FALSE 1 2021-02-03 64279650 node "UCAS, 玉泉路, ç”°æ<9d>‘, 海淀区, 北京市, 100049, ä¸å›½" amenity university 0.385200970199076 ä¸å›½ FALSE
+usi cn Asia Eastern Asia FALSE 1 2021-02-03 258635882 relation "æ— é”¡å¸‚, 214000, ä¸å›½" boundary administrative 0.547775869917964 ä¸å›½ FALSE
+ustc cn Asia Eastern Asia FALSE 1 2021-02-03 156022554 way "ä¸å›½ç§‘å¦æŠ€æœ¯å¤§å¦ ä¸œæ ¡åŒº, 96, 金寨路, ä¸è¡Œå®¿èˆ<8d>, 稻香æ<9d>‘è¡—é<81>“, 蜀山区 (Shushan), å<90>ˆè‚¥å¸‚, 230026, ä¸å›½" amenity university 0.464121550533476 ä¸å›½ FALSE
+xi'an jiaotong-liverpool university cn Asia Eastern Asia FALSE 1 2021-02-03 200616846 way "西交利物浦大å¦, 文景路, 星慧社区, 月亮湾社工委, è‹<8f>州工业å›åŒºç›´å±žé•‡, è‹<8f>州工业å›åŒº, è‹<8f>州市, 215123, ä¸å›½" amenity university 0.397362929796699 ä¸å›½ FALSE
+xinhua news agency cn Asia Eastern Asia FALSE 1 2021-02-03 199853292 way "æ–°è<8f>¯é€šè¨Šç¤¾ Xinhua News Agency, 379-381, 皇å<90>Žå¤§é<81>“æ<9d>± Queen's Road East, 摩利臣山 Morrison Hill, ç<81>£ä»” Wan Chai, ç<81>£ä»”å<8d>€ Wan Chai District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½" office newspaper 0.301 ä¸å›½ FALSE
+xinjiang uyghur autonomous region cn Asia Eastern Asia FALSE 1 2021-02-03 257472610 relation "新疆维å<90>¾å°”自治区, ä¸å›½" boundary administrative 0.674183703517689 ä¸å›½ FALSE
+yanbian university cn Asia Eastern Asia FALSE 1 2021-02-03 149934887 way "å»¶è¾¹å¤§å¦ ì—°ë³€ëŒ€í•™, å›å·<9d>è¡— ì›<90>천거리, 延å<90>‰å¸‚ 연길시, å…¬å›è¡—é<81>“, 延å<90>‰å¸‚, 延边æœ<9d>鲜æ—<8f>自治州, å<90>‰æž—çœ<81>, 133000, ä¸å›½" amenity university 0.400690081410952 ä¸å›½ FALSE
+zhejiang gongshang university cn Asia Eastern Asia FALSE 1 2021-02-03 173484760 way "浙江工商大å¦(æ•™å·¥è·¯æ ¡åŒº), 149å<8f>·, 教工路, 西湖区, æ<9d>州市, 浙江çœ<81>, 310012, ä¸å›½" amenity university 0.001 ä¸å›½ FALSE
+zhejiang university school of medicine cn Asia Eastern Asia FALSE 1 2021-02-03 149415240 way "浙江大å¦åŒ»å¦é™¢, é<81>µä¹‰è·¯, 三墩镇, 西湖区, æ<9d>州市, 浙江çœ<81>, 310058, ä¸å›½" building university 0.001 ä¸å›½ FALSE
+eta cm Africa Middle Africa FALSE 1 2021-02-03 24334914 node "Eta, Ngoyla, Haut-Nyong, Est, Cameroun" place village 0.375 Cameroun FALSE
+mpo cm Africa Middle Africa FALSE 1 2021-02-03 141599632 way "Mpo, Atok, Haut-Nyong, Est, Cameroun" waterway river 0.375 Cameroun FALSE
+ocean cm Africa Middle Africa FALSE 1 2021-02-03 258448571 relation "Océan, Sud, Cameroun" boundary administrative 0.379599826756761 Cameroun FALSE
+southwest cm Africa Middle Africa FALSE 1 2021-02-03 258706250 relation "Southwest, Cameroun" boundary administrative 0.575363976054984 Cameroun FALSE
+university of yaoundé cm Africa Middle Africa FALSE 1 2021-02-03 135385489 way "Université de Yaoundé I, Rue 3.729, Ngoa-Ékélé, Communauté urbaine de Yaoundé, Mfoundi, Centre, 860 YDÃ<8f>¿½, Cameroun" amenity university 0.383208261767925 Cameroun FALSE
+alma cl Americas South America FALSE 1 2021-02-03 36357918 node "Atacama Large Millimeter/submillimeter Array, San Pedro de Atacama, Provincia de El Loa, Región de Antofagasta, Chile" place hamlet 0.448129702072077 Chile FALSE
+atacama cosmology telescope cl Americas South America FALSE 1 2021-02-03 109534275 way "Atacama Cosmology Telescope (ACT), San Pedro de Atacama - Paso Jama, San Pedro de Atacama, Provincia de El Loa, Región de Antofagasta, Chile" man_made telescope 0.626239076957718 Chile FALSE
+cerro paranal cl Americas South America FALSE 1 2021-02-03 13674948 node "Cerro Paranal, Taltal, Provincia de Antofagasta, Región de Antofagasta, Chile" natural peak 0.557411994477751 Chile FALSE
+el sauce observatory cl Americas South America FALSE 1 2021-02-03 54499584 node "Observatorio El Sauce, RÃo Hurtado, Provincia de LimarÃ, Región de Coquimbo, Chile" place locality 0.325 Chile FALSE
+james ax observatory cl Americas South America FALSE 1 2021-02-03 185920082 way "Huan Tran Telescope (James Ax observatory), San Pedro de Atacama - Paso Jama, San Pedro de Atacama, Provincia de El Loa, Región de Antofagasta, Chile" man_made telescope 0.301 Chile FALSE
+juan de fuca cl Americas South America FALSE 1 2021-02-03 94632616 way "Juan de Fuca, Lo Prado, Provincia de Santiago, Región Metropolitana de Santiago, 8980000, Chile" highway living_street 0.4 Chile FALSE
+large synoptic survey telescope cl Americas South America FALSE 1 2021-02-03 171609756 way "Large Synoptic Survey Telescope, El Peñón Peak, Vicuña, Provincia de Elqui, Región de Coquimbo, Chile" landuse construction 0.786844598253808 Chile FALSE
+paranal observatory cl Americas South America FALSE 1 2021-02-03 97009449 way "Paranal Observatory, Acceso Observatorio Paranal, Antofagasta, Provincia de Antofagasta, Región de Antofagasta, Chile" tourism attraction 0.684915797907489 Chile FALSE
+pro-test italia cl Americas South America FALSE 1 2021-02-03 190529016 way "Renault Pro +, 1195, Avenida Irarrázaval, Barrio Italia, Ñuñoa, Provincia de Santiago, Región Metropolitana de Santiago, 7770417, Chile" shop car 0.201 Chile FALSE
+technological university of pereira cl Americas South America FALSE 1 2021-02-03 123708466 way "INACAP, 2519, Nelson Pereira, Rancagua, Provincia de Cachapoal, Región del Libertador General Bernardo O'Higgins, 2850546, Chile" amenity university 0.101 Chile FALSE
+university of la serena cl Americas South America FALSE 1 2021-02-03 109529973 way "Campus Enrique Molina Garmendia (ULS), Ruta 5 Norte, La Serena, Provincia de Elqui, Región de Coquimbo, 17000000, Chile" amenity university 0.201 Chile FALSE
+university of talca cl Americas South America FALSE 1 2021-02-03 113890190 way "Universidad de Talca, Avenida Lircay, Don Enrique, Lircay, Talca, Provincia de Talca, Región del Maule, 346000, Chile" amenity university 0.438041195081873 Chile FALSE
+cook islands ck Oceania Polynesia FALSE 1 2021-02-03 258611909 relation KÅ«ki 'Ä€irani boundary administrative 0.612597091402647 KÅ«ki 'Ä€irani FALSE
+toms ck Oceania Polynesia FALSE 1 2021-02-03 259209070 relation "Tom's, Palmerston, KÅ«ki 'Ä€irani" place islet 0.25 KÅ«ki 'Ä€irani FALSE
+amon ci Africa Western Africa FALSE 1 2021-02-03 38034163 node "Amon, Mé, Lagunes, Côte d’Ivoire" place village 0.375 Côte d’Ivoire FALSE
+cote d'ivoire ci Africa Western Africa FALSE 1 2021-02-03 257869389 relation Côte d’Ivoire boundary administrative 0.903852049188393 Côte d’Ivoire FALSE
+arcadia fund ch Europe Western Europe FALSE 1 2021-02-03 112622320 way "Fund, Canavee, Miglieglia, Circolo di Breno, Distretto di Lugano, Ticino, 6986, Schweiz/Suisse/Svizzera/Svizra" highway footway 0.175 Schweiz/Suisse/Svizzera/Svizra FALSE
+astra ch Europe Western Europe FALSE 1 2021-02-03 44480865 node "ASTRA, 2, Mühlestrasse, Im Park, Worblaufen, Ittigen, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3063, Schweiz/Suisse/Svizzera/Svizra" office government 0.413179143195807 Schweiz/Suisse/Svizzera/Svizra FALSE
+blue brain project ch Europe Western Europe FALSE 1 2021-02-03 37531863 node "Blue Brain Project, Route Cantonale, Ecublens, District de l'Ouest lausannois, Vaud, 1025, Schweiz/Suisse/Svizzera/Svizra" office research 0.702603435932822 Schweiz/Suisse/Svizzera/Svizra FALSE
+caffe ch Europe Western Europe FALSE 1 2021-02-03 6217481 node "La Caffe, Le Fays, Martigny-Combe, Martigny, Valais/Wallis, 1929, Schweiz/Suisse/Svizzera/Svizra" place hamlet 0.35 Schweiz/Suisse/Svizzera/Svizra FALSE
+ch ch Europe Western Europe FALSE 1 2021-02-03 257695656 relation Schweiz/Suisse/Svizzera/Svizra boundary administrative 0.926485171575252 Schweiz/Suisse/Svizzera/Svizra FALSE
+comac ch Europe Western Europe FALSE 1 2021-02-03 10475233 node "Comac, Rue des Terreaux, Neuchâtel, 2001, Schweiz/Suisse/Svizzera/Svizra" shop computer 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+del genio ch Europe Western Europe FALSE 1 2021-02-03 52436434 node "Del Genio, 44, Route de Vissigen, Sion, Valais/Wallis, 1950, Schweiz/Suisse/Svizzera/Svizra" shop butcher 0.201 Schweiz/Suisse/Svizzera/Svizra FALSE
+ecole polytechnique fédérale de lausanne ch Europe Western Europe FALSE 1 2021-02-03 95072766 way "École Polytechnique Fédérale de Lausanne, Route de la Sorge, Quartier Sorge, Ecublens, District de l'Ouest lausannois, Vaud, 1015, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.883095905643059 Schweiz/Suisse/Svizzera/Svizra FALSE
+etzel ch Europe Western Europe FALSE 1 2021-02-03 4383703 node "Etzel, Etzelweg, Einsiedeln, Schwyz, 8840, Schweiz/Suisse/Svizzera/Svizra" tourism viewpoint 0.528982931011336 Schweiz/Suisse/Svizzera/Svizra FALSE
+federal commission of electricity ch Europe Western Europe FALSE 1 2021-02-03 67545483 node "Schweizerische Elektrizitätskommission, Christoffelgasse, Rotes Quartier, Stadtteil I, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3011, Schweiz/Suisse/Svizzera/Svizra" office government 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+ibm zurich ch Europe Western Europe FALSE 1 2021-02-03 61527465 node "IBM, 106, Vulkanstrasse, Werdwies, Altstetten, Kreis 9, Zürich, Bezirk Zürich, Zürich, 8048, Schweiz/Suisse/Svizzera/Svizra" office company 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+institute of evolutionary biology ch Europe Western Europe FALSE 1 2021-02-03 45075228 node "Zoological Institute, Evolutionary Biology, 1, Vesalgasse, Vorstädte, Grossbasel, Basel, Basel-Stadt, 4051, Schweiz/Suisse/Svizzera/Svizra" building university 0.301 Schweiz/Suisse/Svizzera/Svizra FALSE
+international committee ch Europe Western Europe FALSE 1 2021-02-03 96347471 way "Comité International de la Croix-Rouge, 19, Avenue de la Paix, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building yes 0.569349108620761 Schweiz/Suisse/Svizzera/Svizra FALSE
+international telecommunications union ch Europe Western Europe FALSE 1 2021-02-03 109351662 way "Union Internationale des Télécommunications (UIT), Place des Nations, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building yes 0.433228686818865 Schweiz/Suisse/Svizzera/Svizra FALSE
+lausanne university hospital ch Europe Western Europe FALSE 1 2021-02-03 95776304 way "Université de Lausanne, A1a, Quartier Chamberonne, Chavannes-près-Renens, District de l'Ouest lausannois, Vaud, 1022, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.616266928066907 Schweiz/Suisse/Svizzera/Svizra FALSE
+lonza ch Europe Western Europe FALSE 1 2021-02-03 197344166 way "Lonza, Goppenstein, Ferden, Westlich Raron, Valais/Wallis, 3916, Schweiz/Suisse/Svizzera/Svizra" waterway river 0.375 Schweiz/Suisse/Svizzera/Svizra FALSE
+médecins sans frontières ch Europe Western Europe FALSE 1 2021-02-03 145205796 way "Médecins Sans Frontières, 78, Rue de Lausanne, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" office ngo 0.849022542887286 Schweiz/Suisse/Svizzera/Svizra FALSE
+swiss federal institute ch Europe Western Europe FALSE 1 2021-02-03 120741454 way "Eawag: Das Wasserforschungs-Institut des ETH-Bereichs, Seestrasse, Winkel, Kastanienbaum, Horw, Luzern, 6047, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.001 Schweiz/Suisse/Svizzera/Svizra FALSE
+swiss tropical and public health institute ch Europe Western Europe FALSE 1 2021-02-03 225947974 way "Schweizerisches Tropen- und Public Health-Institut, 57, Socinstrasse, Am Ring, Grossbasel, Basel, Basel-Stadt, 4051, Schweiz/Suisse/Svizzera/Svizra" amenity hospital 0.201 Schweiz/Suisse/Svizzera/Svizra FALSE
+the world health organization ch Europe Western Europe FALSE 1 2021-02-03 91298032 way "Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra FALSE
+unhcr ch Europe Western Europe FALSE 1 2021-02-03 95164232 way "Haut Commissariat des Nations Unies pour les Réfugiés, 94, Rue de Montbrillant, Le Petit-Saconnex, Petit-Saconnex et Servette, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" office government 0.415725100553218 Schweiz/Suisse/Svizzera/Svizra FALSE
+university hospital of zurich ch Europe Western Europe FALSE 1 2021-02-03 114961958 way "Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.354152289914814 Schweiz/Suisse/Svizzera/Svizra FALSE
+university hospital zurich ch Europe Western Europe FALSE 1 2021-02-03 114961958 way "Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.354152289914814 Schweiz/Suisse/Svizzera/Svizra FALSE
+university hospital zürich ch Europe Western Europe FALSE 1 2021-02-03 114961958 way "Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.454152289914814 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of freiberg ch Europe Western Europe FALSE 1 2021-02-03 863524 node "Université de Fribourg Pérolles, Chemin du Musée, Pérolles, Fribourg - Freiburg, District de la Sarine, Fribourg/Freiburg, 1705, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.001 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of lugano ch Europe Western Europe FALSE 1 2021-02-03 165141553 way "Franklin University Switzerland, 29, Via Ponte Tresa, Sorengo, Circolo di Vezia, Distretto di Lugano, Ticino, 6924, Schweiz/Suisse/Svizzera/Svizra" building school 0.201 Schweiz/Suisse/Svizzera/Svizra FALSE
+university of neuchâtel ch Europe Western Europe FALSE 1 2021-02-03 239101899 way "HEP-BEJUNE, Rue du 1er-Août, La Chaux-de-Fonds, Neuchâtel, 2300, Schweiz/Suisse/Svizzera/Svizra" amenity university 0.101 Schweiz/Suisse/Svizzera/Svizra FALSE
+who regional office ch Europe Western Europe FALSE 1 2021-02-03 91298032 way "Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra" building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra FALSE
+wyss center ch Europe Western Europe FALSE 1 2021-02-03 115936808 way "Wyss, Bürglen (UR), Uri, 6463, Schweiz/Suisse/Svizzera/Svizra" highway unclassified 0.2 Schweiz/Suisse/Svizzera/Svizra FALSE
+institut pasteur cf Africa Middle Africa FALSE 1 2021-02-03 243797129 way "Institut Pasteur, Avenue de l'Indépendance, Bangî - Bangui, Ködörösêse tî Bêafrîka - République Centrafricaine" amenity hospital 0.201 Ködörösêse tî Bêafrîka - République Centrafricaine FALSE
+alima cd Africa Middle Africa FALSE 1 2021-02-03 11732216 node "Alima, Mambasa, Ituri, République démocratique du Congo" place village 0.375 République démocratique du Congo FALSE
+defense forces cd Africa Middle Africa FALSE 1 2021-02-03 62153208 node "Collège de Hautes Etudes de Stratégies de Défense Militaire, Avenue des Forces Armées, Haut Commandement, Gombe, Kinshasa, B.P 7955, République démocratique du Congo" amenity college 0.101 République démocratique du Congo FALSE
+gaw cd Africa Middle Africa FALSE 1 2021-02-03 53362850 node "Gaw, Bosobolo, Nord-Ubangi, République démocratique du Congo" place village 0.375 République démocratique du Congo FALSE
+itpr cd Africa Middle Africa FALSE 1 2021-02-03 76683548 node "Ministère des ITPR, Route T.P., Maniema, Tshopo, République démocratique du Congo" office administrative 0.101 République démocratique du Congo FALSE
+ab ca Americas Northern America FALSE 1 2021-02-03 257625587 relation "Alberta, Canada" boundary administrative 0.672431047420852 Canada FALSE
+acadia ca Americas Northern America FALSE 1 2021-02-03 505694 node "Acadia, Calgary, Alberta, T2J 1K6, Canada" place suburb 0.375 Canada FALSE
+acdc ca Americas Northern America FALSE 1 2021-02-03 119675282 way "ACDC, Area A (Egmont/Pender Harbour), Sunshine Coast Regional District, British Columbia, V0N 2H0, Canada" highway track 0.2 Canada FALSE
+ajax ca Americas Northern America FALSE 1 2021-02-03 258370273 relation "Ajax, Durham Region, Golden Horseshoe, Ontario, Canada" boundary administrative 0.542805933283467 Canada FALSE
+alberta energy ca Americas Northern America FALSE 1 2021-02-03 51904882 node "Alberta Energy, Bow River Pathway (South), Sunalta, Scarboro/Sunalta West, Calgary, Alberta, T3C 3N4, Canada" tourism artwork 0.201 Canada FALSE
+amos ca Americas Northern America FALSE 1 2021-02-03 259153297 relation "Amos, Abitibi, Abitibi-Témiscamingue, Québec, Canada" boundary administrative 0.541816779161739 Canada FALSE
+bay area rapid transit ca Americas Northern America FALSE 1 2021-02-03 259098950 relation "Deep Cove, District of North Vancouver, Metro Vancouver Regional District, British Columbia, Canada" natural bay 0.224193162948078 Canada FALSE
+bhp billiton ca Americas Northern America FALSE 1 2021-02-03 187584260 way "BHP Billiton, 130, 3rd Avenue South, Saskatoon, Saskatoon (city), Saskatchewan, S7K 1L3, Canada" office company 0.201 Canada FALSE
+biological sciences research council ca Americas Northern America FALSE 1 2021-02-03 61272197 node "NRC Institute for Biological Sciences, Lathe Drive, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1J 8B5, Canada" office government 0.401 Canada FALSE
+blandford ca Americas Northern America FALSE 1 2021-02-03 259301487 relation "Saint-Louis-de-Blandford, Arthabaska, Centre-du-Québec, Québec, G0Z 1B0, Canada" boundary administrative 0.511911570959931 Canada FALSE
+bmo financial group ca Americas Northern America FALSE 1 2021-02-03 132092034 way "BMO Financial Group, 2194, Lake Shore Boulevard West, Etobicoke—Lakeshore, Etobicoke, Toronto, Golden Horseshoe, Ontario, M8V 4C5, Canada" amenity bank 0.301 Canada FALSE
+bown ca Americas Northern America FALSE 1 2021-02-03 10036098 node "Bown, Bury, Le Haut-Saint-François, Estrie, Québec, Canada" place locality 0.225 Canada FALSE
+brigham ca Americas Northern America FALSE 1 2021-02-03 259057118 relation "Brigham, Brome-Missisquoi, Montérégie, Québec, J2K 4V6, Canada" boundary administrative 0.525122105808463 Canada FALSE
+brock university in st catharines ca Americas Northern America FALSE 1 2021-02-03 242595633 way "Brock University, John Macdonell Street, St. Catharines, Niagara Region, Golden Horseshoe, Ontario, L2V 4T7, Canada" amenity university 0.921862401245526 Canada FALSE
+cae ca Americas Northern America FALSE 1 2021-02-03 258158704 relation Canada boundary administrative 0.866125910965408 Canada FALSE
+calgary university in canada ca Americas Northern America FALSE 1 2021-02-03 15692968 node "University of Calgary Downtown Campus, 906, 8 Avenue SW, Connaught, Downtown West End, Calgary, Alberta, T2P 0P7, Canada" amenity university 0.301 Canada FALSE
+canadian association of university teachers in ottawa ca Americas Northern America FALSE 1 2021-02-03 64284898 node "Canadian Association of University Teachers, 2705, Queensview Drive, Britannia Heights, Bay, Ottawa, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K2B 6B7, Canada" office association 0.601 Canada FALSE
+canadian broadcasting corporation ca Americas Northern America FALSE 1 2021-02-03 129832260 way "Canadian Broadcasting Corporation, 181, Queen Street, Centretown, Somerset, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1P 1K9, Canada" building commercial 0.85799321708887 Canada FALSE
+canadian hydrogen intensity mapping experiment ca Americas Northern America FALSE 1 2021-02-03 210495198 way "Canadian Hydrogen Intensity Mapping Experiment, White Lake Trail - East, Area I (Skaha West/Kaleden/Apex), Regional District of Okanagan-Similkameen, British Columbia, V0H 1R4, Canada" man_made telescope 0.820054390558144 Canada FALSE
+canadian institute of health ca Americas Northern America FALSE 1 2021-02-03 75247073 node "Canadian National Institute of Health, 303, Dalhousie Street, Byward Market, Lowertown, Rideau-Vanier, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1N 7E5, Canada" office educational_institution 0.401 Canada FALSE
+canadian museum of history ca Americas Northern America FALSE 1 2021-02-03 119665756 way "Canadian Museum of History, 100, Rue Laurier, Hull, Gatineau, Gatineau (ville), Outaouais, Québec, K1A 0M8, Canada" tourism museum 0.781650158010506 Canada FALSE
+cancer research institute ca Americas Northern America FALSE 1 2021-02-03 84088132 way "Cancer Research Institute, O'Kill Street, Sydenham, Kingston, Eastern Ontario, Ontario, K7L 2V3, Canada" building university 0.301 Canada FALSE
+cargill ca Americas Northern America FALSE 1 2021-02-03 22319429 node "Cargill, Brockton, Bruce County, Southwestern Ontario, Ontario, Canada" place village 0.375 Canada FALSE
+center for medicine ca Americas Northern America FALSE 1 2021-02-03 191344626 way "Elmwood Court (Silvera for Seniors), 63 Street NW, Bowness, Calgary, Alberta, T3B 1S4, Canada" building yes 0.101 Canada FALSE
+centre for disease control ca Americas Northern America FALSE 1 2021-02-03 110832318 way "Center for Disease Control, 655, West 12th Avenue, Fairview, Vancouver, District of North Vancouver, Metro Vancouver Regional District, British Columbia, V5Z 4B4, Canada" building yes 0.301 Canada FALSE
+cftr ca Americas Northern America FALSE 1 2021-02-03 190485478 way "Centre de formation du transport routier (CFTR), Rue Maple Dale, East-Farnham, Brome-Missisquoi, Montérégie, Québec, J2K 3H8, Canada" amenity college 0.101 Canada FALSE
+cic ca Americas Northern America FALSE 1 2021-02-03 297969507 node "Isachsen Airport (abandoned), á•¿á‘á–…á‘–á“—á’ƒ Qikiqtaaluk Region, ᓄᓇᕗᑦ Nunavut, Canada" aeroway aerodrome 0.294548847777872 Canada FALSE
+cne ca Americas Northern America FALSE 1 2021-02-03 84394987 way "Exhibition Place, Old Toronto, Toronto, Golden Horseshoe, Ontario, M6K 3C3, Canada" place neighbourhood 0.415434381149213 Canada FALSE
+cochrane ca Americas Northern America FALSE 1 2021-02-03 149515 node "Cochrane, Town of Cochrane, Alberta, T4V 2A7, Canada" place town 0.494667642378454 Canada FALSE
+development research center ca Americas Northern America FALSE 1 2021-02-03 129466071 way "Defence Research and Development, 9, Defence Research and Development, Tufts Cove, Dartmouth, Halifax Regional Municipality, Halifax County, Nova Scotia, B3A 3C5, Canada" landuse military 0.4 Canada FALSE
+eastman ca Americas Northern America FALSE 1 2021-02-03 259058432 relation "Eastman, Memphrémagog, Estrie, Québec, Canada" boundary administrative 0.525926152527381 Canada FALSE
+eldonia ca Americas Northern America FALSE 1 2021-02-03 97793667 way "Eldonia Road, Kawartha Lakes, Central Ontario, Ontario, K0M 1B0, Canada" highway residential 0.2 Canada FALSE
+environment canada ca Americas Northern America FALSE 1 2021-02-03 154537614 way "355, Environment Canada, Gloucester, Ottawa, Eastern Ontario, Ontario, Canada" landuse commercial 0.662784569703518 Canada FALSE
+fisheries and oceans canada ca Americas Northern America FALSE 1 2021-02-03 75914304 node "Fisheries and Oceans Canada, John Yeo Drive, City of Charlottetown, Queens County, Prince Edward Island, C1E 3H6, Canada" office government 0.401 Canada FALSE
+free university ca Americas Northern America FALSE 1 2021-02-03 308046 node "Free Times Cafe, 320, College Street, Kensington Market, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5T 1S3, Canada" amenity pub 0.341913844040538 Canada FALSE
+free university of ca Americas Northern America FALSE 1 2021-02-03 308046 node "Free Times Cafe, 320, College Street, Kensington Market, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5T 1S3, Canada" amenity pub 0.341913844040538 Canada FALSE
+fripon ca Americas Northern America FALSE 1 2021-02-03 111997105 way "Lac Fripon, Lac-Saint-Charles, La Haute-Saint-Charles, Québec, Québec (Agglomération), Capitale-Nationale, Québec, Canada" natural water 0.3 Canada FALSE
+general administration of press ca Americas Northern America FALSE 1 2021-02-03 12545243 node "Press, Senneterre (ville), La Vallée-de-l'Or, Abitibi-Témiscamingue, Québec, Canada" place locality 0.225 Canada FALSE
+genome canada ca Americas Northern America FALSE 1 2021-02-03 48279568 node "Genome Dx, 1038, Homer Street, Yaletown, Downtown, Vancouver, District of North Vancouver, Metro Vancouver Regional District, British Columbia, V6B 2W9, Canada" place house 0.201 Canada FALSE
+geological survey of canada ca Americas Northern America FALSE 1 2021-02-03 94424539 way "Geological Survey of Canada, 32 Avenue NW, University Heights, Calgary, Alberta, T2L 2A6, Canada" building yes 0.401 Canada FALSE
+george brown college ca Americas Northern America FALSE 1 2021-02-03 138263548 way "George Brown College, Richmond Street East, Moss Park, Toronto Centre, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5A 4T7, Canada" building yes 0.301 Canada FALSE
+george institute ca Americas Northern America FALSE 1 2021-02-03 100163330 way "George Harvey Collegiate Institute, 1700, Keele Street, Keelesdale, York South—Weston, York, Toronto, Golden Horseshoe, Ontario, M6M 3W5, Canada" amenity school 0.528965278593994 Canada FALSE
+global ca Americas Northern America FALSE 1 2021-02-03 99949181 way "Global, 81, Barber Greene Road, Don Mills, Don Valley East, North York, Toronto, Golden Horseshoe, Ontario, M3C 2C3, Canada" building office 0.586522779384239 Canada FALSE
+group of seven and group ca Americas Northern America FALSE 1 2021-02-03 175104701 way "Group of Seven burial site, Kleinburg, Vaughan, York Region, Golden Horseshoe, Ontario, Canada" landuse cemetery 0.6 Canada FALSE
+iogen ca Americas Northern America FALSE 1 2021-02-03 191517666 way "Iogen, 300, Lindbergh Private, River, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1V 1H7, Canada" building yes 0.101 Canada FALSE
+iris ca Americas Northern America FALSE 1 2021-02-03 296781846 relation "Iris, Kings County, Prince Edward Island, Canada" boundary administrative 0.45 Canada FALSE
+jubilee south ca Americas Northern America FALSE 1 2021-02-03 259354642 relation "Jubilee, Municipality of Victoria County, Victoria County, Nova Scotia, Canada" boundary administrative 0.45 Canada FALSE
+kenn borek air ca Americas Northern America FALSE 1 2021-02-03 113538653 way "Kenn Borek Air Ltd, George Craig Boulevard NE, Pegasus, Calgary, Alberta, T2E 8A5, Canada" building hangar 0.301 Canada FALSE
+knox college ca Americas Northern America FALSE 1 2021-02-03 257189631 relation "Knox College, 59, St George Street, Discovery District, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5T 2Z9, Canada" building university 0.526239076957718 Canada FALSE
+laurentian university ca Americas Northern America FALSE 1 2021-02-03 1347802 node "Laurentian University, University Road, Greater Sudbury, Sudbury District, Northeastern Ontario, Ontario, P3E 2C6, Canada" amenity university 0.636203186595559 Canada FALSE
+ligado networks ca Americas Northern America FALSE 1 2021-02-03 67108376 node "Ligado Networks, 1601, Telesat Court, Beacon Hill-Cyrville, Gloucester, Ottawa, Eastern Ontario, Ontario, K1B 1B1, Canada" office telecommunication 0.201 Canada FALSE
+mcgill university health centre ca Americas Northern America FALSE 1 2021-02-03 113003796 way "MUHC - McGill University Health Centre, Rue Saint-Jacques, Upper Lachine, Côte-des-Neiges–Notre-Dame-de-Grâce, Montréal, Agglomération de Montréal, Montréal (06), Québec, H4C 3C8, Canada" amenity hospital 0.401 Canada FALSE
+mclaren ca Americas Northern America FALSE 1 2021-02-03 22469926 node "McLaren, Eldon No. 471, Saskatchewan, Canada" place locality 0.225 Canada FALSE
+mcmurdo ca Americas Northern America FALSE 1 2021-02-03 222662 node "McMurdo, Area A (Kicking Horse/Kinbasket Lake), Columbia-Shuswap Regional District, British Columbia, V0A 1H7, Canada" place locality 0.225 Canada FALSE
+memorial university ca Americas Northern America FALSE 1 2021-02-03 47197396 node "Queen's College Sign, Long Pond Trail, Memorial University of Newfoundland main campus, St. John's, Newfoundland, Newfoundland and Labrador, A1B 3P7, Canada" tourism information 0.201 Canada FALSE
+mount allison university ca Americas Northern America FALSE 1 2021-02-03 94182360 way "Mount Allison University, Main Street, Sackville, Sackville Parish, Westmorland County, New Brunswick / Nouveau-Brunswick, E4L 4B5, Canada" amenity university 0.301 Canada FALSE
+mount royal university ca Americas Northern America FALSE 1 2021-02-03 87665637 way "Mount Royal University, Richard Road SW, Lincoln Park, Calgary, Alberta, T3E 6L1, Canada" amenity university 0.683999520860011 Canada FALSE
+national research council canada ca Americas Northern America FALSE 1 2021-02-03 259257626 relation "1191, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, Canada" landuse commercial 0.81890455386909 Canada FALSE
+national research nuclear university ca Americas Northern America FALSE 1 2021-02-03 104901648 way "National High Field Nuclear Magnetic Resonance Centre (NANUC), 87 Avenue NW, University of Alberta Neighbourhood, Greater Strathcona, Edmonton, Edmonton (city), Alberta, T6G, Canada" building university 0.301 Canada FALSE
+natural science ca Americas Northern America FALSE 1 2021-02-03 208925680 way "Natural Science, London, Southwestern Ontario, Ontario, N6G 2V4, Canada" highway platform 0.3 Canada FALSE
+nova university ca Americas Northern America FALSE 1 2021-02-03 174886043 way "Public Archives of Nova Scotia, 6016, University Avenue, Marlborough Woods, Halifax, Halifax Regional Municipality, Halifax County, Nova Scotia, B3H 4R2, Canada" tourism museum 0.498071657967153 Canada FALSE
+nrc herzberg ca Americas Northern America FALSE 1 2021-02-03 258668279 relation "NRC Herzberg Institute of Astrophysics, Observatory Road, Saanich, Capital Regional District, British Columbia, V9E 2E7, Canada" building yes 0.201 Canada FALSE
+nrc herzberg institute of astrophysics ca Americas Northern America FALSE 1 2021-02-03 258668279 relation "NRC Herzberg Institute of Astrophysics, Observatory Road, Saanich, Capital Regional District, British Columbia, V9E 2E7, Canada" building yes 0.501 Canada FALSE
+nsf international ca Americas Northern America FALSE 1 2021-02-03 209845746 way "NSF International, 125, Chancellors Way, Edinburgh Village, Guelph, Southwestern Ontario, Ontario, N1G 5K1, Canada" building commercial 0.201 Canada FALSE
+nunavut court of justice ca Americas Northern America FALSE 1 2021-02-03 161170401 way "Nunavut Court of Justice, 510, ᑲá–<8f>á–…, á<90>ƒá–ƒá“—á<90>ƒá‘¦, ᓄᓇᕗᑦ Nunavut, X0A 0H0, Canada" building Office_Building 0.401 Canada FALSE
+ontario ministry of agriculture ca Americas Northern America FALSE 1 2021-02-03 106392829 way "Ontario Ministry of Agriculture, 59, Ministry Drive, Former Kemptville College, Kemptville, North Grenville, Leeds and Grenville Counties, Eastern Ontario, Ontario, K0G 1J0, Canada" office government 0.401 Canada FALSE
+ontario ministry of natural resources ca Americas Northern America FALSE 1 2021-02-03 244730689 way "Ontario Ministry of Natural Resources, Water Street, Downtown Peterborough, Peterborough, Central Ontario, Ontario, K9J 2T6, Canada" office government 0.501 Canada FALSE
+pineapple express ca Americas Northern America FALSE 1 2021-02-03 176947657 way "Pineapple Express, Area F (West Howe Sound), Sunshine Coast Regional District, British Columbia, V0N 1V7, Canada" highway path 0.275 Canada FALSE
+polar environment atmospheric research laboratory ca Americas Northern America FALSE 1 2021-02-03 226391941 way "Polar Environment Atmospheric Research Laboratory, Eureka, á•¿á‘á–…á‘–á“—á’ƒ Qikiqtaaluk Region, ᓄᓇᕗᑦ Nunavut, Canada" office research 0.501 Canada FALSE
+polytechnique montreal ca Americas Northern America FALSE 1 2021-02-03 76938927 node "Polytechnique Montréal, 2500, Chemin de Polytechnique, Édouard-Montpetit, Côte-des-Neiges–Notre-Dame-de-Grâce, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3T 1J4, Canada" amenity university 0.101 Canada FALSE
+population health research institute ca Americas Northern America FALSE 1 2021-02-03 132818887 way "Population Health Research Institute, 237, Copeland Avenue, Beasley, Hamilton, Golden Horseshoe, Ontario, L8L 2X2, Canada" building yes 0.401 Canada FALSE
+prince edward island ca Americas Northern America FALSE 1 2021-02-03 258567254 relation "Prince Edward Island, Canada" place island 0.893570880226373 Canada FALSE
+public health canada ca Americas Northern America FALSE 1 2021-02-03 76182419 node "Public Health, Mivvik Avenue, ᑲá–<8f>á•¿á“‚á–… Rankin inlet / Kangiqtiniq, ᑲá–<8f>á•¿á“‚á–… Rankin Inlet, á‘ᕙᓪᓕᖅ Kivalliq Region, ᓄᓇᕗᑦ Nunavut, Canada" amenity clinic 0.301 Canada FALSE
+research and innovation ca Americas Northern America FALSE 1 2021-02-03 232469918 way "Research Innovation, Christie Lane, Guelph, Southwestern Ontario, Ontario, N1G 0A9, Canada" building university 0.201 Canada FALSE
+research in motion ca Americas Northern America FALSE 1 2021-02-03 99144888 way "Scotiabank, Mississauga, Peel Region, Golden Horseshoe, Ontario, Canada" landuse commercial 0.2 Canada FALSE
+royal navy ca Americas Northern America FALSE 1 2021-02-03 89924668 way "Royal Military College, Navy Way, Kingston, Eastern Ontario, Ontario, K7K 7B4, Canada" amenity university 0.651709632190723 Canada FALSE
+royal roads university ca Americas Northern America FALSE 1 2021-02-03 258736258 relation "Royal Roads University, 2005, Sooke Road, Colwood, Capital Regional District, British Columbia, V9B 5Y2, Canada" amenity university 0.681016725925367 Canada FALSE
+saint mary's university ca Americas Northern America FALSE 1 2021-02-03 84577948 way "St Mary's University, Robie Street, Marlborough Woods, Halifax, Halifax Regional Municipality, Halifax County, Nova Scotia, B3H 3B4, Canada" amenity university 0.713959851504786 Canada FALSE
+saskatchewan university ca Americas Northern America FALSE 1 2021-02-03 171622787 way "Saskatchewan Drive NW, River Valley Walterdale, Greater Strathcona, Edmonton, Edmonton (city), Alberta, T6G 2G9, Canada" highway tertiary 0.2 Canada FALSE
+scarbo ca Americas Northern America FALSE 1 2021-02-03 258831502 relation "Scarbo Lake, Unorganized North Algoma, Algoma District, Northeastern Ontario, Ontario, Canada" natural water 0.3 Canada FALSE
+shellard ca Americas Northern America FALSE 1 2021-02-03 133044417 way "Shellard Forest, Brantford, Southwestern Ontario, Ontario, Canada" landuse forest 0.3 Canada FALSE
+south florida shark club ca Americas Northern America FALSE 1 2021-02-03 198593200 way "Shark Club, West Hunt Club Road, Knoxdale-Merivale, Nepean, Ottawa, Eastern Ontario, Ontario, K2E 0B7, Canada" amenity restaurant 0.201 Canada FALSE
+southern hemisphere ca Americas Northern America FALSE 1 2021-02-03 77358035 node "Southern Hemisphere, 5251, Oak Street, South Cambie, Vancouver, District of North Vancouver, Metro Vancouver Regional District, British Columbia, V6M, Canada" leisure garden 0.201 Canada FALSE
+st. francis xavier university in antigonish ca Americas Northern America FALSE 1 2021-02-03 120193265 way "St. Francis Xavier University, 5005, Chapel Square, Antigonish, Town of Antigonish, Municipality of the County of Antigonish, Nova Scotia, B2G 2W5, Canada" amenity university 0.918973378442822 Canada FALSE
+sustainable forestry initiative ca Americas Northern America FALSE 1 2021-02-03 65825393 node "Sustainable Forestry Initiative, 1306, Wellington Street West, Wellington Village Shopping Area, Hintonburg, Kitchissippi, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1Y 3A8, Canada" office association 0.301 Canada FALSE
+tb drug development ca Americas Northern America FALSE 1 2021-02-03 6242511 node "Shoppers Drug Mart, 8th Street East, Grosvenor Park, Nutana Suburban Development Area, Saskatoon, Saskatoon (city), Saskatchewan, S7H 5J6, Canada" amenity pharmacy 0.201 Canada FALSE
+universities canada ca Americas Northern America FALSE 1 2021-02-03 123425762 way "Ontario Universities' Application Centre, Research Lane, Research Park, Guelph, Southwestern Ontario, Ontario, N1H 8J7, Canada" building office 0.201 Canada FALSE
+university health network ca Americas Northern America FALSE 1 2021-02-03 117777424 way "London Hall, Western Road, London, Southwestern Ontario, Ontario, N6G 5K8, Canada" amenity university 0.001 Canada FALSE
+university of northern british columbia ca Americas Northern America FALSE 1 2021-02-03 189703056 way "University of Northern British Columbia, Residence Court, Prince George, Regional District of Fraser-Fort George, British Columbia, V2N 4Z9, Canada" amenity university 0.878415816823755 Canada FALSE
+university of quebec ca Americas Northern America FALSE 1 2021-02-03 113982632 way "Concordia University (SGW Campus), Rue Saint-Mathieu, Montagne, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3H 2P4, Canada" amenity university 0.592769930727231 Canada FALSE
+university of saskatchewan ca Americas Northern America FALSE 1 2021-02-03 188955577 way "University of Saskatchewan, 33rd Street East, Saskatoon, Saskatoon (city), Saskatchewan, S7K 3H9, Canada" amenity university 0.789594387429839 Canada FALSE
+uwc ca Americas Northern America FALSE 1 2021-02-03 259171836 relation "Pearson College UWC, Pearson College Drive, Metchosin, Capital Regional District, British Columbia, V9C 4H1, Canada" amenity college 0.382582546755277 Canada FALSE
+victoria university ca Americas Northern America FALSE 1 2021-02-03 57466240 node "Victoria University, Charles Street West, Bloor Street Culture Corridor, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5S 1S3, Canada" tourism information 0.201 Canada FALSE
+viking ca Americas Northern America FALSE 1 2021-02-03 225115 node "Viking, Town of Viking, Alberta, T0B 4N0, Canada" place town 0.4 Canada FALSE
+zealandia ca Americas Northern America FALSE 1 2021-02-03 296584586 relation "Zealandia, Saskatchewan, Canada" boundary administrative 0.55 Canada FALSE
+chan hol bz Americas Central America FALSE 1 2021-02-03 296831087 node "Hol Chan Vista, Boca Ciega, San Pedro Town, Belize District, BELIZE, Belize" place neighbourhood 0.45 Belize FALSE
+national university of cordoba bz Americas Central America FALSE 1 2021-02-03 46348836 node "National, George Price Highway, Saint Martin de Porres, Belize City, Belize District, 1021, Belize" office yes 0.101 Belize FALSE
+national university of córdoba bz Americas Central America FALSE 1 2021-02-03 46348836 node "National, George Price Highway, Saint Martin de Porres, Belize City, Belize District, 1021, Belize" office yes 0.101 Belize FALSE
+san francisco public utilities commission bz Americas Central America FALSE 1 2021-02-03 154587331 way "Public Utilities Commission, 41, Gabourel Lane, Fort George, King's Park, Belize City, Belize District, SUITE 205, Belize" office government 0.301 Belize FALSE
+cna by Europe Eastern Europe FALSE 1 2021-02-03 259097233 relation "Цна, СмолевичÑ<81>кий район, МинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, 211736, БеларуÑ<81>ÑŒ" waterway river 0.3 БеларуÑ<81>ÑŒ FALSE
+executive committee by Europe Eastern Europe FALSE 1 2021-02-03 94968267 way "МингориÑ<81>полком, 8, проÑ<81>пект Ð<9d>езавиÑ<81>имоÑ<81>ти, РомановÑ<81>каÑ<8f> Слобода, МоÑ<81>ковÑ<81>кий район, МинÑ<81>к, 220030, БеларуÑ<81>ÑŒ" office government 0.0854406477123641 БеларуÑ<81>ÑŒ FALSE
+kfc by Europe Eastern Europe FALSE 1 2021-02-03 84378852 node "KFC, 5, улица Петра Глебки, Тивали, Медвежино, ФрунзенÑ<81>кий район, МинÑ<81>к, 220121, БеларуÑ<81>ÑŒ" amenity fast_food 0.636510016719008 БеларуÑ<81>ÑŒ FALSE
+new journal of physics by Europe Eastern Europe FALSE 1 2021-02-03 72965668 node "Инженерно-физичеÑ<81>кий журнал, 38, улица Платонова, ПервомайÑ<81>кий район, МинÑ<81>к, 220023, БеларуÑ<81>ÑŒ" office newspaper 0.001 БеларуÑ<81>ÑŒ FALSE
+center for applied research bw Africa Southern Africa FALSE 1 2021-02-03 37633699 node "Centre for Applied Research, 74769, P G Matante Drive, Central Business District, Gaborone, South-East District, 502733, Botswana" office company 0.301 Botswana FALSE
+bhutan bt Asia Southern Asia FALSE 1 2021-02-03 257894181 relation འབྲུག་ཡུལ་ boundary administrative 0.658755532801197 འབྲུག་ཡུལ་ FALSE
+admx br Americas South America FALSE 1 2021-02-03 68823596 node "Adrenalina - ADMX, 1590, Rua João Negrão, Rebouças, Vila Torres, Curitiba, Região Geográfica Imediata de Curitiba, Região Metropolitana de Curitiba, Região Geográfica Intermediária de Curitiba, Paraná, Região Sul, 80230-150, Brasil" shop motorcycle_repair 0.101 Brasil FALSE
+aeta br Americas South America FALSE 1 2021-02-03 257664729 relation "Araçatuba, Região Imediata de Araçatuba, Região Geográfica Intermediária de Araçatuba, São Paulo, Região Sudeste, Brasil" boundary administrative 0.527221804640549 Brasil FALSE
+artemis br Americas South America FALSE 1 2021-02-03 258436873 relation "Artemis, Piracicaba, Região Imediata de Piracicaba, Região Geográfica Intermediária de Campinas, São Paulo, Região Sudeste, Brasil" boundary administrative 0.4 Brasil FALSE
+bayer cropscience br Americas South America FALSE 1 2021-02-03 252681789 way "Bayer CropScience, São Sebastião, Paracatu, Microrregião Paracatu, Região Geográfica Intermediária de Patos de Minas, Minas Gerais, Região Sudeste, Brasil" landuse industrial 0.4 Brasil FALSE
+biomed central 1 br Americas South America FALSE 1 2021-02-03 53650511 node "BioMed, 761, Rua Venâncio Aires, Centro Histórico, Centro, Cruz Alta, Região Geográfica Imediata de Cruz Alta, Região Geográfica Intermediária de Passo Fundo, Rio Grande do Sul, Região Sul, 98005-020, Brasil" shop yes 0.201 Brasil FALSE
+blm br Americas South America FALSE 1 2021-02-03 257895089 relation "Belém, Região Geográfica Imediata de Belém, Região Geográfica Intermediária de Belém, Pará, Região Norte, Brasil" boundary administrative 0.560480042057943 Brasil FALSE
+brazilian federal police br Americas South America FALSE 1 2021-02-03 66249623 node "Presidency of the Brazilian Republic, N1 Leste, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70000-000, Brasil" office government 0.201 Brasil FALSE
+brazilian space agency br Americas South America FALSE 1 2021-02-03 121542097 way "Agência Espacial Brasileira, Acesso Coberto, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70660655, Brasil" office government 0.001 Brasil FALSE
+business ethanol br Americas South America FALSE 1 2021-02-03 60782840 node "Ethanol, Rua Mármore, Santa Tereza, Regional Leste, Belo Horizonte, Microrregião Belo Horizonte, Região Metropolitana de Belo Horizonte, Minas Gerais, Região Sudeste, 31010-230, Brasil" amenity pub 0.101 Brasil FALSE
+cabo frio br Americas South America FALSE 1 2021-02-03 258346198 relation "Cabo Frio, Região Geográfica Imediata de Cabo Frio, Região Geográfica Intermediária de Macaé-Rio das Ostras-Cabo Frio, Rio de Janeiro, Região Sudeste, Brasil" boundary administrative 0.677953726983006 Brasil FALSE
+cdu/csu br Americas South America FALSE 1 2021-02-03 92204695 way "Carandiru, 2487, Avenida Cruzeiro do Sul, Santana, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 02031-000, Brasil" railway station 0.343659122005759 Brasil FALSE
+confap br Americas South America FALSE 1 2021-02-03 3453158 node "Confap, Comodoro, Microrregião de Parecis, Região Geográfica Intermediária de Cáceres, Mato Grosso, Região Centro-Oeste, Brasil" place hamlet 0.35 Brasil FALSE
+csu br Americas South America FALSE 1 2021-02-03 160040000 way "Aeroporto de Santa Cruz do Sul, Avenida Prefeito Orlando Oscár Baumhardt, Linha Santa Cruz, Sede Municipal, Santa Cruz do Sul, Região Geográfica Imediata de Santa Cruz do Sul, Região Geográfica Intermediária de Santa Cruz do Sul - Lajeado, Rio Grande do Sul, Região Sul, 96820-290, Brasil" aeroway aerodrome 0.275949010675047 Brasil FALSE
+eca br Americas South America FALSE 1 2021-02-03 126584998 way "Escola de Comunicações e Artes, 443, Avenida Professor Lúcio Martins Rodrigues, Butantã, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05508-010, Brasil" amenity college 0.365781769297865 Brasil FALSE
+el universal br Americas South America FALSE 1 2021-02-03 45711233 node "Universal, Branquinha, Espigão, Viamão, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 94460-530, Brasil" place neighbourhood 0.35 Brasil FALSE
+etec br Americas South America FALSE 1 2021-02-03 228049262 way "ETEC, Val-de-Cães, Entroncamento, Belém, Região Geográfica Imediata de Belém, Região Geográfica Intermediária de Belém, Pará, Região Norte, Brasil" landuse industrial 0.3 Brasil FALSE
+federal university of espirito santo br Americas South America FALSE 1 2021-02-03 190158758 way "Universidade Federal do EspÃrito Santo, 514, Avenida Fernando Ferrari, Mata da Praia, Goiabeiras, Vitória, Região Geográfica Imediata de Vitória, Região Metropolitana da Grande Vitória, Região Geográfica Intermediária de Vitória, EspÃrito Santo, Região Sudeste, 29075-910, Brasil" amenity university 0.596675389924706 Brasil FALSE
+federal university of paraná br Americas South America FALSE 1 2021-02-03 159113576 way "UTFPR - Universidade Tecnológica Federal do Paraná, 330, Rua Doutor Washington Subtil Chueire, Jardim Carvalho, Ponta Grossa, Região Geográfica Imediata de Ponta Grossa, Região Geográfica Intermediária de Ponta Grossa, Paraná, Região Sul, 84017-220, Brasil" amenity university 0.611447002935904 Brasil FALSE
+federal university of santa catarina br Americas South America FALSE 1 2021-02-03 258910798 relation "Universidade Federal da Fronteira Sul, Rodovia Balseiros do Rio Uruguai, Mezomo, Distrito Sede de Guatambu, Guatambu, Região Geográfica Imediata de Chapecó, Região Geográfica Intermediária de Chapecó, Santa Catarina, Região Sul, 89815-899, Brasil" amenity university 0.625302870611459 Brasil FALSE
+federal university of são carlos br Americas South America FALSE 1 2021-02-03 131256389 way "UNIVASF - Campus Juazeiro, 510, Avenida Antônio Carlos Magalhaes, Bairro Alto da Maravilha, Bairro Maringa, Juazeiro, Microrregião de Juazeiro, BR, Região Geográfica Intermediária de Juazeiro, Bahia, Região Nordeste, 48902-300, Brasil" amenity university 0.469728853996096 Brasil FALSE
+federal university of são paulo br Americas South America FALSE 1 2021-02-03 160694761 way "Universidade Federal do ABC, Campus São Bernardo do Campo, S/N, Alameda da Universidade, Parque Anchieta, Anchieta, São Bernardo do Campo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 09606-045, Brasil" amenity university 0.679989495490236 Brasil FALSE
+federal university of uberlândia br Americas South America FALSE 1 2021-02-03 128423073 way "Universidade Federal de Uberlândia - Campus Educa, Rua Ana Carneiro, Nossa Senhora Aparecida, Setor Central, Uberlândia, Microrregião Uberlândia, Região Geográfica Intermediária de Uberlândia, Minas Gerais, Região Sudeste, 38405-142, Brasil" amenity university 0.201 Brasil FALSE
+hifi br Americas South America FALSE 1 2021-02-03 83900249 node "Hifi, Avenida Manoel Dias da Silva, Pituba, Salvador, Região Geográfica Imediata de Salvador, Região Metropolitana de Salvador, Região Geográfica Intermediária de Salvador, Bahia, Região Nordeste, 41810-225, Brasil" shop hifi 0.101 Brasil FALSE
+ico br Americas South America FALSE 1 2021-02-03 258073026 relation "Icó, Microrregião de Iguatu, Região Geográfica Intermediária de Iguatu, Ceará, Região Nordeste, 63430-000, Brasil" boundary administrative 0.459452277129228 Brasil FALSE
+isad br Americas South America FALSE 1 2021-02-03 71911703 node "ISAD, 542, Rua José do PatrocÃnio, São Pedro, Governador Valadares, Microrregião Governador Valadares, Região Geográfica Intermediária de Governador Valadares, Minas Gerais, Região Sudeste, 35020-280, Brasil" amenity place_of_worship 0.101 Brasil FALSE
+itp br Americas South America FALSE 1 2021-02-03 10615106 node "Aeroporto Regional de Itaperuna Ernani do Amaral Peixoto, Avenida Ernani do Amaral Peixoto, Itaperuna, Região Geográfica Imediata de Itaperuna, Região Geográfica Intermediária de Campos dos Goytacazes, Rio de Janeiro, Região Sudeste, 28300-000, Brasil" aeroway aerodrome 0.181472839091896 Brasil FALSE
+itu br Americas South America FALSE 1 2021-02-03 257754909 relation "Itu, Região Imediata de Sorocaba, Região Metropolitana de Sorocaba, Região Geográfica Intermediária de Sorocaba, São Paulo, Região Sudeste, Brasil" boundary administrative 0.621055921429882 Brasil FALSE
+museum of natural sciences br Americas South America FALSE 1 2021-02-03 139974775 way "Museu de Ciências Naturais, 1427, Rua Doutor Salvador França, Jardim Botânico, Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 90690-000, Brasil" tourism museum 0.256321943137092 Brasil FALSE
+national health surveillance agency br Americas South America FALSE 1 2021-02-03 70330829 node "Agência Nacional de Vigilância Sanitária, 3000, Avenida Senador Carlos Jereissati, Aeroporto, Fortaleza, Microrregião de Fortaleza, Região Geográfica Intermediária de Fortaleza, Ceará, Região Nordeste, 60741-200, Brasil" office government 0.001 Brasil FALSE
+ossos br Americas South America FALSE 1 2021-02-03 59989122 node "Ossos, Centro, Armação dos Búzios, Região Geográfica Imediata de Cabo Frio, Região Geográfica Intermediária de Macaé-Rio das Ostras-Cabo Frio, Rio de Janeiro, Região Sudeste, 28950-000, Brasil" place quarter 0.35 Brasil FALSE
+petrobras br Americas South America FALSE 1 2021-02-03 111587897 way "Petrobras, Aruanda, Aracaju, Região Geográfica Imediata de Aracaju, Região Geográfica Intermediária de Aracaju, Sergipe, Região Nordeste, Brasil" landuse industrial 0.625082792846645 Brasil FALSE
+pmdb br Americas South America FALSE 1 2021-02-03 235391112 way "PMDB, Avenida Pátria, Formosa / Maria Regina, Alvorada, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 94814-510, Brasil" office political_party 0.101 Brasil FALSE
+porto alegre br Americas South America FALSE 1 2021-02-03 258417526 relation "Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, Brasil" boundary administrative 0.833208007806445 Brasil FALSE
+prata br Americas South America FALSE 1 2021-02-03 257892156 relation "Nova Prata, Região Geográfica Imediata de Nova Prata - Guaporé, Região Geográfica Intermediária de Caxias do Sul, Rio Grande do Sul, Região Sul, 95320-000, Brasil" boundary administrative 0.583724566403079 Brasil FALSE
+regional university of cariri br Americas South America FALSE 1 2021-02-03 23600017 node "Universidade Regional do Cariri - URCA, 1161, Rua Coronel Antônio Luiz, Pimenta, Crato, Microrregião de Cariri, Região Geográfica Intermediária de Juazeiro do Norte, Ceará, Região Nordeste, 63100-000, Brasil" amenity university 0.539805842395376 Brasil FALSE
+sci-hub br Americas South America FALSE 1 2021-02-03 168984790 way "Sport Club Internacional, 891, Avenida Padre Cacique, Praia de Belas, Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 90810-240, Brasil" leisure sports_centre 0.512779160464413 Brasil FALSE
+siberian branch br Americas South America FALSE 1 2021-02-03 48916343 node "Siberian, 1540, Avenida Coronel Fernando Ferreira Leite, Jardim Califórnia, Ribeirão Preto, Região Imediata de Ribeirão Preto, Região Metropolitana de Ribeirão Preto, Região Geográfica Intermediária de Ribeirão Preto, São Paulo, Região Sudeste, 14026-020, Brasil" shop clothes 0.101 Brasil FALSE
+ssri br Americas South America FALSE 1 2021-02-03 209994140 way "Ilhota dos Coqueiros, Avenida Beira Mar, Salvador, Região Geográfica Imediata de Salvador, Região Metropolitana de Salvador, Região Geográfica Intermediária de Salvador, Bahia, Região Nordeste, Brasil" aeroway helipad 0.001 Brasil FALSE
+state university of maringá br Americas South America FALSE 1 2021-02-03 121913292 way "Universidade Estadual de Maringá, 5790, Avenida Colombo, Jardim Ipiranga, Zona 09, Maringá, Região Geográfica Imediata de Maringá, Região Geográfica Intermediária de Maringá, Paraná, Região Sul, 87020-900, Brasil" amenity university 0.478149585742943 Brasil FALSE
+supreme federal court br Americas South America FALSE 1 2021-02-03 101158663 way "Supremo Tribunal Federal, S2 Leste, Setor de Autarquias Sul, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70046900, Brasil" amenity courthouse 0.58051510608517 Brasil FALSE
+syngenta seeds br Americas South America FALSE 1 2021-02-03 159731731 way "Syngenta Seeds, Formosa, Microrregião do Entorno de BrasÃlia, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária de Luziânia-Ã<81>guas Lindas de Goiás, Goiás, Região Centro-Oeste, Brasil" landuse industrial 0.4 Brasil FALSE
+tgf br Americas South America FALSE 1 2021-02-03 28625398 node "TGF, Rua ComandaÃ, Centro, Santa Rosa, Região Geográfica Imediata de Santa Rosa, Região Geográfica Intermediária de Ijui, Rio Grande do Sul, Região Sul, Brasil" office financial 0.101 Brasil FALSE
+tmd br Americas South America FALSE 1 2021-02-03 50056220 node "TamanduateÃ, Rua Guamiranga, Vila Prudente, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 03153-001, Brasil" railway station 0.368648909480289 Brasil FALSE
+tupperware br Americas South America FALSE 1 2021-02-03 163507943 way "Tupperware, Guaratiba, Zona Oeste do Rio de Janeiro, Rio de Janeiro, Região Geográfica Imediata do Rio de Janeiro, Região Metropolitana do Rio de Janeiro, Região Geográfica Intermediária do Rio de Janeiro, Rio de Janeiro, Região Sudeste, Brasil" landuse industrial 0.3 Brasil FALSE
+ucb br Americas South America FALSE 1 2021-02-03 150896841 way "Universidade Católica de BrasÃlia, W5 Norte / SGAN 916, HCGN 716, Setor Noroeste, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70770-535, Brasil" amenity university 0.348376470606964 Brasil FALSE
+unifesp br Americas South America FALSE 1 2021-02-03 138935040 way "UNIFESP, Rua Jorge Chamas, Vila Clementino, Vila Mariana, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 04015-051, Brasil" amenity university 0.549107677186954 Brasil FALSE
+university of mato grosso br Americas South America FALSE 1 2021-02-03 194788101 way "Instituto Federal de Mato Grosso, Campus Lucas do Rio Verde, 1600W, Avenida Universitária, Parque das Emas, Lucas do Rio Verde, Microrregião de Alto Teles Pires, Região Geográfica Intermediária de Sinop, Mato Grosso, Região Centro-Oeste, 78455000, Brasil" amenity university 0.201 Brasil FALSE
+university of são paolo br Americas South America FALSE 1 2021-02-03 71037590 node "polo do curso de licenciatura em ciencias, Rua Prof. Polycarpo do Amaral, São Dimas, Piracicaba, Região Imediata de Piracicaba, Região Geográfica Intermediária de Campinas, São Paulo, Região Sudeste, 13416-230, Brasil" amenity university 0.201 Brasil FALSE
+ayoreo bo Americas South America FALSE 1 2021-02-03 54221446 node "Ayoreo, Puerto Suárez, Germán Busch, Santa Cruz, Bolivia" place hamlet 0.35 Bolivia FALSE
+first department bo Americas South America FALSE 1 2021-02-03 51887484 node "First, Calle Arenales, Santa Cruz de la Sierra, Municipio Santa Cruz de la Sierra, Provincia Andrés Ibáñez, Santa Cruz, 3212, Bolivia" shop jewelry 0.101 Bolivia FALSE
+los angeles police department bo Americas South America FALSE 1 2021-02-03 193771011 way "Los Angeles, Provincia Warnes, Santa Cruz, Bolivia" place village 0.475 Bolivia FALSE
+pluspetrol bo Americas South America FALSE 1 2021-02-03 62171848 node "Pluspetrol, Calle Las Palmas, Mac Petrol, Santa Cruz de la Sierra, Municipio Santa Cruz de la Sierra, Provincia Andrés Ibáñez, Santa Cruz, 2236, Bolivia" office company 0.101 Bolivia FALSE
+bermuda institute of ocean sciences bm Americas Northern America FALSE 1 2021-02-03 134000033 way "Bermuda Institute of Ocean Sciences, Biological Station, Saint George's, GE03, Bermuda" amenity university 0.787418940697571 Bermuda FALSE
+lter bg Europe Eastern Europe FALSE 1 2021-02-03 46481769 node "@лма @лтер, 15, бул. Цар ОÑ<81>вободител, ж.к. Яворов, Средец, Столична, СофиÑ<8f>-град, 1504, БългaриÑ<8f>" amenity theatre 0.23461374284578 БългaриÑ<8f> FALSE
+orela bg Europe Eastern Europe FALSE 1 2021-02-03 151202736 way "Орела, кв. Момина банÑ<8f>, ХиÑ<81>арÑ<8f>, Пловдив, 4180, БългaриÑ<8f>" highway residential 0.1 БългaриÑ<8f> FALSE
+sofia university bg Europe Eastern Europe FALSE 1 2021-02-03 161691937 way "СофийÑ<81>ки универÑ<81>итет “Св. Климент ОхридÑ<81>ки"", 15, бул. Цар ОÑ<81>вободител, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1504, БългaриÑ<8f>" amenity university 0.515352144677718 БългaриÑ<8f> FALSE
+space technologies research institute bg Europe Eastern Europe FALSE 1 2021-02-03 118423296 way "ИнÑ<81>титут за КоÑ<81>мичеÑ<81>ки ИзÑ<81>ледваниÑ<8f> и Технологии, бл.1, Ð<90>кад. Георги Бончев, БÐ<90>Ð<9d> IV км., СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1113, БългaриÑ<8f>" office research 0.001 БългaриÑ<8f> FALSE
+university of sofia bg Europe Eastern Europe FALSE 1 2021-02-03 161691937 way "СофийÑ<81>ки универÑ<81>итет “Св. Климент ОхридÑ<81>ки"", 15, бул. Цар ОÑ<81>вободител, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1504, БългaриÑ<8f>" amenity university 0.515352144677718 БългaриÑ<8f> FALSE
+zamfir bg Europe Eastern Europe FALSE 1 2021-02-03 784595 node "Замфир, Лом, Монтана, БългaриÑ<8f>" place village 0.275 БългaриÑ<8f> FALSE
+zoe global bg Europe Eastern Europe FALSE 1 2021-02-03 189794797 way "Global, Димитровград, ХаÑ<81>ково, БългaриÑ<8f>" landuse commercial 0.3 БългaриÑ<8f> FALSE
+bhf bf Africa Western Africa FALSE 1 2021-02-03 258453504 relation Burkina Faso boundary administrative 0.680491224481489 Burkina Faso FALSE
+bureau of science be Europe Western Europe FALSE 1 2021-02-03 101902801 way "Bureau Greisch, 25, Allée des Noisetiers, Liège Science-Park, Angleur, Liège, Wallonie, 4031, België / Belgique / Belgien" building office 0.201 België / Belgique / Belgien FALSE
+center for cosmology be Europe Western Europe FALSE 1 2021-02-03 55302255 node "Centre for Cosmology, Particle Physics and Phenomenology (CP3), 2, Chemin du Cyclotron, Parc Einstein, Louvain-la-Neuve, Ottignies-Louvain-la-Neuve, Nivelles, Brabant wallon, Wallonie, 1348, België / Belgique / Belgien" office research 0.201 België / Belgique / Belgien FALSE
+chevron be Europe Western Europe FALSE 1 2021-02-03 6507688 node "Chevron, Stoumont, Verviers, Liège, Wallonie, 4987, België / Belgique / Belgien" place village 0.37381125651268 België / Belgique / Belgien FALSE
+erasmus university medical centre be Europe Western Europe FALSE 1 2021-02-03 314840 node "Erasme - Erasmus, Route de Lennik - Lennikse Baan, Anderlecht, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1070, België / Belgique / Belgien" railway station 0.444585942469205 België / Belgique / Belgien FALSE
+european defence agency be Europe Western Europe FALSE 1 2021-02-03 149946671 way "EDA, 17-23, Rue des Drapiers - Lakenweversstraat, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1050, België / Belgique / Belgien" office government 0.427022409876486 België / Belgique / Belgien FALSE
+european research council executive agency be Europe Western Europe FALSE 1 2021-02-03 73122812 node "ERCEA, 16, Place Charles Rogier - Karel Rogierplein, Saint-Josse-ten-Noode - Sint-Joost-ten-Node, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1210, België / Belgique / Belgien" office government 0.429911496965354 België / Belgique / Belgien FALSE
+genencor be Europe Western Europe FALSE 1 2021-02-03 112225638 way "43, Genencor International, Brugge-Centrum, Brugge, West-Vlaanderen, Vlaanderen, 8000, België / Belgique / Belgien" landuse industrial 0.3 België / Belgique / Belgien FALSE
+hal be Europe Western Europe FALSE 1 2021-02-03 258188555 relation "Halle, Halle-Vilvoorde, Vlaams-Brabant, Vlaanderen, België / Belgique / Belgien" boundary administrative 0.581694829650187 België / Belgique / Belgien FALSE
+harvard's church be Europe Western Europe FALSE 1 2021-02-03 49985626 node "Harvard's, Place de l'Accueil, Lauzelle, Louvain-la-Neuve, Ottignies-Louvain-la-Neuve, Nivelles, Brabant wallon, Wallonie, 1348, België / Belgique / Belgien" shop clothes 0.201 België / Belgique / Belgien FALSE
+initiative for medicines be Europe Western Europe FALSE 1 2021-02-03 80748719 node "IMI 2 JU, 56-60, Avenue de la Toison d'Or - Gulden-Vlieslaan, Saint-Gilles - Sint-Gillis, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1060, België / Belgique / Belgien" office yes 0.001 België / Belgique / Belgien FALSE
+jaspers be Europe Western Europe FALSE 1 2021-02-03 5512569 node "Jaspers, 159, Bloemendallaan, Strombeek, Strombeek-Bever, Grimbergen, Halle-Vilvoorde, Vlaams-Brabant, Vlaanderen, 1853, België / Belgique / Belgien" amenity pharmacy 0.101 België / Belgique / Belgien FALSE
+liège university be Europe Western Europe FALSE 1 2021-02-03 123758853 way "HEC Liège, Rue Reynier, Saint-Laurent, Glain, Liège, Wallonie, 4000, België / Belgique / Belgien" amenity university 0.101 België / Belgique / Belgien FALSE
+maastricht university be Europe Western Europe FALSE 1 2021-02-03 72718419 node "Maastricht University, 153, Avenue de Tervueren - Tervurenlaan, Woluwe-Saint-Pierre - Sint-Pieters-Woluwe, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1150, België / Belgique / Belgien" amenity university 0.201 België / Belgique / Belgien FALSE
+ortho be Europe Western Europe FALSE 1 2021-02-03 4044828 node "Ortho, La Roche-en-Ardenne, Marche-en-Famenne, Luxembourg, Wallonie, 6983, België / Belgique / Belgien" place village 0.375 België / Belgique / Belgien FALSE
+oxfam international be Europe Western Europe FALSE 1 2021-02-03 76889245 node "Oxfam, 405, Bredabaan, Wuustwezel, Antwerpen, Vlaanderen, 2990, België / Belgique / Belgien" shop shop=charity 0.101 België / Belgique / Belgien FALSE
+planck be Europe Western Europe FALSE 1 2021-02-03 157290 node "De Plank, Sint-Martens-Voeren, Voeren, Tongeren, Limburg, Vlaanderen, 3790, België / Belgique / Belgien" place hamlet 0.235968355602442 België / Belgique / Belgien FALSE
+plant systems biology be Europe Western Europe FALSE 1 2021-02-03 80891989 node "VIB-UGent Center for Plant Systems Biology, 71, Technologiepark-Zwijnaarde, Zwijnaarde, Gent, Oost-Vlaanderen, Vlaanderen, 9052, België / Belgique / Belgien" office research 0.301 België / Belgique / Belgien FALSE
+royal belgian institute for space aeronomy be Europe Western Europe FALSE 1 2021-02-03 98368678 way "Institut royal d'Aéronomie Spatiale de Belgique (IASB) - Koninklijk Belgisch Instituut voor Ruimte-Aeronomie (BIRA), 3, Avenue Circulaire - Ringlaan, Uccle - Ukkel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1180, België / Belgique / Belgien" building yes 0.101 België / Belgique / Belgien FALSE
+spa be Europe Western Europe FALSE 1 2021-02-03 258353734 relation "Spa, Verviers, Liège, Wallonie, 4900, België / Belgique / Belgien" boundary administrative 0.630842855879195 België / Belgique / Belgien FALSE
+spanish national research council be Europe Western Europe FALSE 1 2021-02-03 63415508 node "CSIC Delegation, 62, Rue du Trône - Troonstraat, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1050, België / Belgique / Belgien" office government 0.001 België / Belgique / Belgien FALSE
+université catholique de louvain be Europe Western Europe FALSE 1 2021-02-03 125108490 way "Musée L, 3, Place des Sciences, Biéreau, Louvain-la-Neuve, Ottignies-Louvain-la-Neuve, Nivelles, Brabant wallon, Wallonie, 1348, België / Belgique / Belgien" tourism museum 0.514317004425986 België / Belgique / Belgien FALSE
+university of ghent be Europe Western Europe FALSE 1 2021-02-03 114264163 way "Universiteit Gent Vakgroep Textielkunde, 70A, Technologiepark-Zwijnaarde, Wetenschapspark Ardoyen, Zwijnaarde, Gent, Oost-Vlaanderen, Vlaanderen, 9052, België / Belgique / Belgien" building yes 0.513953996266395 België / Belgique / Belgien FALSE
+university of pierre be Europe Western Europe FALSE 1 2021-02-03 72718419 node "Maastricht University, 153, Avenue de Tervueren - Tervurenlaan, Woluwe-Saint-Pierre - Sint-Pieters-Woluwe, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1150, België / Belgique / Belgien" amenity university 0.301 België / Belgique / Belgien FALSE
+vlti be Europe Western Europe FALSE 1 2021-02-03 176905194 way "Speelplaats VLTI, Goede Herder, Torhout, Brugge, West-Vlaanderen, Vlaanderen, 8820, België / Belgique / Belgien" highway footway 0.175 België / Belgique / Belgien FALSE
+vrije universiteit brussel be Europe Western Europe FALSE 1 2021-02-03 51922595 node "Vrije Universiteit Brussel, 2, Boulevard de la Plaine - Pleinlaan, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1050, België / Belgique / Belgien" tourism information 0.301 België / Belgique / Belgien FALSE
+wikimedia commons be Europe Western Europe FALSE 1 2021-02-03 126001376 way "https://commons.wikimedia.org/wiki/File:Den Bonten Hannen, 34, Mgr. Cardijnstraat, Kasterlee, Turnhout, Antwerpen, Vlaanderen, 2460, België / Belgique / Belgien" building house 0.201 België / Belgique / Belgien FALSE
+bangladesh agricultural research institute bd Asia Southern Asia FALSE 1 2021-02-03 218321267 way "Bangladesh Agricultural Research institute, বগà§<81>ড়া, বগà§<81>ড়া জেলা, রাজশাহী বিà¦à¦¾à¦—, বাংলাদেশ" landuse farmyard 0.6 বাংলাদেশ FALSE
+bangladesh university of engineering and technology bd Asia Southern Asia FALSE 1 2021-02-03 239326225 way "Bangladesh University of Engineering & Technology, Dhakeswari Road, বাবà§<81> বাজার, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1211, বাংলাদেশ" amenity university 0.867072547352423 বাংলাদেশ FALSE
+chandra x-ray center bd Asia Southern Asia FALSE 1 2021-02-03 148177740 way "Sharat Chandra Chakraborty Road, সিদà§<8d>দিক বাজার, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1100, বাংলাদেশ" highway tertiary 0.2 বাংলাদেশ FALSE
+ford model t bd Asia Southern Asia FALSE 1 2021-02-03 191227884 way "Ford Workshop, ঢাকা-ময়মনসিংহ মহাসড়ক, Sector 9, Uttara, Dhaka, Bangladesh, উতà§<8d>তরা, ঢাকা, Chanpara Bazar, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1230, বাংলাদেশ" building commercial 0.201 বাংলাদেশ FALSE
+institute of science and technology bd Asia Southern Asia FALSE 1 2021-02-03 28348367 node "Institute of Science and Technology, Road 15/A, ধানমনà§<8d>ডি আ/à¦<8f>, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 12, বাংলাদেশ" building university 0.778015094618814 বাংলাদেশ FALSE
+one health institute bd Asia Southern Asia FALSE 1 2021-02-03 176103509 way "Health Institute, Dumki - Bauphal - Dashmina - Galachipa Highway, পটà§<81>য়াখালী সদর উপজেলা, পটà§<81>য়াখালী জেলা, বরিশাল বিà¦à¦¾à¦—, 8602, বাংলাদেশ" building yes 0.201 বাংলাদেশ FALSE
+pdb bd Asia Southern Asia FALSE 1 2021-02-03 184556254 way "PDB, রংপà§<81>র, রংপà§<81>র জেলা, 5400, বাংলাদেশ" highway living_street 0.2 বাংলাদেশ FALSE
+statistical research center bd Asia Southern Asia FALSE 1 2021-02-03 149441305 way "Institute of Statistical Research and Training, Mokarrom Building Road, সিদà§<8d>দিক বাজার, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1000, বাংলাদেশ" building yes 0.43461374284578 বাংলাদেশ FALSE
+tobacco control bd Asia Southern Asia FALSE 1 2021-02-03 38585207 node "National Tobacco Control Comission, তোপখানা রোড, ফকিরাপà§<81>ল, পলà§<8d>টন, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1000, বাংলাদেশ" office government 0.201 বাংলাদেশ FALSE
+university of development bd Asia Southern Asia FALSE 1 2021-02-03 43508783 node "University of Development (UODA), Dhanmondi 9/A, পশà§<8d>চিম ধানমনà§<8d>ডি, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, DHAKA-1209, বাংলাদেশ" amenity university 0.301 বাংলাদেশ FALSE
+bosnia and herzegovina ba Europe Southern Europe FALSE 1 2021-02-03 258531774 relation Bosna i Hercegovina / БоÑ<81>на и Херцеговина boundary administrative 0.743972985444669 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+cobe ba Europe Southern Europe FALSE 1 2021-02-03 24161088 node "ÄŒobe, Općina Maglaj, ZeniÄ<8d>ko-dobojski kanton, Federacija Bosne i Hercegovine, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" place village 0.300938798149577 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+icmp ba Europe Southern Europe FALSE 1 2021-02-03 36728774 node "ICMP - International Commission on Missing Persons, Bosne Srebrene, Mejdan, Tuzla, Grad Tuzla, Tuzlanski kanton, Federacija Bosne i Hercegovine, 75000, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" office company 0.101 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+lav ba Europe Southern Europe FALSE 1 2021-02-03 13949201 node "Lav, M-4, Novakovići, Залужани, Banja Luka, Grad Banja Luka, Република СрпÑ<81>ка / Republika Srpska, 78000, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" amenity bar 0.101 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+pliva ba Europe Southern Europe FALSE 1 2021-02-03 172671795 way "Pliva, Pijavice, Jajce, Općina Jajce, Srednjobosanski kanton / Županija SrediÅ¡nja Bosna, Federacija Bosne i Hercegovine, 70101, Bosna i Hercegovina / БоÑ<81>на и Херцеговина" waterway river 0.375 Bosna i Hercegovina / БоÑ<81>на и Херцеговина FALSE
+azerbaijan az Asia Western Asia FALSE 1 2021-02-03 257577722 relation Azərbaycan boundary administrative 0.740930969969447 Azərbaycan FALSE
+dst az Asia Western Asia FALSE 1 2021-02-03 561986 node "Dəstə, Ordubad rayonu, Naxçıvan Muxtar Respublikası, Azərbaycan" place village 0.321073131097349 Azərbaycan FALSE
+aqc au Oceania Australia and New Zealand FALSE 1 2021-02-03 116982466 way "AQC carpark, Oban Road, Mount Isa, Mount Isa City, Queensland, 4825, Australia" amenity parking 0.101 Australia FALSE
+aurora australis au Oceania Australia and New Zealand FALSE 1 2021-02-03 207551621 way "Aurora, Kembla Street, Wollongong, Wollongong City Council, New South Wales, 2500, Australia" building yes 0.101 Australia FALSE
+australia national university au Oceania Australia and New Zealand FALSE 1 2021-02-03 43175627 node "Janefield Drive LPO, Janefield Drive, University Hill Precinct, Bundoora, Mill Park, City of Whittlesea, Victoria, 3082, Australia" amenity post_office 0.201 Australia FALSE
+australia telescope compact array au Oceania Australia and New Zealand FALSE 1 2021-02-03 6458901 node "CSIRO Australia Telescope Compact Array, Heliograph Track, Narrabri, Narrabri Shire Council, New South Wales, 2390, Australia" tourism attraction 0.401 Australia FALSE
+australian archaeological association au Oceania Australia and New Zealand FALSE 1 2021-02-03 136959246 way "Australian Local Government Association, 8, Geils Court, Deakin, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" building yes 0.201 Australia FALSE
+australian broadcasting corporation au Oceania Australia and New Zealand FALSE 1 2021-02-03 154556170 way "Australian Broadcasting Corporation, 114, Grey Street, South Bank, South Brisbane, Brisbane City, Queensland, 4101, Australia" building yes 0.889492484386201 Australia FALSE
+australian capital territory au Oceania Australia and New Zealand FALSE 1 2021-02-03 258363989 relation "Australian Capital Territory, Australia" boundary administrative 0.860942226859498 Australia FALSE
+australian institute for bioengineering au Oceania Australia and New Zealand FALSE 1 2021-02-03 95576953 way "Australian Institute for Bioengineering and Nanotechnology, Old Cooper Road, St Lucia, Brisbane City, Queensland, 4072, Australia" building university 0.401 Australia FALSE
+australian institute of health and welfare au Oceania Australia and New Zealand FALSE 1 2021-02-03 115890715 way "Australian Institute of Health and Welfare, Belconnen Bikeway, Bruce, District of Belconnen, Australian Capital Territory, 2617, Australia" building yes 0.601 Australia FALSE
+australian museum au Oceania Australia and New Zealand FALSE 1 2021-02-03 89870859 way "Australian Museum, Cross City Tunnel, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia" tourism museum 0.644873557645695 Australia FALSE
+axl au Oceania Australia and New Zealand FALSE 1 2021-02-03 195087476 way "Alexandria Homestead Airport, Ranken Road, Connells Lagoon, Nicholson, Barkly Region, Northern Territory, Australia" aeroway aerodrome 0.001 Australia FALSE
+barmah forest au Oceania Australia and New Zealand FALSE 1 2021-02-03 258530660 relation "Barmah, Shire of Moira, Victoria, Australia" boundary administrative 0.378015094618814 Australia FALSE
+bureau of meteorology au Oceania Australia and New Zealand FALSE 1 2021-02-03 147830484 way "Bureau Of Meteorology, Kent Town, Adelaide, The City of Norwood Payneham and St Peters, South Australia, 5067, Australia" landuse industrial 0.5 Australia FALSE
+centre for medical research & innovation au Oceania Australia and New Zealand FALSE 1 2021-02-03 151744793 way "Centre for Medical Research, Royal Parade, Melbourne Innovation District, Parkville, Melbourne, City of Melbourne, Victoria, 3000, Australia" building yes 0.501 Australia FALSE
+cfs au Oceania Australia and New Zealand FALSE 1 2021-02-03 114833255 way "Coffs Harbour Regional Airport, Hogbin Drive, Coffs Harbour, Coffs Harbour City Council, New South Wales, 2450, Australia" aeroway aerodrome 0.350918373098637 Australia FALSE
+charles darwin university au Oceania Australia and New Zealand FALSE 1 2021-02-03 126921964 way "Charles Darwin University, Ellengowen Drive, Brinkin, Darwin, City of Darwin, Northern Territory, 0800, Australia" amenity university 0.690444593674683 Australia FALSE
+chinese nationalist party au Oceania Australia and New Zealand FALSE 1 2021-02-03 59443609 node "The Chinese Nationalist Party of Australia, Ultimo Road, Haymarket, Sydney, Council of the City of Sydney, New South Wales, 2000, Australia" office political_party 0.301 Australia FALSE
+cns au Oceania Australia and New Zealand FALSE 1 2021-02-03 193921262 way "Cairns Airport, Airport Avenue, Aeroglen, Cairns, Cairns Regional, Queensland, 4870, Australia" aeroway aerodrome 0.436307119840041 Australia FALSE
+colless au Oceania Australia and New Zealand FALSE 1 2021-02-03 229106860 way "Colless Warrambool, Wingadee, Coonamble Shire Council, New South Wales, 2829, Australia" waterway stream 0.3 Australia FALSE
+commonwealth bank of australia au Oceania Australia and New Zealand FALSE 1 2021-02-03 17320127 node "Commonwealth Bank of Australia, 208-214, Kingaroy Street, Kingaroy, South Burnett Regional, Queensland, 4610, Australia" amenity bank 0.401 Australia FALSE
+csl au Oceania Australia and New Zealand FALSE 1 2021-02-03 97475392 way "CSL, Parkville, City of Melbourne, Victoria, 3052, Australia" landuse industrial 0.3 Australia FALSE
+darwin au Oceania Australia and New Zealand FALSE 1 2021-02-03 16499368 node "Darwin, City of Darwin, Northern Territory, 0800, Australia" place city 0.679885767346348 Australia FALSE
+department of immigration and citizenship au Oceania Australia and New Zealand FALSE 1 2021-02-03 157090843 way "Department of Immigration and Citizenship, 76, Thomas Street, Dandenong, City of Greater Dandenong, Victoria, 3175, Australia" building office 0.501 Australia FALSE
+department of marine sciences au Oceania Australia and New Zealand FALSE 1 2021-02-03 99862102 way "Department of Earth and Marine Sciences, Linnaeus Way, Acton, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia" building university 0.401 Australia FALSE
+doherty institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 119889961 way "Peter Doherty Institute, Grattan Street, Melbourne Innovation District, Melbourne, City of Melbourne, Victoria, 3000, Australia" building yes 0.201 Australia FALSE
+fairley house au Oceania Australia and New Zealand FALSE 1 2021-02-03 259508544 relation "Fairley, Shire of Gannawarra, Victoria, Australia" boundary administrative 0.35 Australia FALSE
+federal circuit au Oceania Australia and New Zealand FALSE 1 2021-02-03 118947152 way "German Embassy, 119, Empire Circuit, Yarralumla, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" office diplomatic 0.36851441835616 Australia FALSE
+fisheries au Oceania Australia and New Zealand FALSE 1 2021-02-03 50756594 node "The Fisheries, Coles Bay, Glamorgan-Spring Bay, Tasmania, 7251, Australia" place neighbourhood 0.35 Australia FALSE
+forensic institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 162032267 way "Victorian Institute of Forensic Medicine, 65, Kavanagh Street, Southbank, City of Melbourne, Victoria, 3006, Australia" office research 0.201 Australia FALSE
+fss au Oceania Australia and New Zealand FALSE 1 2021-02-03 30204607 node "Flinders Street, Melbourne, City of Melbourne, Victoria, 3000, Australia" railway station 0.427742562950671 Australia FALSE
+garvan institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 212333308 way "Garvan Institute of Medical Research, Chaplin Street, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia" building yes 0.491360254031496 Australia FALSE
+geolink au Oceania Australia and New Zealand FALSE 1 2021-02-03 62868078 node "Geolink, 103, Faulkner Street, North Hill, Armidale, Armidale Regional Council, New South Wales, 2350, Australia" office engineers 0.101 Australia FALSE
+gold coast au Oceania Australia and New Zealand FALSE 1 2021-02-03 259463504 relation "Gold Coast City, Queensland, Australia" boundary administrative 0.770120034131775 Australia FALSE
+grattan institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 101841158 way "Grattan Institute, Russell Park Lane, Melbourne Innovation District, Carlton, City of Melbourne, Victoria, 3053, Australia" building yes 0.201 Australia FALSE
+griffith university in nathan au Oceania Australia and New Zealand FALSE 1 2021-02-03 95356693 way "Griffith University Nathan Campus, Griffith Road, Nathan, Brisbane City, Queensland, 4111, Australia" amenity university 0.301 Australia FALSE
+inquisition au Oceania Australia and New Zealand FALSE 1 2021-02-03 38185509 node "Inquisition Hill, Shoalhaven City Council, New South Wales, Australia" natural peak 0.4 Australia FALSE
+irvine city council au Oceania Australia and New Zealand FALSE 1 2021-02-03 258831478 relation "Mount Irvine, Blue Mountains City Council, New South Wales, 2786, Australia" boundary administrative 0.55 Australia FALSE
+james cook university in australia au Oceania Australia and New Zealand FALSE 1 2021-02-03 183284314 way "Curtin University Sydney, Regent Street, Chippendale, Sydney, Council of the City of Sydney, New South Wales, 2008, Australia" amenity university 0.301 Australia FALSE
+jewish general hospital au Oceania Australia and New Zealand FALSE 1 2021-02-03 223245688 way "Zee Germans, Cessnock, Cessnock City Council, New South Wales, Australia" highway path 0.075 Australia FALSE
+keane au Oceania Australia and New Zealand FALSE 1 2021-02-03 66988458 node "Keane, Moorine Rock, Shire Of Yilgarn, Western Australia, Australia" place locality 0.225 Australia FALSE
+leviathan au Oceania Australia and New Zealand FALSE 1 2021-02-03 303895 node "Leviathan, Inverell Shire Council, New South Wales, Australia" place locality 0.225 Australia FALSE
+marine conservation group au Oceania Australia and New Zealand FALSE 1 2021-02-03 164392010 way "Great Barrier Reef Coast Marine Park - Herbet Creek, The Percy Group, Isaac Regional, Queensland, Australia" landuse conservation 0.4 Australia FALSE
+maurice blackburn au Oceania Australia and New Zealand FALSE 1 2021-02-03 75072947 node "Maurice Blackburn, Rostella Way, Melbourne, City of Melbourne, Victoria, 3000, Australia" office lawyer 0.201 Australia FALSE
+molonglo observatory synthesis telescope au Oceania Australia and New Zealand FALSE 1 2021-02-03 178337614 way "Molonglo Observatory Synthesis Telescope, Hoskinstown Road, Hoskinstown, Bungendore, Queanbeyan-Palerang Regional Council, New South Wales, 2621, Australia" man_made antenna 0.401 Australia FALSE
+murchison widefield array au Oceania Australia and New Zealand FALSE 1 2021-02-03 215884568 way "Murchison Widefield Array, Beringarra-Pindar Road, South Murchison, Shire Of Murchison, Western Australia, Australia" man_made telescope 0.301 Australia FALSE
+murdoch children's research institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 82024678 node "Murdoch Children's Research Institute, Flemington Road, Parkville, North Melbourne, City of Melbourne, Victoria, 3052, Australia" amenity research_institute 0.501 Australia FALSE
+murdoch childrens research institute au Oceania Australia and New Zealand FALSE 1 2021-02-03 82024678 node "Murdoch Children's Research Institute, Flemington Road, Parkville, North Melbourne, City of Melbourne, Victoria, 3052, Australia" amenity research_institute 0.301 Australia FALSE
+national ocean council au Oceania Australia and New Zealand FALSE 1 2021-02-03 258808648 relation "Ocean Shores, Byron Shire Council, New South Wales, 2483, Australia" boundary administrative 0.45 Australia FALSE
+national press club au Oceania Australia and New Zealand FALSE 1 2021-02-03 125056817 way "National Press Club, National Circuit, Barton, South Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" building office 0.567719150556049 Australia FALSE
+national research alliance au Oceania Australia and New Zealand FALSE 1 2021-02-03 88815095 way "Accident Research Centre, 21, Alliance Lane, Clayton, City of Monash, Victoria, 3800, Australia" building yes 0.201 Australia FALSE
+national space workshop au Oceania Australia and New Zealand FALSE 1 2021-02-03 209490340 way "Space, Turner, North Canberra, District of Canberra Central, Australian Capital Territory, 2612, Australia" landuse residential 0.3 Australia FALSE
+nature research au Oceania Australia and New Zealand FALSE 1 2021-02-03 158110702 way "Pauline Toner Butterfly Nature Conservation Reserve, Woodridge, Eltham, Shire of Nillumbik, Victoria, 3095, Australia" natural wood 0.3 Australia FALSE
+nsw au Oceania Australia and New Zealand FALSE 1 2021-02-03 258358609 relation "New South Wales, Australia" boundary administrative 0.700850708194693 Australia FALSE
+nsw forestry corporation au Oceania Australia and New Zealand FALSE 1 2021-02-03 196058557 way "Banksia Picnic Area, Strickland Falls Trail, Somersby, Gosford, Central Coast Council, New South Wales, 2250, Australia" tourism picnic_site 0.001 Australia FALSE
+nuffield council au Oceania Australia and New Zealand FALSE 1 2021-02-03 131986368 way "Nuffield Park, Victoria Square, Zetland, Sydney, Council of the City of Sydney, New South Wales, 2017, Australia" leisure park 0.35 Australia FALSE
+occator au Oceania Australia and New Zealand FALSE 1 2021-02-03 200702038 way "Occator Way, Falcon, Mandurah, City Of Mandurah, Western Australia, Australia" highway residential 0.2 Australia FALSE
+open research au Oceania Australia and New Zealand FALSE 1 2021-02-03 301252280 node "Research, Shire of Nillumbik, Victoria, 3095, Australia" place town 0.4 Australia FALSE
+parliament house au Oceania Australia and New Zealand FALSE 1 2021-02-03 21288197 node "Parliament House, Parliament Drive, Capital Hill, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia" tourism attraction 0.620468394176642 Australia FALSE
+professionals association au Oceania Australia and New Zealand FALSE 1 2021-02-03 60049003 node "Victorian Allied Health Professionals Association, William Street, West Melbourne, Melbourne, City of Melbourne, Victoria, 3000, Australia" office ngo 0.201 Australia FALSE
+r/v falkor au Oceania Australia and New Zealand FALSE 1 2021-02-03 255379377 way "Falkor Road, Arcadia Estate, Officer, Shire of Cardinia, Victoria, 3809, Australia" highway proposed 0.4 Australia FALSE
+royal tasmanian botanical gardens au Oceania Australia and New Zealand FALSE 1 2021-02-03 105955035 way "Royal Tasmanian Botanical Gardens, Queens Domain, Hobart, City of Hobart, Tasmania, Australia" leisure park 0.691360254031496 Australia FALSE
+school of information science and technology au Oceania Australia and New Zealand FALSE 1 2021-02-03 114559341 way "Information Science & Technology, Second floor access bridge between Earth Sciences and IST, Bedford Park, Adelaide, City of Mitcham, South Australia, 5042, Australia" building yes 0.501 Australia FALSE
+science council au Oceania Australia and New Zealand FALSE 1 2021-02-03 113885956 way "Science, Funda Close, Bellingen, Bellingen Shire Council, New South Wales, 2454, Australia" building school 0.201 Australia FALSE
+sea council au Oceania Australia and New Zealand FALSE 1 2021-02-03 48813444 node "Sea Life Center, Pier 26, Darling Quarter, Sydney, Council of the City of Sydney, New South Wales, 2000, Australia" tourism attraction 0.572421960066799 Australia FALSE
+southern cross university in lismore au Oceania Australia and New Zealand FALSE 1 2021-02-03 162934407 way "Southern Cross University, Highfield Terrace, Goonellabah, Lismore City Council, New South Wales, 2480, Australia" amenity university 0.401 Australia FALSE
+tepco au Oceania Australia and New Zealand FALSE 1 2021-02-03 258860992 relation "Tepco Station, Pastoral Unincorporated Area, South Australia, 5440, Australia" boundary administrative 0.35 Australia FALSE
+the jewish state au Oceania Australia and New Zealand FALSE 1 2021-02-03 223245688 way "Zee Germans, Cessnock, Cessnock City Council, New South Wales, Australia" highway path 0.075 Australia FALSE
+thomson innovation au Oceania Australia and New Zealand FALSE 1 2021-02-03 10691481 node "Thomson, Rathdowne Street, Melbourne Innovation District, Carlton, City of Melbourne, Victoria, 3053, Australia" shop estate_agent 0.201 Australia FALSE
+tru group au Oceania Australia and New Zealand FALSE 1 2021-02-03 83205259 node "Tru-fit Denture Group, 84, Grange Road, Alphington, City of Darebin, Victoria, 3078, Australia" shop medical_supply 0.201 Australia FALSE
+united ki au Oceania Australia and New Zealand FALSE 1 2021-02-03 3232177 node "United Rangeway, 50, Rifle Range Road, Rangeway, Geraldton, City Of Greater Geraldton, Western Australia, 6530, Australia" amenity fuel 0.101 Australia FALSE
+university of monash au Oceania Australia and New Zealand FALSE 1 2021-02-03 87739881 way "Monash University, Clayton Campus, Bus Loop, Clayton, City of Monash, Victoria, 3800, Australia" amenity university 0.567719150556049 Australia FALSE
+university of new south wales sydney au Oceania Australia and New Zealand FALSE 1 2021-02-03 102614348 way "University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia" amenity university 1.11490411729019 Australia FALSE
+unsw au Oceania Australia and New Zealand FALSE 1 2021-02-03 102614348 way "University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia" amenity university 0.61490411729019 Australia FALSE
+unsw sydney au Oceania Australia and New Zealand FALSE 1 2021-02-03 102614348 way "University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia" amenity university 0.71490411729019 Australia FALSE
+us national security council au Oceania Australia and New Zealand FALSE 1 2021-02-03 138068943 way "Security, Anna Clark Avenue, Nirimba Fields, Sydney, Blacktown City Council, New South Wales, 2763, Australia" building university 0.301 Australia FALSE
+us public health service au Oceania Australia and New Zealand FALSE 1 2021-02-03 99223949 way "400 Public Health, 400, Jackson Avenue, Bentley, Town of Victoria Park, Western Australia, 6102, Australia" building university 0.301 Australia FALSE
+western australia department of parks and wildlife au Oceania Australia and New Zealand FALSE 1 2021-02-03 33111781 node "Gnaala Mia Campground, Loop 2, Williams, Shire Of Williams, Western Australia, Australia" tourism camp_site 0.301 Australia FALSE
+western sydney university au Oceania Australia and New Zealand FALSE 1 2021-02-03 52671569 node "Western Sydney University, Kearney Avenue, Kingswood, Sydney, Penrith City Council, New South Wales, 2747, Australia" tourism information 0.301 Australia FALSE
+γ-ray observatory au Oceania Australia and New Zealand FALSE 1 2021-02-03 181119800 way "University of Tasmania Cosmic Ray Observatory, Pinnacle Feeder Track, City of Hobart, Tasmania, Australia" man_made observatory 0.201 Australia FALSE
+areva at Europe Western Europe FALSE 1 2021-02-03 108135800 way "Areva, Bergham, Enzenwinkl, Leonding, Bezirk Linz-Land, Oberösterreich, 4060, Österreich" landuse commercial 0.3 Österreich FALSE
+circuit therapeutics at Europe Western Europe FALSE 1 2021-02-03 193999341 way "Stuwerviertel, KG Leopoldstadt, Leopoldstadt, Wien, 1020, Österreich" highway raceway 0.1 Österreich FALSE
+ctbto at Europe Western Europe FALSE 1 2021-02-03 148373856 way "Vienna International Centre, 5, Wagramer Straße, KG Kaisermühlen, Donaustadt, Wien, 1400, Österreich" place house 0.392168689295747 Österreich FALSE
+erwin schrödinger international institute for mathematical physics at Europe Western Europe FALSE 1 2021-02-03 55212209 node "Erwin-Schrödinger-Institut für Mathematische Physik, 9, Boltzmanngasse, Thurygrund, KG Alsergrund, Alsergrund, Wien, 1090, Österreich" amenity university 0.516167966338533 Österreich FALSE
+gapp at Europe Western Europe FALSE 1 2021-02-03 109776638 way "Gapp, 17, Grazbachgasse, Jakomini, Graz, Steiermark, 8010, Österreich" shop safety_equipment 0.101 Österreich FALSE
+gpg at Europe Western Europe FALSE 1 2021-02-03 72976686 node "GPG, Wollöster, Kobledt, Eglsee, Burgkirchen, Bezirk Braunau am Inn, Oberösterreich, 5274, Österreich" shop window_blind 0.101 Österreich FALSE
+joanneum research at Europe Western Europe FALSE 1 2021-02-03 100346870 way "JOANNEUM RESEARCH - DIGITAL Institut für Informations- und Kommunikationssysteme, 17, Steyrergasse, Jakomini, Graz, Steiermark, 8010, Österreich" building yes 0.201 Österreich FALSE
+melk at Europe Western Europe FALSE 1 2021-02-03 258502438 relation "Melk, Bezirk Melk, Niederösterreich, 3281, Österreich" waterway river 0.494052338771708 Österreich FALSE
+nhm at Europe Western Europe FALSE 1 2021-02-03 258348028 relation "Naturhistorisches Museum, 7, Burgring, Schottenviertel, Innere Stadt, Wien, 1010, Österreich" tourism museum 0.441911671250342 Österreich FALSE
+taigen at Europe Western Europe FALSE 1 2021-02-03 568295 node "Taigen, Irrsdorf, Straßwalchen, Bezirk Salzburg-Umgebung, Salzburg, 5204, Österreich" place hamlet 0.35 Österreich FALSE
+university of salzburg at Europe Western Europe FALSE 1 2021-02-03 120296912 way "Universität Salzburg - Unipark, 1, Erzabt-Klotz-Straße, Nonntal, Salzburg, 5020, Österreich" amenity university 0.577768525385992 Österreich FALSE
+university of veterinary medicine vienna at Europe Western Europe FALSE 1 2021-02-03 96379147 way "Veterinärmedizinische Universität, Angyalföldstraße, KG Leopoldau, Floridsdorf, Wien, 1210, Österreich" amenity university 0.342242222837154 Österreich FALSE
+wehi at Europe Western Europe FALSE 1 2021-02-03 258340208 relation "Gemeinde Weiler, Bezirk Feldkirch, Vorarlberg, 6837, Österreich" boundary administrative 0.384723197268746 Österreich FALSE
+anses ar Americas South America FALSE 1 2021-02-03 76657057 node "ANSES, 1192, Doctor Arturo R. de la Serna, General Lavalle, Partido de General Lavalle, Buenos Aires, 7103, Argentina" office government 0.375244632729739 Argentina FALSE
+aol ar Americas South America FALSE 1 2021-02-03 165974980 way "Aeropuerto Paso De Los Libres, Avenida Arturo Frondizi, B 60 viv, 50 VIV G1,2,3,4, Municipio de Paso de los Libres, Departamento Paso de los Libres, Corrientes, W3230FLP, Argentina" aeroway aerodrome 0.331005307834616 Argentina FALSE
+ar ar Americas South America FALSE 1 2021-02-03 258404994 relation Argentina boundary administrative 0.910104194561691 Argentina FALSE
+atic ar Americas South America FALSE 1 2021-02-03 50671745 node "Atic, Ingeniero White, Partido de BahÃa Blanca, Buenos Aires, 8013, Argentina" place neighbourhood 0.35 Argentina FALSE
+auger observatory ar Americas South America FALSE 1 2021-02-03 10519055 node "Observatorio Pierre Auger, 304, Avenida San MartÃn (Norte), Malargüe, Distrito Ciudad de Malargüe, Departamento Malargüe, Mendoza, Argentina" tourism attraction 0.43489332460211 Argentina FALSE
+conicet ar Americas South America FALSE 1 2021-02-03 302226945 relation "CONICET, BahÃa Blanca, Partido de BahÃa Blanca, Buenos Aires, Argentina" boundary administrative 0.4 Argentina FALSE
+córdoba national observatory ar Americas South America FALSE 1 2021-02-03 122297187 way "Observatorio Astronómico de Córdoba, 854, Francisco N. de Laprida, Observatorio, Córdoba, Municipio de Córdoba, PedanÃa Capital, Departamento Capital, Córdoba, X5000, Argentina" building public 0.101 Argentina FALSE
+corrientes ar Americas South America FALSE 1 2021-02-03 257819256 relation "Corrientes, Argentina" boundary administrative 0.638272357177901 Argentina FALSE
+cvi ar Americas South America FALSE 1 2021-02-03 155461170 way "Aeropuerto de Caleta Olivia, Ruta Provincial 99, Km. 8, Caleta Olivia, Deseado, Santa Cruz, 9013, Argentina" aeroway aerodrome 0.119931111449547 Argentina FALSE
+ianigla ar Americas South America FALSE 1 2021-02-03 25557881 node "Instituto Argentino de NivologÃa, GlaciologÃa y Ciencias Ambientales (IANIGLA), Avenida Adrián Ruiz Leal, Ciudad de Mendoza, Sección 9ª Parque General San MartÃn, Departamento Capital, Mendoza, M5547, Argentina" amenity college 0.101 Argentina FALSE
+la pampa ar Americas South America FALSE 1 2021-02-03 258441426 relation "La Pampa, Argentina" boundary administrative 0.710733717290293 Argentina FALSE
+laguna diamante ar Americas South America FALSE 1 2021-02-03 184628204 way "Laguna Diamante, Departamento Antofagasta de la Sierra, Catamarca, K4705, Argentina" natural water 0.4 Argentina FALSE
+saa ar Americas South America FALSE 1 2021-02-03 251041075 way "Aeropuerto General Acha, 2356, Manuel J. Campos, General Acha, Municipio de General Acha, Departamento Utracán, La Pampa, L8200, Argentina" aeroway aerodrome 0.2885709817045 Argentina FALSE
+santa fe ar Americas South America FALSE 1 2021-02-03 258372619 relation "Santa Fe, Argentina" boundary administrative 0.771095269263292 Argentina FALSE
+us epa ar Americas South America FALSE 1 2021-02-03 96252367 way "El Palomar, José Bianco, El Palomar, Partido de Morón, Buenos Aires, 1684, Argentina" aeroway aerodrome 0.351537799411788 Argentina FALSE
+westinghouse ar Americas South America FALSE 1 2021-02-03 129730400 way "Westinghouse, Ituzaingó, Córdoba, Municipio de Córdoba, PedanÃa Capital, Departamento Capital, Córdoba, X5020, Argentina" highway residential 0.2 Argentina FALSE
+nam ao Africa Middle Africa FALSE 1 2021-02-03 258455224 relation "Namibe, Angola" boundary administrative 0.595173613781596 Angola FALSE
+ponta ao Africa Middle Africa FALSE 1 2021-02-03 259503510 relation "Ponta, MunicÃpio de Luanda, Luanda, Angola" boundary administrative 0.5 Angola FALSE
+teva ao Africa Middle Africa FALSE 1 2021-02-03 10960093 node "Teva, Huambo, Angola" place village 0.375 Angola FALSE
+polytechnic university of tirana al Europe Southern Europe FALSE 1 2021-02-03 185277358 way "Universiteti Politeknik i Tiranës, 4, Sheshi Nënë Tereza, Libri Universitar, Njësia Bashkiake Nr. 5, Tiranë, Bashkia Tiranë, Qarku i Tiranës, Shqipëria qendrore, 1001-1028, Shqipëria" amenity university 0.351332014915526 Shqipëria FALSE
+romesberg al Europe Southern Europe FALSE 1 2021-02-03 6516142 node "Romës, Armen, Bashkia Selenicë, Qarku i Vlorës, Shqipëria jugore, 9427, Shqipëria" place village 0.275 Shqipëria FALSE
+university of tirana al Europe Southern Europe FALSE 1 2021-02-03 185277358 way "Universiteti Politeknik i Tiranës, 4, Sheshi Nënë Tereza, Libri Universitar, Njësia Bashkiake Nr. 5, Tiranë, Bashkia Tiranë, Qarku i Tiranës, Shqipëria qendrore, 1001-1028, Shqipëria" amenity university 0.351332014915526 Shqipëria FALSE
+aei ai Americas Caribbean FALSE 1 2021-02-03 258465287 relation Anguilla boundary administrative 0.597033622148582 Anguilla FALSE
+jaea af Asia Southern Asia FALSE 1 2021-02-03 176884644 way "د جلال اباد هوايي ډګر, Jalalabad Torkham Highway, Khoshkombat, بهسود ولسوالÛ<8d>, ننگرهار ولايت, 0039, اÙ<81>غانستان" aeroway aerodrome 0.335429261886761 اÙ<81>غانستان FALSE
+sra af Asia Southern Asia FALSE 1 2021-02-03 17142841 node "Sra, Øصارک ولسوالÛ<8d>, ننگرهار ولايت, اÙ<81>غانستان" place town 0.4 اÙ<81>غانستان FALSE
+american university of sharjah ae Asia Western Asia FALSE 1 2021-02-03 53275531 node "American university sharjah, STAIR 06, Al Juraina 1, ملويلØ, الشارقة, 120100, الإمارات العربية المتØدة" amenity university 0.641036070852761 الإمارات العربية المتØدة FALSE
+manchester business school ae Asia Western Asia FALSE 1 2021-02-03 42982352 node "Manchester Business School, شارع البروج, قرية المعرÙ<81>Ø©, دبي, 11999, الإمارات العربية المتØدة" building university 0.301 الإمارات العربية المتØدة FALSE
+masdar ae Asia Western Asia FALSE 1 2021-02-03 40179978 node "Masdar, Pedestrian Zone Masdar, مدينة مصدر, أبوظبي, أبو ظبي, 46450, الإمارات العربية المتØدة" highway bus_stop 0.101 الإمارات العربية المتØدة FALSE
+ministry of environmental protection ae Asia Western Asia FALSE 1 2021-02-03 139477241 way "The Ministry of Environmental Protection, مارينا أم القيوين, أم القيوين, الإمارات العربية المتØدة" landuse commercial 0.6 الإمارات العربية المتØدة FALSE
+new york university abu dhabi ae Asia Western Asia FALSE 1 2021-02-03 148462781 way "جامعة نيويورك أبوظبي, جزيرة السعديات, جامعة نيويورك أبوظبي, أبوظبي, أبو ظبي, الإمارات العربية المتØدة" amenity university 0.336487354815963 الإمارات العربية المتØدة FALSE
+novaya zemlya ae Asia Western Asia FALSE 1 2021-02-03 259223381 relation "Novaya Zemlya, دبي, الإمارات العربية المتØدة" place islet 0.45 الإمارات العربية المتØدة FALSE
+special committee ae Asia Western Asia FALSE 1 2021-02-03 57489199 node "Special Olympics 2019 Local Committee Offices, شارع الشيخ راشد بن سعيد, Fairmont Residences, مدينة خليÙ<81>Ø©, أبوظبي, أبو ظبي, 63171, الإمارات العربية المتØدة" office government 0.201 الإمارات العربية المتØدة FALSE
+anschutz medical center de Europe Western Europe FALSE NA 2021-02-05 1146647 node "Anschütz, 17, Stiller Gasse, Schmalkalden, Landkreis Schmalkalden-Meiningen, Thüringen, 98574, Deutschland" shop bicycle 0.001 Deutschland FALSE
\ No newline at end of file
diff --git a/data/reference_data/osm_cache_unedited.tsv b/data/reference_data/osm_cache_unedited.tsv
new file mode 100644
index 000000000..b1a525301
--- /dev/null
+++ b/data/reference_data/osm_cache_unedited.tsv
@@ -0,0 +1,10758 @@
+query query_date place_id osm_type display_name class type importance address.country address.country_code un_region un_subregion
+new york university abu dhabi 2021-02-03 148462781 way جامعة نيويورك أبوظبي, جزيرة السعديات, جامعة نيويورك أبوظبي, أبوظبي, أبو ظبي, الإمارات العربية المتØدة amenity university 0.336487354815963 الإمارات العربية المتØدة ae Asia Western Asia
+ministry of environmental protection 2021-02-03 139477241 way The Ministry of Environmental Protection, مارينا أم القيوين, أم القيوين, الإمارات العربية المتØدة landuse commercial 0.6 الإمارات العربية المتØدة ae Asia Western Asia
+masdar 2021-02-03 40179978 node Masdar, Pedestrian Zone Masdar, مدينة مصدر, أبوظبي, أبو ظبي, 46450, الإمارات العربية المتØدة highway bus_stop 0.101 الإمارات العربية المتØدة ae Asia Western Asia
+special committee 2021-02-03 57489199 node Special Olympics 2019 Local Committee Offices, شارع الشيخ راشد بن سعيد, Fairmont Residences, مدينة خليÙ<81>Ø©, أبوظبي, أبو ظبي, 63171, الإمارات العربية المتØدة office government 0.201 الإمارات العربية المتØدة ae Asia Western Asia
+ias 2021-02-03 258381607 relation جزيرة ياس, أبوظبي, أبو ظبي, الإمارات العربية المتØدة place island 0.392592281336849 الإمارات العربية المتØدة ae Asia Western Asia
+novaya zemlya 2021-02-03 259223381 relation Novaya Zemlya, دبي, الإمارات العربية المتØدة place islet 0.45 الإمارات العربية المتØدة ae Asia Western Asia
+rochester institute of technology 2021-02-03 46292016 node Rochester Institute of Technology, شارع الشيخ Ù…Øمد بن زايد, المدينة الدولية, دبي, 341296, الإمارات العربية المتØدة building public 0.633228686818865 الإمارات العربية المتØدة ae Asia Western Asia
+manchester business school 2021-02-03 42982352 node Manchester Business School, شارع البروج, قرية المعرÙ<81>Ø©, دبي, 11999, الإمارات العربية المتØدة building university 0.301 الإمارات العربية المتØدة ae Asia Western Asia
+united arab emirates 2021-02-03 258427713 relation الإمارات العربية المتØدة boundary administrative 0.715277344543931 الإمارات العربية المتØدة ae Asia Western Asia
+american university of sharjah 2021-02-03 53275531 node American university sharjah, STAIR 06, Al Juraina 1, ملويلØ, الشارقة, 120100, الإمارات العربية المتØدة amenity university 0.641036070852761 الإمارات العربية المتØدة ae Asia Western Asia
+jaea 2021-02-03 176884644 way د جلال اباد هوايي ډګر, Jalalabad Torkham Highway, Khoshkombat, بهسود ولسوالÛ<8d>, ننگرهار ولايت, 0039, اÙ<81>غانستان aeroway aerodrome 0.335429261886761 اÙ<81>غانستان af Asia Southern Asia
+sra 2021-02-03 17142841 node Sra, Øصارک ولسوالÛ<8d>, ننگرهار ولايت, اÙ<81>غانستان place town 0.4 اÙ<81>غانستان af Asia Southern Asia
+afghanistan 2021-02-03 258408076 relation اÙ<81>غانستان boundary administrative 0.747027482837314 اÙ<81>غانستان af Asia Southern Asia
+aei 2021-02-03 258465287 relation Anguilla boundary administrative 0.597033622148582 Anguilla ai Americas Caribbean
+polytechnic university of tirana 2021-02-03 185277358 way Universiteti Politeknik i Tiranës, 4, Sheshi Nënë Tereza, Libri Universitar, Njësia Bashkiake Nr. 5, Tiranë, Bashkia Tiranë, Qarku i Tiranës, Shqipëria qendrore, 1001-1028, Shqipëria amenity university 0.351332014915526 Shqipëria al Europe Southern Europe
+albania 2021-02-03 258008970 relation Shqipëria boundary administrative 0.727911798893737 Shqipëria al Europe Southern Europe
+romesberg 2021-02-03 6516142 node Romës, Armen, Bashkia Selenicë, Qarku i Vlorës, Shqipëria jugore, 9427, Shqipëria place village 0.275 Shqipëria al Europe Southern Europe
+university of tirana 2021-02-03 185277358 way Universiteti Politeknik i Tiranës, 4, Sheshi Nënë Tereza, Libri Universitar, Njësia Bashkiake Nr. 5, Tiranë, Bashkia Tiranë, Qarku i Tiranës, Shqipëria qendrore, 1001-1028, Shqipëria amenity university 0.351332014915526 Shqipëria al Europe Southern Europe
+armenia 2021-02-03 257747794 relation Õ€Õ¡ÕµÕ¡Õ½Õ¿Õ¡Õ¶ boundary administrative 0.731601485333362 Õ€Õ¡ÕµÕ¡Õ½Õ¿Õ¡Õ¶ am Asia Western Asia
+angola 2021-02-03 258358160 relation Angola boundary administrative 0.821117617604629 Angola ao Africa Middle Africa
+nam 2021-02-03 258455224 relation Namibe, Angola boundary administrative 0.595173613781596 Angola ao Africa Middle Africa
+svp 2021-02-03 214275822 way Aeroporto de CuÃto, EN250;EN140, CuÃto, Bié, Angola aeroway aerodrome 0.329555066820797 Angola ao Africa Middle Africa
+teva 2021-02-03 10960093 node Teva, Huambo, Angola place village 0.375 Angola ao Africa Middle Africa
+cnn 2021-02-03 257882605 relation Cunene, Angola boundary administrative 0.473432996069115 Angola ao Africa Middle Africa
+ponta 2021-02-03 259503510 relation Ponta, MunicÃpio de Luanda, Luanda, Angola boundary administrative 0.5 Angola ao Africa Middle Africa
+cvi 2021-02-03 155461170 way Aeropuerto de Caleta Olivia, Ruta Provincial 99, Km. 8, Caleta Olivia, Deseado, Santa Cruz, 9013, Argentina aeroway aerodrome 0.119931111449547 Argentina ar Americas South America
+epa 2021-02-03 96252367 way El Palomar, José Bianco, El Palomar, Partido de Morón, Buenos Aires, 1684, Argentina aeroway aerodrome 0.351537799411788 Argentina ar Americas South America
+auger observatory 2021-02-03 10519055 node Observatorio Pierre Auger, 304, Avenida San MartÃn (Norte), Malargüe, Distrito Ciudad de Malargüe, Departamento Malargüe, Mendoza, Argentina tourism attraction 0.43489332460211 Argentina ar Americas South America
+la pampa 2021-02-03 258441426 relation La Pampa, Argentina boundary administrative 0.710733717290293 Argentina ar Americas South America
+ianigla 2021-02-03 25557881 node Instituto Argentino de NivologÃa, GlaciologÃa y Ciencias Ambientales (IANIGLA), Avenida Adrián Ruiz Leal, Ciudad de Mendoza, Sección 9ª Parque General San MartÃn, Departamento Capital, Mendoza, M5547, Argentina amenity college 0.101 Argentina ar Americas South America
+corrientes 2021-02-03 257819256 relation Corrientes, Argentina boundary administrative 0.638272357177901 Argentina ar Americas South America
+ar 2021-02-03 258404994 relation Argentina boundary administrative 0.910104194561691 Argentina ar Americas South America
+anses 2021-02-03 76657057 node ANSES, 1192, Doctor Arturo R. de la Serna, General Lavalle, Partido de General Lavalle, Buenos Aires, 7103, Argentina office government 0.375244632729739 Argentina ar Americas South America
+atic 2021-02-03 50671745 node Atic, Ingeniero White, Partido de BahÃa Blanca, Buenos Aires, 8013, Argentina place neighbourhood 0.35 Argentina ar Americas South America
+argentina 2021-02-03 258404994 relation Argentina boundary administrative 0.910104194561691 Argentina ar Americas South America
+westinghouse 2021-02-03 129730400 way Westinghouse, Ituzaingó, Córdoba, Municipio de Córdoba, PedanÃa Capital, Departamento Capital, Córdoba, X5020, Argentina highway residential 0.2 Argentina ar Americas South America
+córdoba national observatory 2021-02-03 122297187 way Observatorio Astronómico de Córdoba, 854, Francisco N. de Laprida, Observatorio, Córdoba, Municipio de Córdoba, PedanÃa Capital, Departamento Capital, Córdoba, X5000, Argentina building public 0.101 Argentina ar Americas South America
+us epa 2021-02-03 96252367 way El Palomar, José Bianco, El Palomar, Partido de Morón, Buenos Aires, 1684, Argentina aeroway aerodrome 0.351537799411788 Argentina ar Americas South America
+aol 2021-02-03 165974980 way Aeropuerto Paso De Los Libres, Avenida Arturo Frondizi, B 60 viv, 50 VIV G1,2,3,4, Municipio de Paso de los Libres, Departamento Paso de los Libres, Corrientes, W3230FLP, Argentina aeroway aerodrome 0.331005307834616 Argentina ar Americas South America
+university of buenos aires 2021-02-03 59478624 node universidad de Morón, 221, Lima, Monserrat, Buenos Aires, Comuna 1, Ciudad Autónoma de Buenos Aires, 1076, Argentina amenity school 0.201 Argentina ar Americas South America
+pierre auger observatory 2021-02-03 10519055 node Observatorio Pierre Auger, 304, Avenida San MartÃn (Norte), Malargüe, Distrito Ciudad de Malargüe, Departamento Malargüe, Mendoza, Argentina tourism attraction 0.53489332460211 Argentina ar Americas South America
+conicet 2021-02-03 302226945 relation CONICET, BahÃa Blanca, Partido de BahÃa Blanca, Buenos Aires, Argentina boundary administrative 0.4 Argentina ar Americas South America
+pfizer 2021-02-03 258561463 relation Pfizer, Trujui, Partido de Moreno, Buenos Aires, Argentina boundary administrative 0.4 Argentina ar Americas South America
+subaru 2021-02-03 201692997 way Subaru, MartÃnez Oeste, MartÃnez, Partido de San Isidro, Buenos Aires, Argentina landuse industrial 0.3 Argentina ar Americas South America
+giudice 2021-02-03 108561010 way Giudice, Paraná, Municipio de Paraná, Distrito Sauce, Departamento Paraná, Entre RÃos, E3104HMA, Argentina highway residential 0.2 Argentina ar Americas South America
+saa 2021-02-03 251041075 way Aeropuerto General Acha, 2356, Manuel J. Campos, General Acha, Municipio de General Acha, Departamento Utracán, La Pampa, L8200, Argentina aeroway aerodrome 0.2885709817045 Argentina ar Americas South America
+laguna diamante 2021-02-03 184628204 way Laguna Diamante, Departamento Antofagasta de la Sierra, Catamarca, K4705, Argentina natural water 0.4 Argentina ar Americas South America
+santa fe 2021-02-03 258372619 relation Santa Fe, Argentina boundary administrative 0.771095269263292 Argentina ar Americas South America
+university of innsbruck 2021-02-03 95953179 way Universität Innsbruck Campus Innrain, Innerkoflerstraße, Innenstadt, Innsbruck, Tirol, 6020, Österreich amenity university 0.728386601652889 Österreich at Europe Western Europe
+university of vienna 2021-02-03 258520179 relation Universität Wien, 1, Universitätsring, Schottenviertel, Innere Stadt, Wien, 1010, Österreich building university 0.282582546755277 Österreich at Europe Western Europe
+central european university 2021-02-03 299890380 way Central European University, 51, Quellenstraße, KG Favoriten, Favoriten, Wien, 1100, Österreich amenity university 0.749444237200763 Österreich at Europe Western Europe
+eib 2021-02-03 97328818 way Umspannwerk Eibesbrunn, Eibesbrunn, Gemeinde Großebersdorf, Bezirk Mistelbach, Niederösterreich, 2203, Österreich landuse industrial 0.3 Österreich at Europe Western Europe
+institute of science and technology austria 2021-02-03 3201906 node Institute of Science and Technology (IST Austria), Am Campus, Maria Gugging, Gemeinde Klosterneuburg, Bezirk Tulln, Niederösterreich, 3400, Österreich amenity university 0.601 Österreich at Europe Western Europe
+paho 2021-02-03 1154495 node Per-Albin-Hansson-Siedlung Ost, KG Oberlaa Stadt, Favoriten, Wien, 1100, Österreich place neighbourhood 0.25 Österreich at Europe Western Europe
+university of salzburg 2021-02-03 120296912 way Universität Salzburg - Unipark, 1, Erzabt-Klotz-Straße, Nonntal, Salzburg, 5020, Österreich amenity university 0.577768525385992 Österreich at Europe Western Europe
+joanneum research 2021-02-03 100346870 way JOANNEUM RESEARCH - DIGITAL Institut für Informations- und Kommunikationssysteme, 17, Steyrergasse, Jakomini, Graz, Steiermark, 8010, Österreich building yes 0.201 Österreich at Europe Western Europe
+space research institute 2021-02-03 119966043 way Österreichische Akademie der Wissenschaften, Institut für Weltraumforschung, 6, Schmiedlstraße, Messendorfberg, Sankt Peter, Graz, Steiermark, 8042, Österreich amenity public_building 0.001 Österreich at Europe Western Europe
+gpg 2021-02-03 72976686 node GPG, Wollöster, Kobledt, Eglsee, Burgkirchen, Bezirk Braunau am Inn, Oberösterreich, 5274, Österreich shop window_blind 0.101 Österreich at Europe Western Europe
+university of graz 2021-02-03 111433427 way Institut für Amerikanistik, Karl-Franzens-Universität Graz, 25, Attemsgasse, Univiertel, Geidorf, Graz, Steiermark, 8010, Österreich building university 0.101 Österreich at Europe Western Europe
+erwin schrödinger international institute for mathematical physics 2021-02-03 55212209 node Erwin-Schrödinger-Institut für Mathematische Physik, 9, Boltzmanngasse, Thurygrund, KG Alsergrund, Alsergrund, Wien, 1090, Österreich amenity university 0.516167966338533 Österreich at Europe Western Europe
+international institute for applied systems analysis 2021-02-03 41950525 node IIASA, 1, Schlossplatz, Laxenburg, Gemeinde Laxenburg, Bezirk Mödling, Niederösterreich, 2361, Österreich office research 0.001 Österreich at Europe Western Europe
+international energy agency 2021-02-03 149447246 way Internationale Atomenergie-Organisation IAEO, Bruno-Kreisky-Platz, Donau City, KG Kaisermühlen, Donaustadt, Wien, 1220, Österreich building yes 0.101 Österreich at Europe Western Europe
+bec 2021-02-03 258128656 relation Wien, Österreich boundary administrative 0.769412325825045 Österreich at Europe Western Europe
+taigen 2021-02-03 568295 node Taigen, Irrsdorf, Straßwalchen, Bezirk Salzburg-Umgebung, Salzburg, 5204, Österreich place hamlet 0.35 Österreich at Europe Western Europe
+institute of molecular pathology 2021-02-03 172663383 way Research Institute of Molecular Pathology (IMP), 1, Campus-Vienna-Biocenter, Neu Marx, KG Landstraße, Landstraße, Wien, 1030, Österreich amenity research_institute 0.689701883147039 Österreich at Europe Western Europe
+circuit therapeutics 2021-02-03 193999341 way Stuwerviertel, KG Leopoldstadt, Leopoldstadt, Wien, 1020, Österreich highway raceway 0.1 Österreich at Europe Western Europe
+graz university of technology 2021-02-03 258643242 relation Technische Universität Graz, Eduard-Richter-Gasse, Herz-Jesu-Viertel, Sankt Leonhard, Graz, Steiermark, 8010, Österreich amenity university 0.532228989952608 Österreich at Europe Western Europe
+ctbto 2021-02-03 148373856 way Vienna International Centre, 5, Wagramer Straße, KG Kaisermühlen, Donaustadt, Wien, 1400, Österreich place house 0.392168689295747 Österreich at Europe Western Europe
+medical university of vienna 2021-02-03 258409826 relation Ehemalige I. Med. Univ. Klink, 18-20, Michelbeuern, KG Alsergrund, Alsergrund, Wien, 1090, Österreich landuse brownfield 0.2 Österreich at Europe Western Europe
+international atomic energy agency 2021-02-03 149447246 way Internationale Atomenergie-Organisation IAEO, Bruno-Kreisky-Platz, Donau City, KG Kaisermühlen, Donaustadt, Wien, 1220, Österreich building yes 0.101 Österreich at Europe Western Europe
+wehi 2021-02-03 258340208 relation Gemeinde Weiler, Bezirk Feldkirch, Vorarlberg, 6837, Österreich boundary administrative 0.384723197268746 Österreich at Europe Western Europe
+austrian academy of sciences 2021-02-03 119966043 way Österreichische Akademie der Wissenschaften, Institut für Weltraumforschung, 6, Schmiedlstraße, Messendorfberg, Sankt Peter, Graz, Steiermark, 8042, Österreich amenity public_building 0.001 Österreich at Europe Western Europe
+austria 2021-02-03 257659808 relation Österreich boundary administrative 0.823043874164126 Österreich at Europe Western Europe
+nhm 2021-02-03 258348028 relation Naturhistorisches Museum, 7, Burgring, Schottenviertel, Innere Stadt, Wien, 1010, Österreich tourism museum 0.441911671250342 Österreich at Europe Western Europe
+melk 2021-02-03 258502438 relation Melk, Bezirk Melk, Niederösterreich, 3281, Österreich waterway river 0.494052338771708 Österreich at Europe Western Europe
+ibs 2021-02-03 110424761 way 22, IBS, Teufenbach, Teufenbach-Katsch, Bezirk Murau, Steiermark, 8833, Österreich landuse industrial 0.3 Österreich at Europe Western Europe
+vienna university of technology 2021-02-03 258307874 relation TU Wien, Hauptgebäude, Olga-Wisinger-Florian-Platz, Wieden, KG Wieden, Wieden, Wien, 1040, Österreich building university 0.286834742964615 Österreich at Europe Western Europe
+university of veterinary medicine vienna 2021-02-03 96379147 way Veterinärmedizinische Universität, Angyalföldstraße, KG Leopoldau, Floridsdorf, Wien, 1210, Österreich amenity university 0.342242222837154 Österreich at Europe Western Europe
+gapp 2021-02-03 109776638 way Gapp, 17, Grazbachgasse, Jakomini, Graz, Steiermark, 8010, Österreich shop safety_equipment 0.101 Österreich at Europe Western Europe
+areva 2021-02-03 108135800 way Areva, Bergham, Enzenwinkl, Leonding, Bezirk Linz-Land, Oberösterreich, 4060, Österreich landuse commercial 0.3 Österreich at Europe Western Europe
+national press club 2021-02-03 125056817 way National Press Club, National Circuit, Barton, South Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia building office 0.567719150556049 Australia au Oceania Australia and New Zealand
+australian institute of marine science 2021-02-03 174039789 way Australian Institute of Marine Science, Cape Cleveland Road, Cape Cleveland, Townsville City, Queensland, Australia office research 0.501 Australia au Oceania Australia and New Zealand
+gold coast 2021-02-03 259463504 relation Gold Coast City, Queensland, Australia boundary administrative 0.770120034131775 Australia au Oceania Australia and New Zealand
+university of melbourne 2021-02-03 258899917 relation University of Melbourne, Royal Parade, Parkville, City of Melbourne, Victoria, 3010, Australia amenity university 0.849205724971094 Australia au Oceania Australia and New Zealand
+la trobe university 2021-02-03 59775555 node La Trobe University, Arnold Street, Bendigo, City of Greater Bendigo, Victoria, 3550, Australia amenity university 0.301 Australia au Oceania Australia and New Zealand
+australian institute of health and welfare 2021-02-03 115890715 way Australian Institute of Health and Welfare, Belconnen Bikeway, Bruce, District of Belconnen, Australian Capital Territory, 2617, Australia building yes 0.601 Australia au Oceania Australia and New Zealand
+university of central america 2021-02-03 702491 node Southern Cross University Coffs Harbour Campus, Doug Knight Drive, Coffs Harbour, Coffs Harbour City Council, New South Wales, 2450, Australia amenity university 0.201 Australia au Oceania Australia and New Zealand
+fss 2021-02-03 30204607 node Flinders Street, Melbourne, City of Melbourne, Victoria, 3000, Australia railway station 0.427742562950671 Australia au Oceania Australia and New Zealand
+university of monash 2021-02-03 87739881 way Monash University, Clayton Campus, Bus Loop, Clayton, City of Monash, Victoria, 3800, Australia amenity university 0.567719150556049 Australia au Oceania Australia and New Zealand
+australian broadcasting corporation 2021-02-03 154556170 way Australian Broadcasting Corporation, 114, Grey Street, South Bank, South Brisbane, Brisbane City, Queensland, 4101, Australia building yes 0.889492484386201 Australia au Oceania Australia and New Zealand
+nuffield council 2021-02-03 131986368 way Nuffield Park, Victoria Square, Zetland, Sydney, Council of the City of Sydney, New South Wales, 2017, Australia leisure park 0.35 Australia au Oceania Australia and New Zealand
+australian archaeological association 2021-02-03 136959246 way Australian Local Government Association, 8, Geils Court, Deakin, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia building yes 0.201 Australia au Oceania Australia and New Zealand
+commonwealth bank of australia 2021-02-03 17320127 node Commonwealth Bank of Australia, 208-214, Kingaroy Street, Kingaroy, South Burnett Regional, Queensland, 4610, Australia amenity bank 0.401 Australia au Oceania Australia and New Zealand
+university of wollongong 2021-02-03 85003768 way University of Wollongong, Dallas Street, Keiraville, Wollongong City Council, New South Wales, 2500, Australia amenity university 0.751344582361174 Australia au Oceania Australia and New Zealand
+united ki 2021-02-03 3232177 node United Rangeway, 50, Rifle Range Road, Rangeway, Geraldton, City Of Greater Geraldton, Western Australia, 6530, Australia amenity fuel 0.101 Australia au Oceania Australia and New Zealand
+us national security council 2021-02-03 138068943 way Security, Anna Clark Avenue, Nirimba Fields, Sydney, Blacktown City Council, New South Wales, 2763, Australia building university 0.301 Australia au Oceania Australia and New Zealand
+irvine city council 2021-02-03 258831478 relation Mount Irvine, Blue Mountains City Council, New South Wales, 2786, Australia boundary administrative 0.55 Australia au Oceania Australia and New Zealand
+darwin 2021-02-03 16499368 node Darwin, City of Darwin, Northern Territory, 0800, Australia place city 0.679885767346348 Australia au Oceania Australia and New Zealand
+macquarie university 2021-02-03 139533038 way Macquarie University, University Avenue, Macquarie Park, Sydney, Council of the City of Ryde, New South Wales, 2113, Australia amenity university 0.669953649018245 Australia au Oceania Australia and New Zealand
+western australia department of parks and wildlife 2021-02-03 33111781 node Gnaala Mia Campground, Loop 2, Williams, Shire Of Williams, Western Australia, Australia tourism camp_site 0.301 Australia au Oceania Australia and New Zealand
+geolink 2021-02-03 62868078 node Geolink, 103, Faulkner Street, North Hill, Armidale, Armidale Regional Council, New South Wales, 2350, Australia office engineers 0.101 Australia au Oceania Australia and New Zealand
+general medical council 2021-02-03 212333308 way Garvan Institute of Medical Research, Chaplin Street, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia building yes 0.491360254031496 Australia au Oceania Australia and New Zealand
+csiro 2021-02-03 148535125 way CSIRO, Mayfield West, Newcastle, Newcastle City Council, New South Wales, 2304, Australia landuse industrial 0.3 Australia au Oceania Australia and New Zealand
+queensland brain institute 2021-02-03 103375921 way Queensland Brain Institute, Research Road, St Lucia, Brisbane City, Queensland, 4072, Australia building university 0.301 Australia au Oceania Australia and New Zealand
+department of marine sciences 2021-02-03 99862102 way Department of Earth and Marine Sciences, Linnaeus Way, Acton, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia building university 0.401 Australia au Oceania Australia and New Zealand
+antarctic division 2021-02-03 101676576 way Australian Antarctic Division, Kingston, Hobart, Kingborough, Tasmania, Australia landuse commercial 0.4 Australia au Oceania Australia and New Zealand
+leviathan 2021-02-03 303895 node Leviathan, Inverell Shire Council, New South Wales, Australia place locality 0.225 Australia au Oceania Australia and New Zealand
+tru group 2021-02-03 83205259 node Tru-fit Denture Group, 84, Grange Road, Alphington, City of Darebin, Victoria, 3078, Australia shop medical_supply 0.201 Australia au Oceania Australia and New Zealand
+charles sturt university 2021-02-03 258986170 relation Charles Sturt University, Wagga Wagga City Council, New South Wales, 2678, Australia boundary administrative 0.55 Australia au Oceania Australia and New Zealand
+nsw 2021-02-03 258358609 relation New South Wales, Australia boundary administrative 0.700850708194693 Australia au Oceania Australia and New Zealand
+rmit university 2021-02-03 134618167 way RMIT University, Hamilton - Chatsworth Road, Tarrington, Hamilton, Shire of Southern Grampians, Victoria, 3300, Australia amenity university 0.201 Australia au Oceania Australia and New Zealand
+department of immigration and citizenship 2021-02-03 157090843 way Department of Immigration and Citizenship, 76, Thomas Street, Dandenong, City of Greater Dandenong, Victoria, 3175, Australia building office 0.501 Australia au Oceania Australia and New Zealand
+molonglo observatory synthesis telescope 2021-02-03 178337614 way Molonglo Observatory Synthesis Telescope, Hoskinstown Road, Hoskinstown, Bungendore, Queanbeyan-Palerang Regional Council, New South Wales, 2621, Australia man_made antenna 0.401 Australia au Oceania Australia and New Zealand
+nature research 2021-02-03 158110702 way Pauline Toner Butterfly Nature Conservation Reserve, Woodridge, Eltham, Shire of Nillumbik, Victoria, 3095, Australia natural wood 0.3 Australia au Oceania Australia and New Zealand
+thomson innovation 2021-02-03 10691481 node Thomson, Rathdowne Street, Melbourne Innovation District, Carlton, City of Melbourne, Victoria, 3053, Australia shop estate_agent 0.201 Australia au Oceania Australia and New Zealand
+australia 2021-02-03 257740098 relation Australia boundary administrative 0.952135063915111 Australia au Oceania Australia and New Zealand
+university of south australia 2021-02-03 44559024 node University of South Australia, Wireless Road West, Suttontown, Mount Gambier, City of Mount Gambier, South Australia, 5290, Australia building university 0.401 Australia au Oceania Australia and New Zealand
+australia institute 2021-02-03 47173025 node Fitness Institute Australia, Elizabeth Street, Melbourne Innovation District, Melbourne, City of Melbourne, Victoria, 3000, Australia office company 0.201 Australia au Oceania Australia and New Zealand
+fisheries 2021-02-03 50756594 node The Fisheries, Coles Bay, Glamorgan-Spring Bay, Tasmania, 7251, Australia place neighbourhood 0.35 Australia au Oceania Australia and New Zealand
+university of queensland 2021-02-03 258259141 relation The University of Queensland, Gladstone Road, St Lucia, Brisbane City, Queensland, 4072, Australia amenity university 0.821330978816988 Australia au Oceania Australia and New Zealand
+universities australia 2021-02-03 138620341 way Australian Universities Centre, Geils Court, Deakin, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia building yes 0.201 Australia au Oceania Australia and New Zealand
+school of information science and technology 2021-02-03 114559341 way Information Science & Technology, Second floor access bridge between Earth Sciences and IST, Bedford Park, Adelaide, City of Mitcham, South Australia, 5042, Australia building yes 0.501 Australia au Oceania Australia and New Zealand
+jewish general hospital 2021-02-03 223245688 way Zee Germans, Cessnock, Cessnock City Council, New South Wales, Australia highway path 0.075 Australia au Oceania Australia and New Zealand
+science exchange 2021-02-03 144377931 way The Science Exchange, 55, Exchange Place, Adelaide, Adelaide City Council, South Australia, 5000, Australia building yes 0.201 Australia au Oceania Australia and New Zealand
+centre for medical research and innovation 2021-02-03 151744793 way Centre for Medical Research, Royal Parade, Melbourne Innovation District, Parkville, Melbourne, City of Melbourne, Victoria, 3000, Australia building yes 0.501 Australia au Oceania Australia and New Zealand
+murchison widefield array 2021-02-03 215884568 way Murchison Widefield Array, Beringarra-Pindar Road, South Murchison, Shire Of Murchison, Western Australia, Australia man_made telescope 0.301 Australia au Oceania Australia and New Zealand
+sea council 2021-02-03 48813444 node Sea Life Center, Pier 26, Darling Quarter, Sydney, Council of the City of Sydney, New South Wales, 2000, Australia tourism attraction 0.572421960066799 Australia au Oceania Australia and New Zealand
+axl 2021-02-03 195087476 way Alexandria Homestead Airport, Ranken Road, Connells Lagoon, Nicholson, Barkly Region, Northern Territory, Australia aeroway aerodrome 0.001 Australia au Oceania Australia and New Zealand
+australia telescope compact array 2021-02-03 6458901 node CSIRO Australia Telescope Compact Array, Heliograph Track, Narrabri, Narrabri Shire Council, New South Wales, 2390, Australia tourism attraction 0.401 Australia au Oceania Australia and New Zealand
+national space workshop 2021-02-03 209490340 way Space, Turner, North Canberra, District of Canberra Central, Australian Capital Territory, 2612, Australia landuse residential 0.3 Australia au Oceania Australia and New Zealand
+marine conservation group 2021-02-03 164392010 way Great Barrier Reef Coast Marine Park - Herbet Creek, The Percy Group, Isaac Regional, Queensland, Australia landuse conservation 0.4 Australia au Oceania Australia and New Zealand
+cjd 2021-02-03 78556896 node CJD, 210, Northbourne Road, Campbellfield, City of Hume, Victoria, 3062, Australia building yes 0.101 Australia au Oceania Australia and New Zealand
+science & technology australia 2021-02-03 99632951 way Science 1 (N25), Technology Lane, Nathan, Brisbane City, Queensland, 4111, Australia building university 0.301 Australia au Oceania Australia and New Zealand
+arctic council 2021-02-03 158850149 way Arctic Way, Kellyville Ridge, Sydney, Blacktown City Council, New South Wales, 2769, Australia highway residential 0.3 Australia au Oceania Australia and New Zealand
+australia national university 2021-02-03 43175627 node Janefield Drive LPO, Janefield Drive, University Hill Precinct, Bundoora, Mill Park, City of Whittlesea, Victoria, 3082, Australia amenity post_office 0.201 Australia au Oceania Australia and New Zealand
+bond university 2021-02-03 2922698 node Bond University, University Drive, Robina, Gold Coast City, Queensland, 4227, Australia highway bus_stop 0.201 Australia au Oceania Australia and New Zealand
+uc 2021-02-03 257740098 relation Australia boundary administrative 0.852135063915112 Australia au Oceania Australia and New Zealand
+unsw 2021-02-03 102614348 way University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia amenity university 0.61490411729019 Australia au Oceania Australia and New Zealand
+queensland university of technology 2021-02-03 94497763 way Queensland University of Technology, Kelvin Grove Road, Kelvin Grove, Brisbane City, Queensland, 4059, Australia amenity university 0.401 Australia au Oceania Australia and New Zealand
+university of newcastle 2021-02-03 127867749 way University of Newcastle, Callaghan Campus, University Drive, Callaghan, Newcastle, Newcastle City Council, New South Wales, 2308, Australia amenity university 0.301 Australia au Oceania Australia and New Zealand
+australian national university 2021-02-03 158291441 way Australian National University, Lawson Crescent, Acton, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia amenity university 0.846355606540819 Australia au Oceania Australia and New Zealand
+garvan institute of medical research 2021-02-03 212333308 way Garvan Institute of Medical Research, Chaplin Street, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia building yes 0.791360254031496 Australia au Oceania Australia and New Zealand
+university of sydney 2021-02-03 258428008 relation The University of Sydney, Sparkes Street, Camperdown, Sydney, Council of the City of Sydney, New South Wales, 2006, Australia amenity university 0.859671553892341 Australia au Oceania Australia and New Zealand
+australian bureau of meteorology 2021-02-03 96874627 way The Australian Bureau of Meteorology Building, 700, Collins Street, Batman's Hill, Docklands, South Wharf, City of Melbourne, Victoria, 3008, Australia building yes 0.401 Australia au Oceania Australia and New Zealand
+inquisition 2021-02-03 38185509 node Inquisition Hill, Shoalhaven City Council, New South Wales, Australia natural peak 0.4 Australia au Oceania Australia and New Zealand
+γ-ray observatory 2021-02-03 181119800 way University of Tasmania Cosmic Ray Observatory, Pinnacle Feeder Track, City of Hobart, Tasmania, Australia man_made observatory 0.201 Australia au Oceania Australia and New Zealand
+murdoch childrens research institute 2021-02-03 82024678 node Murdoch Children's Research Institute, Flemington Road, Parkville, North Melbourne, City of Melbourne, Victoria, 3052, Australia amenity research_institute 0.301 Australia au Oceania Australia and New Zealand
+cfs 2021-02-03 114833255 way Coffs Harbour Regional Airport, Hogbin Drive, Coffs Harbour, Coffs Harbour City Council, New South Wales, 2450, Australia aeroway aerodrome 0.350918373098637 Australia au Oceania Australia and New Zealand
+australian institute for bioengineering 2021-02-03 95576953 way Australian Institute for Bioengineering and Nanotechnology, Old Cooper Road, St Lucia, Brisbane City, Queensland, 4072, Australia building university 0.401 Australia au Oceania Australia and New Zealand
+university of tasmania 2021-02-03 95796124 way University of Tasmania, Alexander Street, Sandy Bay, Hobart, City of Hobart, Tasmania, 7005, Australia amenity university 0.758734778928549 Australia au Oceania Australia and New Zealand
+the jewish state 2021-02-03 223245688 way Zee Germans, Cessnock, Cessnock City Council, New South Wales, Australia highway path 0.075 Australia au Oceania Australia and New Zealand
+aurora australis 2021-02-03 207551621 way Aurora, Kembla Street, Wollongong, Wollongong City Council, New South Wales, 2500, Australia building yes 0.101 Australia au Oceania Australia and New Zealand
+southern cross university in lismore 2021-02-03 162934407 way Southern Cross University, Highfield Terrace, Goonellabah, Lismore City Council, New South Wales, 2480, Australia amenity university 0.401 Australia au Oceania Australia and New Zealand
+red cross 2021-02-03 200522594 way Australian Red Cross Blood Bank, 100-154, Batman Street, West Melbourne, Melbourne, City of Melbourne, Victoria, 3003, Australia office ngo 0.577343921991154 Australia au Oceania Australia and New Zealand
+charles darwin university 2021-02-03 126921964 way Charles Darwin University, Ellengowen Drive, Brinkin, Darwin, City of Darwin, Northern Territory, 0800, Australia amenity university 0.690444593674683 Australia au Oceania Australia and New Zealand
+james cook university 2021-02-03 162709786 way James Cook University, 1, James Cook Drive, Douglas, Townsville, Townsville City, Queensland, 4811, Australia amenity university 0.72561814389347 Australia au Oceania Australia and New Zealand
+advisory council 2021-02-03 82359808 node Weekes Accounting & Advisory, 211, George Street, Bathurst, Bathurst Regional Council, New South Wales, 2795, Australia office accountant 0.201 Australia au Oceania Australia and New Zealand
+global alliance 2021-02-03 146534335 way OneSchool Global (Perth Campus), Alliance Loop, Willetton, City Of Canning, Western Australia, 6155, Australia amenity school 0.201 Australia au Oceania Australia and New Zealand
+charles sturt university in wagga wagga 2021-02-03 258986170 relation Charles Sturt University, Wagga Wagga City Council, New South Wales, 2678, Australia boundary administrative 0.75 Australia au Oceania Australia and New Zealand
+professionals association 2021-02-03 60049003 node Victorian Allied Health Professionals Association, William Street, West Melbourne, Melbourne, City of Melbourne, Victoria, 3000, Australia office ngo 0.201 Australia au Oceania Australia and New Zealand
+monash university 2021-02-03 95076092 way Monash University, Mile Lane, Parkville, City of Melbourne, Victoria, 3052, Australia amenity university 0.449182950422608 Australia au Oceania Australia and New Zealand
+commonwealth scientific and industrial research organisation 2021-02-03 208662403 way Commonwealth Scientific and Industrial Research Organisation (Floreat Site), 147, Underwood Avenue, Floreat, Town Of Cambridge, City of Nedlands, Western Australia, 6014, Australia amenity research_institute 1.06308792913159 Australia au Oceania Australia and New Zealand
+maurice blackburn 2021-02-03 75072947 node Maurice Blackburn, Rostella Way, Melbourne, City of Melbourne, Victoria, 3000, Australia office lawyer 0.201 Australia au Oceania Australia and New Zealand
+sea grant 2021-02-03 38783636 node Sea Coast Hill, The District Council of Grant, South Australia, Australia natural peak 0.5 Australia au Oceania Australia and New Zealand
+abc 2021-02-03 154556170 way Australian Broadcasting Corporation, 114, Grey Street, South Bank, South Brisbane, Brisbane City, Queensland, 4101, Australia building yes 0.589492484386201 Australia au Oceania Australia and New Zealand
+bureau of meteorology 2021-02-03 147830484 way Bureau Of Meteorology, Kent Town, Adelaide, The City of Norwood Payneham and St Peters, South Australia, 5067, Australia landuse industrial 0.5 Australia au Oceania Australia and New Zealand
+nsw forestry corporation 2021-02-03 196058557 way Banksia Picnic Area, Strickland Falls Trail, Somersby, Gosford, Central Coast Council, New South Wales, 2250, Australia tourism picnic_site 0.001 Australia au Oceania Australia and New Zealand
+murdoch university 2021-02-03 84018837 way Murdoch University, Banksia Terrace, Murdoch, City Of Melville, Western Australia, 6150, Australia amenity university 0.620333972314475 Australia au Oceania Australia and New Zealand
+us public health service 2021-02-03 99223949 way 400 Public Health, 400, Jackson Avenue, Bentley, Town of Victoria Park, Western Australia, 6102, Australia building university 0.301 Australia au Oceania Australia and New Zealand
+murdoch children's research institute 2021-02-03 82024678 node Murdoch Children's Research Institute, Flemington Road, Parkville, North Melbourne, City of Melbourne, Victoria, 3052, Australia amenity research_institute 0.501 Australia au Oceania Australia and New Zealand
+australian capital territory 2021-02-03 258363989 relation Australian Capital Territory, Australia boundary administrative 0.860942226859498 Australia au Oceania Australia and New Zealand
+parliament house 2021-02-03 21288197 node Parliament House, Parliament Drive, Capital Hill, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia tourism attraction 0.620468394176642 Australia au Oceania Australia and New Zealand
+isa 2021-02-03 872993 node Mount Isa Airport, Barkly Highway, Kalkadoon, Mount Isa, Mount Isa City, Queensland, 4825, Australia aeroway aerodrome 0.496970989529109 Australia au Oceania Australia and New Zealand
+university of southern queensland 2021-02-03 102275969 way University of Southern Queensland, West Street, Kearneys Spring, Toowoomba, Toowoomba Regional, Queensland, 4350, Australia amenity university 0.401 Australia au Oceania Australia and New Zealand
+grattan institute 2021-02-03 101841158 way Grattan Institute, Russell Park Lane, Melbourne Innovation District, Carlton, City of Melbourne, Victoria, 3053, Australia building yes 0.201 Australia au Oceania Australia and New Zealand
+university of western australia 2021-02-03 259557956 relation University of Western Australia, 35, Stirling Highway, Claremont, Town of Claremont, Western Australia, 6009, Australia amenity university 0.889177431740209 Australia au Oceania Australia and New Zealand
+open research 2021-02-03 301252280 node Research, Shire of Nillumbik, Victoria, 3095, Australia place town 0.4 Australia au Oceania Australia and New Zealand
+australian antarctic division 2021-02-03 101676576 way Australian Antarctic Division, Kingston, Hobart, Kingborough, Tasmania, Australia landuse commercial 0.5 Australia au Oceania Australia and New Zealand
+university of new south wales sydney 2021-02-03 102614348 way University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia amenity university 1.11490411729019 Australia au Oceania Australia and New Zealand
+forensic institute 2021-02-03 162032267 way Victorian Institute of Forensic Medicine, 65, Kavanagh Street, Southbank, City of Melbourne, Victoria, 3006, Australia office research 0.201 Australia au Oceania Australia and New Zealand
+federal circuit 2021-02-03 118947152 way German Embassy, 119, Empire Circuit, Yarralumla, Canberra, District of Canberra Central, Australian Capital Territory, 2600, Australia office diplomatic 0.36851441835616 Australia au Oceania Australia and New Zealand
+national research alliance 2021-02-03 88815095 way Accident Research Centre, 21, Alliance Lane, Clayton, City of Monash, Victoria, 3800, Australia building yes 0.201 Australia au Oceania Australia and New Zealand
+cns 2021-02-03 193921262 way Cairns Airport, Airport Avenue, Aeroglen, Cairns, Cairns Regional, Queensland, 4870, Australia aeroway aerodrome 0.436307119840041 Australia au Oceania Australia and New Zealand
+colless 2021-02-03 229106860 way Colless Warrambool, Wingadee, Coonamble Shire Council, New South Wales, 2829, Australia waterway stream 0.3 Australia au Oceania Australia and New Zealand
+csl 2021-02-03 97475392 way CSL, Parkville, City of Melbourne, Victoria, 3052, Australia landuse industrial 0.3 Australia au Oceania Australia and New Zealand
+occator 2021-02-03 200702038 way Occator Way, Falcon, Mandurah, City Of Mandurah, Western Australia, Australia highway residential 0.2 Australia au Oceania Australia and New Zealand
+fairley house 2021-02-03 259508544 relation Fairley, Shire of Gannawarra, Victoria, Australia boundary administrative 0.35 Australia au Oceania Australia and New Zealand
+centre for medical research & innovation 2021-02-03 151744793 way Centre for Medical Research, Royal Parade, Melbourne Innovation District, Parkville, Melbourne, City of Melbourne, Victoria, 3000, Australia building yes 0.501 Australia au Oceania Australia and New Zealand
+university of new south wales 2021-02-03 102614348 way University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia amenity university 1.01490411729019 Australia au Oceania Australia and New Zealand
+aqc 2021-02-03 116982466 way AQC carpark, Oban Road, Mount Isa, Mount Isa City, Queensland, 4825, Australia amenity parking 0.101 Australia au Oceania Australia and New Zealand
+brain research 2021-02-03 103375921 way Queensland Brain Institute, Research Road, St Lucia, Brisbane City, Queensland, 4072, Australia building university 0.201 Australia au Oceania Australia and New Zealand
+university of adelaide 2021-02-03 113745459 way University of Adelaide, North Terrace, Adelaide, Adelaide City Council, South Australia, 5005, Australia amenity university 0.79940049921715 Australia au Oceania Australia and New Zealand
+tepco 2021-02-03 258860992 relation Tepco Station, Pastoral Unincorporated Area, South Australia, 5440, Australia boundary administrative 0.35 Australia au Oceania Australia and New Zealand
+global change institute 2021-02-03 149247325 way Global Change Institute, Campbell Place, St Lucia, Brisbane City, Queensland, Australia building university 0.301 Australia au Oceania Australia and New Zealand
+chinese nationalist party 2021-02-03 59443609 node The Chinese Nationalist Party of Australia, Ultimo Road, Haymarket, Sydney, Council of the City of Sydney, New South Wales, 2000, Australia office political_party 0.301 Australia au Oceania Australia and New Zealand
+griffith university 2021-02-03 226907634 way Griffith University, South East Busway, Mount Gravatt, Brisbane City, Queensland, 4121, Australia amenity bus_station 0.201 Australia au Oceania Australia and New Zealand
+r/v falkor 2021-02-03 255379377 way Falkor Road, Arcadia Estate, Officer, Shire of Cardinia, Victoria, 3809, Australia highway proposed 0.4 Australia au Oceania Australia and New Zealand
+unsw sydney 2021-02-03 102614348 way University of New South Wales, Houston Road, UNSW, Kensington, Sydney, Randwick City Council, New South Wales, 2033, Australia amenity university 0.71490411729019 Australia au Oceania Australia and New Zealand
+sunday times 2021-02-03 124957593 way The Sunday Times, James Street, Perth, City of Perth, Western Australia, 6000, Australia building yes 0.201 Australia au Oceania Australia and New Zealand
+james cook university in cairns 2021-02-03 137903302 way James Cook University, 14-88, McGregor Road, Smithfield, Cairns Regional, Queensland, 4878, Australia amenity university 0.82561814389347 Australia au Oceania Australia and New Zealand
+garvan institute 2021-02-03 212333308 way Garvan Institute of Medical Research, Chaplin Street, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia building yes 0.491360254031496 Australia au Oceania Australia and New Zealand
+university of canberra 2021-02-03 95127906 way University of Canberra, University Drive, Bruce, District of Belconnen, Australian Capital Territory, 2617, Australia amenity university 0.731727684347105 Australia au Oceania Australia and New Zealand
+university of technology sydney 2021-02-03 259286837 relation University of Technology Sydney, Goold Street, Chippendale, Sydney, Council of the City of Sydney, New South Wales, 2008, Australia amenity university 0.822968236493861 Australia au Oceania Australia and New Zealand
+doherty institute 2021-02-03 119889961 way Peter Doherty Institute, Grattan Street, Melbourne Innovation District, Melbourne, City of Melbourne, Victoria, 3000, Australia building yes 0.201 Australia au Oceania Australia and New Zealand
+keane 2021-02-03 66988458 node Keane, Moorine Rock, Shire Of Yilgarn, Western Australia, Australia place locality 0.225 Australia au Oceania Australia and New Zealand
+sirius 2021-02-03 209425686 way Sirius, 36-50, Cumberland Street, Dawes Point, Sydney, Council of the City of Sydney, New South Wales, 2000, Australia building apartments 0.358218474293395 Australia au Oceania Australia and New Zealand
+australian research council 2021-02-03 198145984 way Australian Cotton Research Institute, Kamilaroi Highway, Narrabri, Narrabri Shire Council, New South Wales, 2390, Australia office research 0.301 Australia au Oceania Australia and New Zealand
+barmah forest 2021-02-03 258530660 relation Barmah, Shire of Moira, Victoria, Australia boundary administrative 0.378015094618814 Australia au Oceania Australia and New Zealand
+griffith university in nathan 2021-02-03 95356693 way Griffith University Nathan Campus, Griffith Road, Nathan, Brisbane City, Queensland, 4111, Australia amenity university 0.301 Australia au Oceania Australia and New Zealand
+deakin university 2021-02-03 133189487 way Deakin University, 221, Burwood Highway, Burwood, Melbourne, City of Whitehorse, Victoria, 3125, Australia amenity university 0.36265143530573 Australia au Oceania Australia and New Zealand
+western sydney university 2021-02-03 52671569 node Western Sydney University, Kearney Avenue, Kingswood, Sydney, Penrith City Council, New South Wales, 2747, Australia tourism information 0.301 Australia au Oceania Australia and New Zealand
+curtin university 2021-02-03 259557731 relation Curtin University, Rivervale, City of Belmont, Western Australia, 6103, Australia amenity university 0.635785692031318 Australia au Oceania Australia and New Zealand
+nra 2021-02-03 1301653 node Narrandera-Leeton Airport, Irrigation Way, Cudgel, Narrandera, Narrandera Shire Council, New South Wales, 2703, Australia aeroway aerodrome 0.391635072114972 Australia au Oceania Australia and New Zealand
+national space council 2021-02-03 300387881 way Rend-a-space, Marsden Park, Sydney, Blacktown City Council, New South Wales, 2765, Australia landuse commercial 0.4 Australia au Oceania Australia and New Zealand
+flinders university 2021-02-03 145152966 way Flinders University, Shepherds Hill Road, Bellevue Heights, Adelaide, City of Mitcham, South Australia, 5050, Australia amenity university 0.201 Australia au Oceania Australia and New Zealand
+swinburne university of technology 2021-02-03 258895413 relation Swinburne University of Technology (Hawthorn Campus), John Street, Hawthorn, City of Boroondara, Victoria, 3122, Australia amenity university 0.814183292472317 Australia au Oceania Australia and New Zealand
+royal tasmanian botanical gardens 2021-02-03 105955035 way Royal Tasmanian Botanical Gardens, Queens Domain, Hobart, City of Hobart, Tasmania, Australia leisure park 0.691360254031496 Australia au Oceania Australia and New Zealand
+australian academy of science 2021-02-03 143546668 way Australian Academy of Science, Marcus Clarke Street, City, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia amenity school 0.836617872091844 Australia au Oceania Australia and New Zealand
+science council 2021-02-03 113885956 way Science, Funda Close, Bellingen, Bellingen Shire Council, New South Wales, 2454, Australia building school 0.201 Australia au Oceania Australia and New Zealand
+parkes observatory 2021-02-03 267335 node Parkes Observatory, Telescope Road, Parkes, Parkes Shire Council, New South Wales, 2870, Australia tourism attraction 0.201 Australia au Oceania Australia and New Zealand
+department of science and innovation 2021-02-03 66634213 node Department of Industry, Innovation and Science, 10, Binara Street, City, Canberra, District of Canberra Central, Australian Capital Territory, 2601, Australia office government 0.501 Australia au Oceania Australia and New Zealand
+national ocean council 2021-02-03 258808648 relation Ocean Shores, Byron Shire Council, New South Wales, 2483, Australia boundary administrative 0.45 Australia au Oceania Australia and New Zealand
+australian museum 2021-02-03 89870859 way Australian Museum, Cross City Tunnel, Darlinghurst, Sydney, Council of the City of Sydney, New South Wales, 2010, Australia tourism museum 0.644873557645695 Australia au Oceania Australia and New Zealand
+australian science media centre 2021-02-03 56940969 node Australian Science Media Centre, 55, Exchange Place, Adelaide, Adelaide City Council, South Australia, 5000, Australia office yes 0.401 Australia au Oceania Australia and New Zealand
+james cook university in australia 2021-02-03 183284314 way Curtin University Sydney, Regent Street, Chippendale, Sydney, Council of the City of Sydney, New South Wales, 2008, Australia amenity university 0.301 Australia au Oceania Australia and New Zealand
+azerbaijan 2021-02-03 257577722 relation Azərbaycan boundary administrative 0.740930969969447 Azərbaycan az Asia Western Asia
+dst 2021-02-03 561986 node Dəstə, Ordubad rayonu, Naxçıvan Muxtar Respublikası, Azərbaycan place village 0.321073131097349 Azərbaycan az Asia Western Asia
+duke 2021-02-03 24796492 node Duke, Općina Kiseljak, Srednjobosanski kanton / Županija SrediÅ¡nja Bosna, Federacija Bosne i Hercegovine, Bosna i Hercegovina / БоÑ<81>на и Херцеговина place village 0.375 Bosna i Hercegovina / БоÑ<81>на и Херцеговина ba Europe Southern Europe
+lav 2021-02-03 13949201 node Lav, M-4, Novakovići, Залужани, Banja Luka, Grad Banja Luka, Република СрпÑ<81>ка / Republika Srpska, 78000, Bosna i Hercegovina / БоÑ<81>на и Херцеговина amenity bar 0.101 Bosna i Hercegovina / БоÑ<81>на и Херцеговина ba Europe Southern Europe
+cobe 2021-02-03 24161088 node ÄŒobe, Općina Maglaj, ZeniÄ<8d>ko-dobojski kanton, Federacija Bosne i Hercegovine, Bosna i Hercegovina / БоÑ<81>на и Херцеговина place village 0.300938798149577 Bosna i Hercegovina / БоÑ<81>на и Херцеговина ba Europe Southern Europe
+fbi 2021-02-03 258367640 relation Federacija Bosne i Hercegovine, Bosna i Hercegovina / БоÑ<81>на и Херцеговина boundary administrative 0.630855216331828 Bosna i Hercegovina / БоÑ<81>на и Херцеговина ba Europe Southern Europe
+pliva 2021-02-03 172671795 way Pliva, Pijavice, Jajce, Općina Jajce, Srednjobosanski kanton / Županija SrediÅ¡nja Bosna, Federacija Bosne i Hercegovine, 70101, Bosna i Hercegovina / БоÑ<81>на и Херцеговина waterway river 0.375 Bosna i Hercegovina / БоÑ<81>на и Херцеговина ba Europe Southern Europe
+bosnia and herzegovina 2021-02-03 258531774 relation Bosna i Hercegovina / БоÑ<81>на и Херцеговина boundary administrative 0.743972985444669 Bosna i Hercegovina / БоÑ<81>на и Херцеговина ba Europe Southern Europe
+icmp 2021-02-03 36728774 node ICMP - International Commission on Missing Persons, Bosne Srebrene, Mejdan, Tuzla, Grad Tuzla, Tuzlanski kanton, Federacija Bosne i Hercegovine, 75000, Bosna i Hercegovina / БоÑ<81>на и Херцеговина office company 0.101 Bosna i Hercegovina / БоÑ<81>на и Херцеговина ba Europe Southern Europe
+society 2021-02-03 82341924 node Society, Massiah Street, Saint John, BB18003, Barbados place hamlet 0.35 Barbados bb Americas Caribbean
+barbados 2021-02-03 258050720 relation Barbados boundary administrative 0.759547412593721 Barbados bb Americas Caribbean
+bgi 2021-02-03 102608522 way Grantley Adams International Airport, Tom Adams Highway, Charnocks, Fairy Valley, Christ Church, CHRIST CHURCH, Barbados aeroway aerodrome 0.39332663350649 Barbados bb Americas Caribbean
+tobacco control 2021-02-03 38585207 node National Tobacco Control Comission, তোপখানা রোড, ফকিরাপà§<81>ল, পলà§<8d>টন, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1000, বাংলাদেশ office government 0.201 বাংলাদেশ bd Asia Southern Asia
+one health institute 2021-02-03 176103509 way Health Institute, Dumki - Bauphal - Dashmina - Galachipa Highway, পটà§<81>য়াখালী সদর উপজেলা, পটà§<81>য়াখালী জেলা, বরিশাল বিà¦à¦¾à¦—, 8602, বাংলাদেশ building yes 0.201 বাংলাদেশ bd Asia Southern Asia
+institute of science and technology 2021-02-03 28348367 node Institute of Science and Technology, Road 15/A, ধানমনà§<8d>ডি আ/à¦<8f>, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 12, বাংলাদেশ building university 0.778015094618814 বাংলাদেশ bd Asia Southern Asia
+bangladesh 2021-02-03 298155988 relation বাংলাদেশ boundary administrative 0.718005971623183 বাংলাদেশ bd Asia Southern Asia
+university of development 2021-02-03 43508783 node University of Development (UODA), Dhanmondi 9/A, পশà§<8d>চিম ধানমনà§<8d>ডি, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, DHAKA-1209, বাংলাদেশ amenity university 0.301 বাংলাদেশ bd Asia Southern Asia
+bangladesh university of engineering and technology 2021-02-03 239326225 way Bangladesh University of Engineering & Technology, Dhakeswari Road, বাবà§<81> বাজার, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1211, বাংলাদেশ amenity university 0.867072547352423 বাংলাদেশ bd Asia Southern Asia
+statistical research center 2021-02-03 149441305 way Institute of Statistical Research and Training, Mokarrom Building Road, সিদà§<8d>দিক বাজার, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1000, বাংলাদেশ building yes 0.43461374284578 বাংলাদেশ bd Asia Southern Asia
+spd 2021-02-03 183078064 way সৈয়দপà§<81>র বিমানবনà§<8d>দর, Saidpur - Parbotipur Road, সৈয়দপà§<81>র উপজেলা, নীলফামারী জেলা, 5310, বাংলাদেশ aeroway aerodrome 0.297085518539193 বাংলাদেশ bd Asia Southern Asia
+chandra x-ray center 2021-02-03 148177740 way Sharat Chandra Chakraborty Road, সিদà§<8d>দিক বাজার, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1100, বাংলাদেশ highway tertiary 0.2 বাংলাদেশ bd Asia Southern Asia
+atomic energy commission 2021-02-03 160816975 way Atomic Energy Commission, বিà¦<8f>নপি বাজার-আগারগাà¦<81>ও পানির টà§<8d>যাংকি রোড, তালতলা, পশà§<8d>চিম আগারগাà¦<81>ও, ঢাকা, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1207, বাংলাদেশ office government 0.301 বাংলাদেশ bd Asia Southern Asia
+bangladesh agricultural research institute 2021-02-03 218321267 way Bangladesh Agricultural Research institute, বগà§<81>ড়া, বগà§<81>ড়া জেলা, রাজশাহী বিà¦à¦¾à¦—, বাংলাদেশ landuse farmyard 0.6 বাংলাদেশ bd Asia Southern Asia
+pdb 2021-02-03 184556254 way PDB, রংপà§<81>র, রংপà§<81>র জেলা, 5400, বাংলাদেশ highway living_street 0.2 বাংলাদেশ bd Asia Southern Asia
+daca 2021-02-03 44550743 node ঢাকা, Chanpara Bazar, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1230, বাংলাদেশ place city 0.610110109270811 বাংলাদেশ bd Asia Southern Asia
+ford model t 2021-02-03 191227884 way Ford Workshop, ঢাকা-ময়মনসিংহ মহাসড়ক, Sector 9, Uttara, Dhaka, Bangladesh, উতà§<8d>তরা, ঢাকা, Chanpara Bazar, ঢাকা জেলা, ঢাকা বিà¦à¦¾à¦—, 1230, বাংলাদেশ building commercial 0.201 বাংলাদেশ bd Asia Southern Asia
+university of ghent 2021-02-03 114264163 way Universiteit Gent Vakgroep Textielkunde, 70A, Technologiepark-Zwijnaarde, Wetenschapspark Ardoyen, Zwijnaarde, Gent, Oost-Vlaanderen, Vlaanderen, 9052, België / Belgique / Belgien building yes 0.513953996266395 België / Belgique / Belgien be Europe Western Europe
+european university association 2021-02-03 113874154 way European University Association, 24, Avenue de l'Yser - Ijzerlaan, Etterbeek, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1040, België / Belgique / Belgien building yes 0.301 België / Belgique / Belgien be Europe Western Europe
+royal belgian institute for space aeronomy 2021-02-03 98368678 way Institut royal d'Aéronomie Spatiale de Belgique (IASB) - Koninklijk Belgisch Instituut voor Ruimte-Aeronomie (BIRA), 3, Avenue Circulaire - Ringlaan, Uccle - Ukkel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1180, België / Belgique / Belgien building yes 0.101 België / Belgique / Belgien be Europe Western Europe
+european research council executive agency 2021-02-03 73122812 node ERCEA, 16, Place Charles Rogier - Karel Rogierplein, Saint-Josse-ten-Noode - Sint-Joost-ten-Node, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1210, België / Belgique / Belgien office government 0.429911496965354 België / Belgique / Belgien be Europe Western Europe
+initiative for medicines 2021-02-03 80748719 node IMI 2 JU, 56-60, Avenue de la Toison d'Or - Gulden-Vlieslaan, Saint-Gilles - Sint-Gillis, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1060, België / Belgique / Belgien office yes 0.001 België / Belgique / Belgien be Europe Western Europe
+vlti 2021-02-03 176905194 way Speelplaats VLTI, Goede Herder, Torhout, Brugge, West-Vlaanderen, Vlaanderen, 8820, België / Belgique / Belgien highway footway 0.175 België / Belgique / Belgien be Europe Western Europe
+university of liège 2021-02-03 123758853 way HEC Liège, Rue Reynier, Saint-Laurent, Glain, Liège, Wallonie, 4000, België / Belgique / Belgien amenity university 0.101 België / Belgique / Belgien be Europe Western Europe
+maastricht university 2021-02-03 72718419 node Maastricht University, 153, Avenue de Tervueren - Tervurenlaan, Woluwe-Saint-Pierre - Sint-Pieters-Woluwe, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1150, België / Belgique / Belgien amenity university 0.201 België / Belgique / Belgien be Europe Western Europe
+université catholique de louvain 2021-02-03 125108490 way Musée L, 3, Place des Sciences, Biéreau, Louvain-la-Neuve, Ottignies-Louvain-la-Neuve, Nivelles, Brabant wallon, Wallonie, 1348, België / Belgique / Belgien tourism museum 0.514317004425986 België / Belgique / Belgien be Europe Western Europe
+erc 2021-02-03 73122812 node ERCEA, 16, Place Charles Rogier - Karel Rogierplein, Saint-Josse-ten-Noode - Sint-Joost-ten-Node, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1210, België / Belgique / Belgien office government 0.529911496965354 België / Belgique / Belgien be Europe Western Europe
+planck 2021-02-03 157290 node De Plank, Sint-Martens-Voeren, Voeren, Tongeren, Limburg, Vlaanderen, 3790, België / Belgique / Belgien place hamlet 0.235968355602442 België / Belgique / Belgien be Europe Western Europe
+european research council 2021-02-03 73122812 node ERCEA, 16, Place Charles Rogier - Karel Rogierplein, Saint-Josse-ten-Noode - Sint-Joost-ten-Node, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1210, België / Belgique / Belgien office government 0.429911496965354 België / Belgique / Belgien be Europe Western Europe
+council of the european union 2021-02-03 75256623 node Council of the European Union, 175, Rue de la Loi - Wetstraat, Quartier européen - Europese Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1048, België / Belgique / Belgien office government 1.04458004666179 België / Belgique / Belgien be Europe Western Europe
+belgium 2021-02-03 258282932 relation België / Belgique / Belgien boundary administrative 0.819060552357301 België / Belgique / Belgien be Europe Western Europe
+anr 2021-02-03 86964198 way Internationale Luchthaven Antwerpen, Leon Stampelaan, Deurne, Antwerpen, Vlaanderen, 2100, België / Belgique / Belgien aeroway aerodrome 0.389007360490923 België / Belgique / Belgien be Europe Western Europe
+university of pierre 2021-02-03 72718419 node Maastricht University, 153, Avenue de Tervueren - Tervurenlaan, Woluwe-Saint-Pierre - Sint-Pieters-Woluwe, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1150, België / Belgique / Belgien amenity university 0.301 België / Belgique / Belgien be Europe Western Europe
+oxfam international 2021-02-03 76889245 node Oxfam, 405, Bredabaan, Wuustwezel, Antwerpen, Vlaanderen, 2990, België / Belgique / Belgien shop shop=charity 0.101 België / Belgique / Belgien be Europe Western Europe
+genencor 2021-02-03 112225638 way 43, Genencor International, Brugge-Centrum, Brugge, West-Vlaanderen, Vlaanderen, 8000, België / Belgique / Belgien landuse industrial 0.3 België / Belgique / Belgien be Europe Western Europe
+erasmus university medical centre 2021-02-03 314840 node Erasme - Erasmus, Route de Lennik - Lennikse Baan, Anderlecht, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1070, België / Belgique / Belgien railway station 0.444585942469205 België / Belgique / Belgien be Europe Western Europe
+basf 2021-02-03 102592327 way BASF Antwerpen nv, 600, Scheldelaan, Zandvliet, Berendrecht-Zandvliet-Lillo, Antwerpen, Vlaanderen, 2040, België / Belgique / Belgien man_made works 0.630708311748545 België / Belgique / Belgien be Europe Western Europe
+national academies of sciences 2021-02-03 16772906 node Académie royale des Sciences, des Lettres et des Beaux-Arts de Belgique, Rue Ducale - Hertogstraat, Quartier Royal - Koninklijke Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1000, België / Belgique / Belgien office yes 0.201 België / Belgique / Belgien be Europe Western Europe
+european defence agency 2021-02-03 149946671 way EDA, 17-23, Rue des Drapiers - Lakenweversstraat, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1050, België / Belgique / Belgien office government 0.427022409876486 België / Belgique / Belgien be Europe Western Europe
+ghent university 2021-02-03 114264163 way Universiteit Gent Vakgroep Textielkunde, 70A, Technologiepark-Zwijnaarde, Wetenschapspark Ardoyen, Zwijnaarde, Gent, Oost-Vlaanderen, Vlaanderen, 9052, België / Belgique / Belgien building yes 0.513953996266395 België / Belgique / Belgien be Europe Western Europe
+chevron 2021-02-03 6507688 node Chevron, Stoumont, Verviers, Liège, Wallonie, 4987, België / Belgique / Belgien place village 0.37381125651268 België / Belgique / Belgien be Europe Western Europe
+erasmus medical center 2021-02-03 314840 node Erasme - Erasmus, Route de Lennik - Lennikse Baan, Anderlecht, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1070, België / Belgique / Belgien railway station 0.444585942469205 België / Belgique / Belgien be Europe Western Europe
+royal belgian institute of natural sciences 2021-02-03 109874865 way Institut royal des Sciences naturelles de Belgique - Koninklijk Belgisch Instituut voor Natuurwetenschappen, 29, Rue Vautier - Vautierstraat, Espace Léopold - Leopoldruimte, Bruxelles / Brussel, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1000, België / Belgique / Belgien amenity research_institute 0.53461374284578 België / Belgique / Belgien be Europe Western Europe
+bureau of science 2021-02-03 101902801 way Bureau Greisch, 25, Allée des Noisetiers, Liège Science-Park, Angleur, Liège, Wallonie, 4031, België / Belgique / Belgien building office 0.201 België / Belgique / Belgien be Europe Western Europe
+harvard's church 2021-02-03 49985626 node Harvard's, Place de l'Accueil, Lauzelle, Louvain-la-Neuve, Ottignies-Louvain-la-Neuve, Nivelles, Brabant wallon, Wallonie, 1348, België / Belgique / Belgien shop clothes 0.201 België / Belgique / Belgien be Europe Western Europe
+vrije universiteit brussel 2021-02-03 51922595 node Vrije Universiteit Brussel, 2, Boulevard de la Plaine - Pleinlaan, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1050, België / Belgique / Belgien tourism information 0.301 België / Belgique / Belgien be Europe Western Europe
+erasmus university medical center 2021-02-03 314840 node Erasme - Erasmus, Route de Lennik - Lennikse Baan, Anderlecht, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1070, België / Belgique / Belgien railway station 0.444585942469205 België / Belgique / Belgien be Europe Western Europe
+ortho 2021-02-03 4044828 node Ortho, La Roche-en-Ardenne, Marche-en-Famenne, Luxembourg, Wallonie, 6983, België / Belgique / Belgien place village 0.375 België / Belgique / Belgien be Europe Western Europe
+spanish national research council 2021-02-03 63415508 node CSIC Delegation, 62, Rue du Trône - Troonstraat, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1050, België / Belgique / Belgien office government 0.001 België / Belgique / Belgien be Europe Western Europe
+european parliament 2021-02-03 258825741 relation Parlement européen - Europees Parlement, 60, Rue Wiertz - Wiertzstraat, Espace Léopold - Leopoldruimte, Ixelles - Elsene, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1047, België / Belgique / Belgien office government 0.676444237673387 België / Belgique / Belgien be Europe Western Europe
+european commission 2021-02-03 80449876 node EC, 200, Rue de la Loi - Wetstraat, Quartier européen - Europese Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1040, België / Belgique / Belgien office government 0.636019418289309 België / Belgique / Belgien be Europe Western Europe
+plant systems biology 2021-02-03 80891989 node VIB-UGent Center for Plant Systems Biology, 71, Technologiepark-Zwijnaarde, Zwijnaarde, Gent, Oost-Vlaanderen, Vlaanderen, 9052, België / Belgique / Belgien office research 0.301 België / Belgique / Belgien be Europe Western Europe
+nsac 2021-02-03 101563927 way NSAC, Nieuwpoortsesteenweg, Raversijde, Oostende, West-Vlaanderen, Vlaanderen, 8400, België / Belgique / Belgien building yes 0.101 België / Belgique / Belgien be Europe Western Europe
+university of antwerp 2021-02-03 85049624 way Campus Middelheim Universiteit Antwerpen, Lindendreef, Middelheim, Antwerpen, Vlaanderen, 2020, België / Belgique / Belgien amenity university 0.219931111449547 België / Belgique / Belgien be Europe Western Europe
+liège university 2021-02-03 123758853 way HEC Liège, Rue Reynier, Saint-Laurent, Glain, Liège, Wallonie, 4000, België / Belgique / Belgien amenity university 0.101 België / Belgique / Belgien be Europe Western Europe
+spa 2021-02-03 258353734 relation Spa, Verviers, Liège, Wallonie, 4900, België / Belgique / Belgien boundary administrative 0.630842855879195 België / Belgique / Belgien be Europe Western Europe
+hal 2021-02-03 258188555 relation Halle, Halle-Vilvoorde, Vlaams-Brabant, Vlaanderen, België / Belgique / Belgien boundary administrative 0.581694829650187 België / Belgique / Belgien be Europe Western Europe
+exxonmobil 2021-02-03 92996065 way ExxonMobil, Antwerpen, Vlaanderen, 2030, België / Belgique / Belgien landuse industrial 0.3 België / Belgique / Belgien be Europe Western Europe
+european council 2021-02-03 76246823 node EUCO, 175, Rue de la Loi - Wetstraat, Quartier européen - Europese Wijk, Bruxelles / Brussel, Ville de Bruxelles - Stad Brussel, Brussel-Hoofdstad - Bruxelles-Capitale, Région de Bruxelles-Capitale - Brussels Hoofdstedelijk Gewest, 1048, België / Belgique / Belgien office government 0.001 België / Belgique / Belgien be Europe Western Europe
+center for cosmology 2021-02-03 55302255 node Centre for Cosmology, Particle Physics and Phenomenology (CP3), 2, Chemin du Cyclotron, Parc Einstein, Louvain-la-Neuve, Ottignies-Louvain-la-Neuve, Nivelles, Brabant wallon, Wallonie, 1348, België / Belgique / Belgien office research 0.201 België / Belgique / Belgien be Europe Western Europe
+university of leuven 2021-02-03 110607812 way University Snooker, 106, Hertogstraat, Matadi, Heverlee, Leuven, Vlaams-Brabant, Vlaanderen, 3001, België / Belgique / Belgien amenity bar 0.201 België / Belgique / Belgien be Europe Western Europe
+wikimedia commons 2021-02-03 126001376 way https://commons.wikimedia.org/wiki/File:Den Bonten Hannen, 34, Mgr. Cardijnstraat, Kasterlee, Turnhout, Antwerpen, Vlaanderen, 2460, België / Belgique / Belgien building house 0.201 België / Belgique / Belgien be Europe Western Europe
+ligo 2021-02-03 258170031 relation Liège, Wallonie, 4000, België / Belgique / Belgien boundary administrative 0.63660006822952 België / Belgique / Belgien be Europe Western Europe
+jaspers 2021-02-03 5512569 node Jaspers, 159, Bloemendallaan, Strombeek, Strombeek-Bever, Grimbergen, Halle-Vilvoorde, Vlaams-Brabant, Vlaanderen, 1853, België / Belgique / Belgien amenity pharmacy 0.101 België / Belgique / Belgien be Europe Western Europe
+bhf 2021-02-03 258453504 relation Burkina Faso boundary administrative 0.680491224481489 Burkina Faso bf Africa Western Africa
+burkina faso 2021-02-03 258453504 relation Burkina Faso boundary administrative 0.880491224481489 Burkina Faso bf Africa Western Africa
+zoe global 2021-02-03 189794797 way Global, Димитровград, ХаÑ<81>ково, БългaриÑ<8f> landuse commercial 0.3 БългaриÑ<8f> bg Europe Eastern Europe
+european union 2021-02-03 6502302 node ЕвропейÑ<81>ки Ñ<81>ъюз, бул. Черни връх, ж.к. Лозенец, район Лозенец, Столична, СофиÑ<8f>-град, 1421, БългaриÑ<8f> railway station 0.271596680569804 БългaриÑ<8f> bg Europe Eastern Europe
+bulgaria 2021-02-03 257859201 relation БългaриÑ<8f> boundary administrative 0.785388247880598 БългaриÑ<8f> bg Europe Eastern Europe
+bulgarian academy of sciences 2021-02-03 259375000 relation БългарÑ<81>ка академиÑ<8f> на науките (БÐ<90>Ð<9d>), 1, 15-ти Ð<9d>оември, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1040, БългaриÑ<8f> amenity research_institute 0.482632410251413 БългaриÑ<8f> bg Europe Eastern Europe
+lter 2021-02-03 46481769 node @лма @лтер, 15, бул. Цар ОÑ<81>вободител, ж.к. Яворов, Средец, Столична, СофиÑ<8f>-град, 1504, БългaриÑ<8f> amenity theatre 0.23461374284578 БългaриÑ<8f> bg Europe Eastern Europe
+zamfir 2021-02-03 784595 node Замфир, Лом, Монтана, БългaриÑ<8f> place village 0.275 БългaриÑ<8f> bg Europe Eastern Europe
+council of ministers 2021-02-03 126237485 way МиниÑ<81>терÑ<81>ки Ñ<81>ъвет, 1, бул. КнÑ<8f>з Ð<90>лекÑ<81>андър Дондуков, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1000, БългaриÑ<8f> office government 0.001 БългaриÑ<8f> bg Europe Eastern Europe
+sofia university 2021-02-03 161691937 way СофийÑ<81>ки универÑ<81>итет “Св. Климент ОхридÑ<81>ки", 15, бул. Цар ОÑ<81>вободител, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1504, БългaриÑ<8f> amenity university 0.515352144677718 БългaриÑ<8f> bg Europe Eastern Europe
+space technologies research institute 2021-02-03 118423296 way ИнÑ<81>титут за КоÑ<81>мичеÑ<81>ки ИзÑ<81>ледваниÑ<8f> и Технологии, бл.1, Ð<90>кад. Георги Бончев, БÐ<90>Ð<9d> IV км., СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1113, БългaриÑ<8f> office research 0.001 БългaриÑ<8f> bg Europe Eastern Europe
+orela 2021-02-03 151202736 way Орела, кв. Момина банÑ<8f>, ХиÑ<81>арÑ<8f>, Пловдив, 4180, БългaриÑ<8f> highway residential 0.1 БългaриÑ<8f> bg Europe Eastern Europe
+university of sofia 2021-02-03 161691937 way СофийÑ<81>ки универÑ<81>итет “Св. Климент ОхридÑ<81>ки", 15, бул. Цар ОÑ<81>вободител, Център, СофиÑ<8f>, Столична, СофиÑ<8f>-град, 1504, БългaриÑ<8f> amenity university 0.515352144677718 БългaриÑ<8f> bg Europe Eastern Europe
+bahrain 2021-02-03 258524311 relation البØرين boundary administrative 0.681587845635736 البØرين bh Asia Western Asia
+deloitte 2021-02-03 168988264 way DELOITTE, Kabondo, Mukaza, Bujumbura Mairie, Burundi landuse commercial 0.3 Burundi bi Africa Eastern Africa
+burundi 2021-02-03 257886094 relation Burundi boundary administrative 0.759633388730087 Burundi bi Africa Eastern Africa
+benin 2021-02-03 258030246 relation Bénin boundary administrative 0.667613308618136 Bénin bj Africa Western Africa
+ocean sciences 2021-02-03 134000033 way Bermuda Institute of Ocean Sciences, Biological Station, Saint George's, GE03, Bermuda amenity university 0.487418940697571 Bermuda bm Americas Northern America
+bermuda institute of ocean sciences 2021-02-03 134000033 way Bermuda Institute of Ocean Sciences, Biological Station, Saint George's, GE03, Bermuda amenity university 0.787418940697571 Bermuda bm Americas Northern America
+pluspetrol 2021-02-03 62171848 node Pluspetrol, Calle Las Palmas, Mac Petrol, Santa Cruz de la Sierra, Municipio Santa Cruz de la Sierra, Provincia Andrés Ibáñez, Santa Cruz, 2236, Bolivia office company 0.101 Bolivia bo Americas South America
+first department 2021-02-03 51887484 node First, Calle Arenales, Santa Cruz de la Sierra, Municipio Santa Cruz de la Sierra, Provincia Andrés Ibáñez, Santa Cruz, 3212, Bolivia shop jewelry 0.101 Bolivia bo Americas South America
+fish department 2021-02-03 259568738 relation Isla del Pescado, Canton Caquena, Municipio Tahua, Provincia Daniel Campos, PotosÃ, Bolivia place island 0.220860870373788 Bolivia bo Americas South America
+ayoreo 2021-02-03 54221446 node Ayoreo, Puerto Suárez, Germán Busch, Santa Cruz, Bolivia place hamlet 0.35 Bolivia bo Americas South America
+bolivia 2021-02-03 258419196 relation Bolivia boundary administrative 0.833354940927664 Bolivia bo Americas South America
+los angeles police department 2021-02-03 193771011 way Los Angeles, Provincia Warnes, Santa Cruz, Bolivia place village 0.475 Bolivia bo Americas South America
+bayer cropscience 2021-02-03 252681789 way Bayer CropScience, São Sebastião, Paracatu, Microrregião Paracatu, Região Geográfica Intermediária de Patos de Minas, Minas Gerais, Região Sudeste, Brasil landuse industrial 0.4 Brasil br Americas South America
+porto alegre 2021-02-03 258417526 relation Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, Brasil boundary administrative 0.833208007806445 Brasil br Americas South America
+federal university of pernambuco 2021-02-03 197192851 way Universidade Federal de Pernambuco, 1235, Avenida Professor Moraes Rego, Cidade Universitária, Recife, Região Geográfica Imediata do Recife, Região Metropolitana do Recife, Pernambuco, Região Nordeste, 50670-420, Brasil amenity university 0.301 Brasil br Americas South America
+siberian branch 2021-02-03 48916343 node Siberian, 1540, Avenida Coronel Fernando Ferreira Leite, Jardim Califórnia, Ribeirão Preto, Região Imediata de Ribeirão Preto, Região Metropolitana de Ribeirão Preto, Região Geográfica Intermediária de Ribeirão Preto, São Paulo, Região Sudeste, 14026-020, Brasil shop clothes 0.101 Brasil br Americas South America
+syngenta seeds 2021-02-03 159731731 way Syngenta Seeds, Formosa, Microrregião do Entorno de BrasÃlia, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária de Luziânia-Ã<81>guas Lindas de Goiás, Goiás, Região Centro-Oeste, Brasil landuse industrial 0.4 Brasil br Americas South America
+embrapa 2021-02-03 259507924 relation Embrapa, Teresina, Região Geográfica Imediata de Teresina, Região Integrada de Desenvolvimento da Grande Teresina, Região Geográfica Intermediária de Teresina, PiauÃ, Região Nordeste, Brasil boundary administrative 0.35 Brasil br Americas South America
+regional university of cariri 2021-02-03 23600017 node Universidade Regional do Cariri - URCA, 1161, Rua Coronel Antônio Luiz, Pimenta, Crato, Microrregião de Cariri, Região Geográfica Intermediária de Juazeiro do Norte, Ceará, Região Nordeste, 63100-000, Brasil amenity university 0.539805842395376 Brasil br Americas South America
+federal university of espírito santo 2021-02-03 190158758 way Universidade Federal do EspÃrito Santo, 514, Avenida Fernando Ferrari, Mata da Praia, Goiabeiras, Vitória, Região Geográfica Imediata de Vitória, Região Metropolitana da Grande Vitória, Região Geográfica Intermediária de Vitória, EspÃrito Santo, Região Sudeste, 29075-910, Brasil amenity university 0.696675389924706 Brasil br Americas South America
+natal 2021-02-03 296675227 relation Natal, Região Geográfica Imediata de Natal, Região Geográfica Intermediária de Natal, Rio Grande do Norte, Região Nordeste, Brasil boundary administrative 0.650113556587143 Brasil br Americas South America
+ssri 2021-02-03 209994140 way Ilhota dos Coqueiros, Avenida Beira Mar, Salvador, Região Geográfica Imediata de Salvador, Região Metropolitana de Salvador, Região Geográfica Intermediária de Salvador, Bahia, Região Nordeste, Brasil aeroway helipad 0.001 Brasil br Americas South America
+national museum of natural sciences 2021-02-03 139974775 way Museu de Ciências Naturais, 1427, Rua Doutor Salvador França, Jardim Botânico, Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 90690-000, Brasil tourism museum 0.256321943137092 Brasil br Americas South America
+petrobras 2021-02-03 111587897 way Petrobras, Aruanda, Aracaju, Região Geográfica Imediata de Aracaju, Região Geográfica Intermediária de Aracaju, Sergipe, Região Nordeste, Brasil landuse industrial 0.625082792846645 Brasil br Americas South America
+federal university of são paulo 2021-02-03 160694761 way Universidade Federal do ABC, Campus São Bernardo do Campo, S/N, Alameda da Universidade, Parque Anchieta, Anchieta, São Bernardo do Campo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 09606-045, Brasil amenity university 0.679989495490236 Brasil br Americas South America
+csu 2021-02-03 160040000 way Aeroporto de Santa Cruz do Sul, Avenida Prefeito Orlando Oscár Baumhardt, Linha Santa Cruz, Sede Municipal, Santa Cruz do Sul, Região Geográfica Imediata de Santa Cruz do Sul, Região Geográfica Intermediária de Santa Cruz do Sul - Lajeado, Rio Grande do Sul, Região Sul, 96820-290, Brasil aeroway aerodrome 0.275949010675047 Brasil br Americas South America
+tupperware 2021-02-03 163507943 way Tupperware, Guaratiba, Zona Oeste do Rio de Janeiro, Rio de Janeiro, Região Geográfica Imediata do Rio de Janeiro, Região Metropolitana do Rio de Janeiro, Região Geográfica Intermediária do Rio de Janeiro, Rio de Janeiro, Região Sudeste, Brasil landuse industrial 0.3 Brasil br Americas South America
+sci-hub 2021-02-03 168984790 way Sport Club Internacional, 891, Avenida Padre Cacique, Praia de Belas, Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 90810-240, Brasil leisure sports_centre 0.512779160464413 Brasil br Americas South America
+tgf 2021-02-03 28625398 node TGF, Rua ComandaÃ, Centro, Santa Rosa, Região Geográfica Imediata de Santa Rosa, Região Geográfica Intermediária de Ijui, Rio Grande do Sul, Região Sul, Brasil office financial 0.101 Brasil br Americas South America
+federal university of uberlândia 2021-02-03 128423073 way Universidade Federal de Uberlândia - Campus Educa, Rua Ana Carneiro, Nossa Senhora Aparecida, Setor Central, Uberlândia, Microrregião Uberlândia, Região Geográfica Intermediária de Uberlândia, Minas Gerais, Região Sudeste, 38405-142, Brasil amenity university 0.201 Brasil br Americas South America
+brazilian federal police 2021-02-03 66249623 node Presidency of the Brazilian Republic, N1 Leste, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70000-000, Brasil office government 0.201 Brasil br Americas South America
+federal university of são carlos 2021-02-03 131256389 way UNIVASF - Campus Juazeiro, 510, Avenida Antônio Carlos Magalhaes, Bairro Alto da Maravilha, Bairro Maringa, Juazeiro, Microrregião de Juazeiro, BR, Região Geográfica Intermediária de Juazeiro, Bahia, Região Nordeste, 48902-300, Brasil amenity university 0.469728853996096 Brasil br Americas South America
+cdu/csu 2021-02-03 92204695 way Carandiru, 2487, Avenida Cruzeiro do Sul, Santana, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 02031-000, Brasil railway station 0.343659122005759 Brasil br Americas South America
+fapesp 2021-02-03 190947973 way Fundação de Amparo à Pesquisa do Estado de São Paulo, 1500, Rua Pio XI, Vila Ida, Alto de Pinheiros, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05060-001, Brasil office government 0.001 Brasil br Americas South America
+federal university of santa catarina 2021-02-03 258910798 relation Universidade Federal da Fronteira Sul, Rodovia Balseiros do Rio Uruguai, Mezomo, Distrito Sede de Guatambu, Guatambu, Região Geográfica Imediata de Chapecó, Região Geográfica Intermediária de Chapecó, Santa Catarina, Região Sul, 89815-899, Brasil amenity university 0.625302870611459 Brasil br Americas South America
+federal university of espirito santo 2021-02-03 190158758 way Universidade Federal do EspÃrito Santo, 514, Avenida Fernando Ferrari, Mata da Praia, Goiabeiras, Vitória, Região Geográfica Imediata de Vitória, Região Metropolitana da Grande Vitória, Região Geográfica Intermediária de Vitória, EspÃrito Santo, Região Sudeste, 29075-910, Brasil amenity university 0.596675389924706 Brasil br Americas South America
+etec 2021-02-03 228049262 way ETEC, Val-de-Cães, Entroncamento, Belém, Região Geográfica Imediata de Belém, Região Geográfica Intermediária de Belém, Pará, Região Norte, Brasil landuse industrial 0.3 Brasil br Americas South America
+cosan 2021-02-03 185049204 way COSAN, Vila Triagem, Bauru, Região Imediata de Bauru, Região Geográfica Intermediária de Bauru, São Paulo, Região Sudeste, Brasil landuse industrial 0.3 Brasil br Americas South America
+university of campinas 2021-02-03 56537260 node Universidade de São José, 97, Rua SÃlvia Maria Fabro, Kobrasol, Campinas, São José, Região Geográfica Imediata de Florianópolis, Região Geográfica Intermediária de Florianópolis, Santa Catarina, Região Sul, 88102-130, Brasil amenity university 0.101 Brasil br Americas South America
+admx 2021-02-03 68823596 node Adrenalina - ADMX, 1590, Rua João Negrão, Rebouças, Vila Torres, Curitiba, Região Geográfica Imediata de Curitiba, Região Metropolitana de Curitiba, Região Geográfica Intermediária de Curitiba, Paraná, Região Sul, 80230-150, Brasil shop motorcycle_repair 0.101 Brasil br Americas South America
+federal university of minas gerais 2021-02-03 38865061 node Universidade Federal de Itajubá, 1301, Pinheirinho, Itajubá, Microrregião de Itajubá, Região Geográfica Intermediária de Pouso Alegre, Minas Gerais, Região Sudeste, 37500183, Brasil leisure park 0.45 Brasil br Americas South America
+pmdb 2021-02-03 235391112 way PMDB, Avenida Pátria, Formosa / Maria Regina, Alvorada, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 94814-510, Brasil office political_party 0.101 Brasil br Americas South America
+university of são paulo 2021-02-03 258734158 relation Cidade Universitária Armando de Salles Oliveira, Rua Francisco dos Santos, Butantã, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05587-050, Brasil amenity university 0.743129165494252 Brasil br Americas South America
+museum of natural sciences 2021-02-03 139974775 way Museu de Ciências Naturais, 1427, Rua Doutor Salvador França, Jardim Botânico, Porto Alegre, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 90690-000, Brasil tourism museum 0.256321943137092 Brasil br Americas South America
+saao 2021-02-03 258424944 relation São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, Brasil boundary administrative 0.686174911942028 Brasil br Americas South America
+itu 2021-02-03 257754909 relation Itu, Região Imediata de Sorocaba, Região Metropolitana de Sorocaba, Região Geográfica Intermediária de Sorocaba, São Paulo, Região Sudeste, Brasil boundary administrative 0.621055921429882 Brasil br Americas South America
+business ethanol 2021-02-03 60782840 node Ethanol, Rua Mármore, Santa Tereza, Regional Leste, Belo Horizonte, Microrregião Belo Horizonte, Região Metropolitana de Belo Horizonte, Minas Gerais, Região Sudeste, 31010-230, Brasil amenity pub 0.101 Brasil br Americas South America
+unifesp 2021-02-03 138935040 way UNIFESP, Rua Jorge Chamas, Vila Clementino, Vila Mariana, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 04015-051, Brasil amenity university 0.549107677186954 Brasil br Americas South America
+ministry of science and innovation 2021-02-03 65507092 node Ministry of Science, Technology & Innovation, or Ministry of National Integration, S1, Setor de Autarquias Sul, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70058-900, Brasil office government 0.401 Brasil br Americas South America
+itp 2021-02-03 10615106 node Aeroporto Regional de Itaperuna Ernani do Amaral Peixoto, Avenida Ernani do Amaral Peixoto, Itaperuna, Região Geográfica Imediata de Itaperuna, Região Geográfica Intermediária de Campos dos Goytacazes, Rio de Janeiro, Região Sudeste, 28300-000, Brasil aeroway aerodrome 0.181472839091896 Brasil br Americas South America
+inpe 2021-02-03 126630542 way Instituto Nacional de Pesquisas Espaciais, 1758, Avenida dos Astronautas, Jardim da Granja, São José dos Campos, Região Imediata de São José dos Campos, Região Metropolitana do Vale do ParaÃba e Litoral Norte, Região Geográfica Intermediária de São José dos Campos, São Paulo, Região Sudeste, 12227010, Brasil amenity research_institute 0.412372663380163 Brasil br Americas South America
+eca 2021-02-03 126584998 way Escola de Comunicações e Artes, 443, Avenida Professor Lúcio Martins Rodrigues, Butantã, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05508-010, Brasil amenity college 0.365781769297865 Brasil br Americas South America
+ebay 2021-02-03 83811700 node eBay Jataizinho, 9513, Rodovia Melo Peixoto, Jataizinho, Região Geográfica Imediata de Londrina, Região Geográfica Intermediária de Londrina, Paraná, Região Sul, 86210-000, Brasil shop yes 0.677751877815445 Brasil br Americas South America
+isad 2021-02-03 71911703 node ISAD, 542, Rua José do PatrocÃnio, São Pedro, Governador Valadares, Microrregião Governador Valadares, Região Geográfica Intermediária de Governador Valadares, Minas Gerais, Região Sudeste, 35020-280, Brasil amenity place_of_worship 0.101 Brasil br Americas South America
+university of são paolo 2021-02-03 71037590 node polo do curso de licenciatura em ciencias, Rua Prof. Polycarpo do Amaral, São Dimas, Piracicaba, Região Imediata de Piracicaba, Região Geográfica Intermediária de Campinas, São Paulo, Região Sudeste, 13416-230, Brasil amenity university 0.201 Brasil br Americas South America
+national health surveillance agency 2021-02-03 70330829 node Agência Nacional de Vigilância Sanitária, 3000, Avenida Senador Carlos Jereissati, Aeroporto, Fortaleza, Microrregião de Fortaleza, Região Geográfica Intermediária de Fortaleza, Ceará, Região Nordeste, 60741-200, Brasil office government 0.001 Brasil br Americas South America
+minas gerais 2021-02-03 258409868 relation Minas Gerais, Região Sudeste, Brasil boundary administrative 0.869760787811772 Brasil br Americas South America
+moderna 2021-02-03 52890773 node Moderna, Sertânia, Região Geográfica Imediata de Arcoverde, Região Geográfica Intermediária de Caruaru, Pernambuco, Região Nordeste, Brasil place village 0.375 Brasil br Americas South America
+hifi 2021-02-03 83900249 node Hifi, Avenida Manoel Dias da Silva, Pituba, Salvador, Região Geográfica Imediata de Salvador, Região Metropolitana de Salvador, Região Geográfica Intermediária de Salvador, Bahia, Região Nordeste, 41810-225, Brasil shop hifi 0.101 Brasil br Americas South America
+eht 2021-02-03 169009776 way EHT, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70297400, Brasil highway unclassified 0.2 Brasil br Americas South America
+state university of maringá 2021-02-03 121913292 way Universidade Estadual de Maringá, 5790, Avenida Colombo, Jardim Ipiranga, Zona 09, Maringá, Região Geográfica Imediata de Maringá, Região Geográfica Intermediária de Maringá, Paraná, Região Sul, 87020-900, Brasil amenity university 0.478149585742943 Brasil br Americas South America
+biomed central 2021-02-03 53650511 node BioMed, 761, Rua Venâncio Aires, Centro Histórico, Centro, Cruz Alta, Região Geográfica Imediata de Cruz Alta, Região Geográfica Intermediária de Passo Fundo, Rio Grande do Sul, Região Sul, 98005-020, Brasil shop yes 0.101 Brasil br Americas South America
+confap 2021-02-03 3453158 node Confap, Comodoro, Microrregião de Parecis, Região Geográfica Intermediária de Cáceres, Mato Grosso, Região Centro-Oeste, Brasil place hamlet 0.35 Brasil br Americas South America
+nejm 2021-02-03 174188055 way Seme Nagib Nejm, Centro, Irati, Região Geográfica Imediata de Irati, Região Geográfica Intermediária de Ponta Grossa, Paraná, Região Sul, 84500-236, Brasil highway residential 0.2 Brasil br Americas South America
+ilsi 2021-02-03 114074052 way Rua Ilsi Ragadalli, Alvorada, Videira, Região Geográfica Imediata de Videira, Região Geográfica Intermediária de Caçador, Santa Catarina, Região Sul, 89560-000, Brasil highway residential 0.2 Brasil br Americas South America
+pepsico 2021-02-03 160482058 way Pepsico, Parque Cecap, Guarulhos, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, Brasil landuse industrial 0.3 Brasil br Americas South America
+biomed central 1 2021-02-03 53650511 node BioMed, 761, Rua Venâncio Aires, Centro Histórico, Centro, Cruz Alta, Região Geográfica Imediata de Cruz Alta, Região Geográfica Intermediária de Passo Fundo, Rio Grande do Sul, Região Sul, 98005-020, Brasil shop yes 0.201 Brasil br Americas South America
+novo nordisk 2021-02-03 184059049 way Novo Nordisk, Araucária, Região Geográfica Imediata de Curitiba, Região Metropolitana de Curitiba, Região Geográfica Intermediária de Curitiba, Paraná, Região Sul, Brasil landuse industrial 0.4 Brasil br Americas South America
+blm 2021-02-03 257895089 relation Belém, Região Geográfica Imediata de Belém, Região Geográfica Intermediária de Belém, Pará, Região Norte, Brasil boundary administrative 0.560480042057943 Brasil br Americas South America
+federal university of paraná 2021-02-03 159113576 way UTFPR - Universidade Tecnológica Federal do Paraná, 330, Rua Doutor Washington Subtil Chueire, Jardim Carvalho, Ponta Grossa, Região Geográfica Imediata de Ponta Grossa, Região Geográfica Intermediária de Ponta Grossa, Paraná, Região Sul, 84017-220, Brasil amenity university 0.611447002935904 Brasil br Americas South America
+ossos 2021-02-03 59989122 node Ossos, Centro, Armação dos Búzios, Região Geográfica Imediata de Cabo Frio, Região Geográfica Intermediária de Macaé-Rio das Ostras-Cabo Frio, Rio de Janeiro, Região Sudeste, 28950-000, Brasil place quarter 0.35 Brasil br Americas South America
+amazon 2021-02-03 258080318 relation Amazonas, Região Norte, Brasil boundary administrative 0.700882727324139 Brasil br Americas South America
+ico 2021-02-03 258073026 relation Icó, Microrregião de Iguatu, Região Geográfica Intermediária de Iguatu, Ceará, Região Nordeste, 63430-000, Brasil boundary administrative 0.459452277129228 Brasil br Americas South America
+prata 2021-02-03 257892156 relation Nova Prata, Região Geográfica Imediata de Nova Prata - Guaporé, Região Geográfica Intermediária de Caxias do Sul, Rio Grande do Sul, Região Sul, 95320-000, Brasil boundary administrative 0.583724566403079 Brasil br Americas South America
+tmd 2021-02-03 50056220 node TamanduateÃ, Rua Guamiranga, Vila Prudente, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 03153-001, Brasil railway station 0.368648909480289 Brasil br Americas South America
+aeta 2021-02-03 257664729 relation Araçatuba, Região Imediata de Araçatuba, Região Geográfica Intermediária de Araçatuba, São Paulo, Região Sudeste, Brasil boundary administrative 0.527221804640549 Brasil br Americas South America
+ufmg 2021-02-03 258485573 relation Campus UFMG, Pampulha, Belo Horizonte, Microrregião Belo Horizonte, Região Metropolitana de Belo Horizonte, Minas Gerais, Região Sudeste, 31270-901, Brasil boundary administrative 0.35 Brasil br Americas South America
+novozymes 2021-02-03 182674703 way Novozymes, Araucária, Região Geográfica Imediata de Curitiba, Região Metropolitana de Curitiba, Região Geográfica Intermediária de Curitiba, Paraná, Região Sul, Brasil landuse industrial 0.3 Brasil br Americas South America
+supreme federal court 2021-02-03 101158663 way Supremo Tribunal Federal, S2 Leste, Setor de Autarquias Sul, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70046900, Brasil amenity courthouse 0.58051510608517 Brasil br Americas South America
+transocean 2021-02-03 158079760 way Transocean, Macaé, Região Geográfica Imediata de Macaé-Rio das Ostras, Região Geográfica Intermediária de Macaé-Rio das Ostras-Cabo Frio, Rio de Janeiro, Região Sudeste, 27925-290, Brasil landuse industrial 0.3 Brasil br Americas South America
+federal university of rio grande 2021-02-03 258468678 relation Universidade Federal do Rio de Janeiro, Rua Dalias, Vila Residencial dos Funcionários, Cidade Universitária, Zona Norte do Rio de Janeiro, Rio de Janeiro, Região Geográfica Imediata do Rio de Janeiro, Região Metropolitana do Rio de Janeiro, Região Geográfica Intermediária do Rio de Janeiro, Rio de Janeiro, Região Sudeste, 21941-907, Brasil amenity university 0.696203816091948 Brasil br Americas South America
+university of mato grosso 2021-02-03 194788101 way Instituto Federal de Mato Grosso, Campus Lucas do Rio Verde, 1600W, Avenida Universitária, Parque das Emas, Lucas do Rio Verde, Microrregião de Alto Teles Pires, Região Geográfica Intermediária de Sinop, Mato Grosso, Região Centro-Oeste, 78455000, Brasil amenity university 0.201 Brasil br Americas South America
+cabo frio 2021-02-03 258346198 relation Cabo Frio, Região Geográfica Imediata de Cabo Frio, Região Geográfica Intermediária de Macaé-Rio das Ostras-Cabo Frio, Rio de Janeiro, Região Sudeste, Brasil boundary administrative 0.677953726983006 Brasil br Americas South America
+sbpc 2021-02-03 120770712 way Aeroporto de Poços de Caldas - Embaixador Walther Moreira Salles, Rua Manoel Marquês de Oliveira, São Bento, Região Urbana Homogênea XII, Poços de Caldas, Microrregião Poços de Caldas, Região Geográfica Intermediária de Pouso Alegre, Minas Gerais, Região Sudeste, 37713326, Brasil aeroway aerodrome 0.200804307025448 Brasil br Americas South America
+brazil 2021-02-03 256950327 relation Brasil boundary administrative 0.845577342306117 Brasil br Americas South America
+brazilian space agency 2021-02-03 121542097 way Agência Espacial Brasileira, Acesso Coberto, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70660655, Brasil office government 0.001 Brasil br Americas South America
+ucb 2021-02-03 150896841 way Universidade Católica de BrasÃlia, W5 Norte / SGAN 916, HCGN 716, Setor Noroeste, BrasÃlia, Plano Piloto, Região Geográfica Imediata do Distrito Federal, Região Integrada de Desenvolvimento do Distrito Federal e Entorno, Região Geográfica Intermediária do Distrito Federal, Distrito Federal, Região Centro-Oeste, 70770-535, Brasil amenity university 0.348376470606964 Brasil br Americas South America
+general electric 2021-02-03 259288604 relation General Electric, Campinas, Região Imediata de Campinas, Região Metropolitana de Campinas, Região Geográfica Intermediária de Campinas, São Paulo, Região Sudeste, Brasil landuse industrial 0.4 Brasil br Americas South America
+ufrj 2021-02-03 258468678 relation Universidade Federal do Rio de Janeiro, Rua Dalias, Vila Residencial dos Funcionários, Cidade Universitária, Zona Norte do Rio de Janeiro, Rio de Janeiro, Região Geográfica Imediata do Rio de Janeiro, Região Metropolitana do Rio de Janeiro, Região Geográfica Intermediária do Rio de Janeiro, Rio de Janeiro, Região Sudeste, 21941-907, Brasil amenity university 0.496203816091948 Brasil br Americas South America
+cdu 2021-02-03 92204695 way Carandiru, 2487, Avenida Cruzeiro do Sul, Santana, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 02031-000, Brasil railway station 0.343659122005759 Brasil br Americas South America
+el universal 2021-02-03 45711233 node Universal, Branquinha, Espigão, Viamão, Região Metropolitana de Porto Alegre, Região Geográfica Intermediária de Porto Alegre, Rio Grande do Sul, Região Sul, 94460-530, Brasil place neighbourhood 0.35 Brasil br Americas South America
+ssa 2021-02-03 257989248 relation Salvador, Região Geográfica Imediata de Salvador, Região Metropolitana de Salvador, Região Geográfica Intermediária de Salvador, Bahia, Região Nordeste, Brasil boundary administrative 0.581639551877681 Brasil br Americas South America
+artemis 2021-02-03 258436873 relation Artemis, Piracicaba, Região Imediata de Piracicaba, Região Geográfica Intermediária de Campinas, São Paulo, Região Sudeste, Brasil boundary administrative 0.4 Brasil br Americas South America
+university of brasilia 2021-02-03 258734158 relation Cidade Universitária Armando de Salles Oliveira, Rua Francisco dos Santos, Butantã, São Paulo, Região Imediata de São Paulo, Região Metropolitana de São Paulo, Região Geográfica Intermediária de São Paulo, São Paulo, Região Sudeste, 05587-050, Brasil amenity university 0.543129165494252 Brasil br Americas South America
+nas 2021-02-03 198204916 way Lynden Pindling International Airport, John F. Kennedy Drive, New Providence, 00000, The Bahamas aeroway aerodrome 0.392062334826953 The Bahamas bs Americas Caribbean
+bahamas 2021-02-03 258050699 relation The Bahamas boundary administrative 0.774909342902589 The Bahamas bs Americas Caribbean
+bhutan 2021-02-03 257894181 relation འབྲུག་ཡུལ་ boundary administrative 0.658755532801197 འབྲུག་ཡུལ་ bt Asia Southern Asia
+ministry of agriculture 2021-02-03 178648159 way Ministry of Agriculture, Gaborone, South-East District, Botswana landuse commercial 0.5 Botswana bw Africa Southern Africa
+botswana 2021-02-03 258296134 relation Botswana boundary administrative 0.769811324959997 Botswana bw Africa Southern Africa
+center for applied research 2021-02-03 37633699 node Centre for Applied Research, 74769, P G Matante Drive, Central Business District, Gaborone, South-East District, 502733, Botswana office company 0.301 Botswana bw Africa Southern Africa
+belarus 2021-02-03 257723650 relation БеларуÑ<81>ÑŒ boundary administrative 0.756896296328902 БеларуÑ<81>ÑŒ by Europe Eastern Europe
+new journal of physics 2021-02-03 72965668 node Инженерно-физичеÑ<81>кий журнал, 38, улица Платонова, ПервомайÑ<81>кий район, МинÑ<81>к, 220023, БеларуÑ<81>ÑŒ office newspaper 0.001 БеларуÑ<81>ÑŒ by Europe Eastern Europe
+cna 2021-02-03 259097233 relation Цна, СмолевичÑ<81>кий район, МинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, 211736, БеларуÑ<81>ÑŒ waterway river 0.3 БеларуÑ<81>ÑŒ by Europe Eastern Europe
+susy 2021-02-03 259261467 relation Суши, ПершайÑ<81>кий Ñ<81>ельÑ<81>кий Совет, ВоложинÑ<81>кий район, МинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, БеларуÑ<81>ÑŒ boundary administrative 0.25 БеларуÑ<81>ÑŒ by Europe Eastern Europe
+executive committee 2021-02-03 94968267 way МингориÑ<81>полком, 8, проÑ<81>пект Ð<9d>езавиÑ<81>имоÑ<81>ти, РомановÑ<81>каÑ<8f> Слобода, МоÑ<81>ковÑ<81>кий район, МинÑ<81>к, 220030, БеларуÑ<81>ÑŒ office government 0.0854406477123641 БеларуÑ<81>ÑŒ by Europe Eastern Europe
+atp 2021-02-03 206941011 way Ð<90>ТП, ВерхнедвинÑ<81>к, ВерхнедвинÑ<81>кий район, ВитебÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, БеларуÑ<81>ÑŒ landuse industrial 0.2 БеларуÑ<81>ÑŒ by Europe Eastern Europe
+kfc 2021-02-03 84378852 node KFC, 5, улица Петра Глебки, Тивали, Медвежино, ФрунзенÑ<81>кий район, МинÑ<81>к, 220121, БеларуÑ<81>ÑŒ amenity fast_food 0.636510016719008 БеларуÑ<81>ÑŒ by Europe Eastern Europe
+national university of cordoba 2021-02-03 46348836 node National, George Price Highway, Saint Martin de Porres, Belize City, Belize District, 1021, Belize office yes 0.101 Belize bz Americas Central America
+san francisco public utilities commission 2021-02-03 154587331 way Public Utilities Commission, 41, Gabourel Lane, Fort George, King's Park, Belize City, Belize District, SUITE 205, Belize office government 0.301 Belize bz Americas Central America
+chan hol 2021-02-03 296831087 node Hol Chan Vista, Boca Ciega, San Pedro Town, Belize District, BELIZE, Belize place neighbourhood 0.45 Belize bz Americas Central America
+belize 2021-02-03 258422412 relation Belize boundary administrative 0.760897982846959 Belize bz Americas Central America
+national university of córdoba 2021-02-03 46348836 node National, George Price Highway, Saint Martin de Porres, Belize City, Belize District, 1021, Belize office yes 0.101 Belize bz Americas Central America
+mcmurdo 2021-02-03 222662 node McMurdo, Area A (Kicking Horse/Kinbasket Lake), Columbia-Shuswap Regional District, British Columbia, V0A 1H7, Canada place locality 0.225 Canada ca Americas Northern America
+university of ottawa heart institute 2021-02-03 107373367 way University of Ottawa Heart Institute, 40, Ruskin Street, Civic Hospital, Hintonburg, Kitchissippi, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1Y 4W7, Canada building hospital 0.752344279227432 Canada ca Americas Northern America
+victoria university 2021-02-03 57466240 node Victoria University, Charles Street West, Bloor Street Culture Corridor, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5S 1S3, Canada tourism information 0.201 Canada ca Americas Northern America
+global 2021-02-03 99949181 way Global, 81, Barber Greene Road, Don Mills, Don Valley East, North York, Toronto, Golden Horseshoe, Ontario, M3C 2C3, Canada building office 0.586522779384239 Canada ca Americas Northern America
+ontario ministry of agriculture 2021-02-03 106392829 way Ontario Ministry of Agriculture, 59, Ministry Drive, Former Kemptville College, Kemptville, North Grenville, Leeds and Grenville Counties, Eastern Ontario, Ontario, K0G 1J0, Canada office government 0.401 Canada ca Americas Northern America
+centre for disease control 2021-02-03 110832318 way Center for Disease Control, 655, West 12th Avenue, Fairview, Vancouver, District of North Vancouver, Metro Vancouver Regional District, British Columbia, V5Z 4B4, Canada building yes 0.301 Canada ca Americas Northern America
+shellard 2021-02-03 133044417 way Shellard Forest, Brantford, Southwestern Ontario, Ontario, Canada landuse forest 0.3 Canada ca Americas Northern America
+canada 2021-02-03 258158704 relation Canada boundary administrative 0.966125910965408 Canada ca Americas Northern America
+yukon 2021-02-03 258448219 relation Yukon, Canada boundary administrative 0.69549941569725 Canada ca Americas Northern America
+canadian broadcasting corporation 2021-02-03 129832260 way Canadian Broadcasting Corporation, 181, Queen Street, Centretown, Somerset, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1P 1K9, Canada building commercial 0.85799321708887 Canada ca Americas Northern America
+memorial university 2021-02-03 47197396 node Queen's College Sign, Long Pond Trail, Memorial University of Newfoundland main campus, St. John's, Newfoundland, Newfoundland and Labrador, A1B 3P7, Canada tourism information 0.201 Canada ca Americas Northern America
+lakehead university 2021-02-03 138297326 way Lakehead University, North Spirit Road, Thunder Bay, Thunder Bay District, Northwestern Ontario, Ontario, P7B 5E1, Canada amenity university 0.201 Canada ca Americas Northern America
+royal tyrrell museum 2021-02-03 117591275 way Royal Tyrrell Museum, 1500, North Dinosaur Trail, Nacmine, Drumheller, Alberta, T0J 0Y1, Canada tourism museum 0.692168689295747 Canada ca Americas Northern America
+population health research institute 2021-02-03 132818887 way Population Health Research Institute, 237, Copeland Avenue, Beasley, Hamilton, Golden Horseshoe, Ontario, L8L 2X2, Canada building yes 0.401 Canada ca Americas Northern America
+nunavut court of justice 2021-02-03 161170401 way Nunavut Court of Justice, 510, ᑲá–<8f>á–…, á<90>ƒá–ƒá“—á<90>ƒá‘¦, ᓄᓇᕗᑦ Nunavut, X0A 0H0, Canada building Office_Building 0.401 Canada ca Americas Northern America
+royal roads university 2021-02-03 258736258 relation Royal Roads University, 2005, Sooke Road, Colwood, Capital Regional District, British Columbia, V9B 5Y2, Canada amenity university 0.681016725925367 Canada ca Americas Northern America
+queen's university in kingston 2021-02-03 85363828 way Queen's University - West Campus, West Campus Lane, Portsmouth, Kingston, Eastern Ontario, Ontario, K7M 6G4, Canada amenity university 0.501 Canada ca Americas Northern America
+university health network 2021-02-03 117777424 way London Hall, Western Road, London, Southwestern Ontario, Ontario, N6G 5K8, Canada amenity university 0.001 Canada ca Americas Northern America
+nova scotia 2021-02-03 257999774 relation Nova Scotia, Canada boundary administrative 0.864078179426287 Canada ca Americas Northern America
+bc 2021-02-03 258447774 relation British Columbia, Canada boundary administrative 0.71215515233974 Canada ca Americas Northern America
+acdc 2021-02-03 119675282 way ACDC, Area A (Egmont/Pender Harbour), Sunshine Coast Regional District, British Columbia, V0N 2H0, Canada highway track 0.2 Canada ca Americas Northern America
+perimeter institute 2021-02-03 150705575 way Perimeter Institute for Theoretical Physics, 31, Caroline Street North, Uptown, Waterloo, Region of Waterloo, Southwestern Ontario, Ontario, N2L 2Y5, Canada building university 0.545725205949526 Canada ca Americas Northern America
+mcgill university health centre 2021-02-03 113003796 way MUHC - McGill University Health Centre, Rue Saint-Jacques, Upper Lachine, Côte-des-Neiges–Notre-Dame-de-Grâce, Montréal, Agglomération de Montréal, Montréal (06), Québec, H4C 3C8, Canada amenity hospital 0.401 Canada ca Americas Northern America
+canadian museum of history 2021-02-03 119665756 way Canadian Museum of History, 100, Rue Laurier, Hull, Gatineau, Gatineau (ville), Outaouais, Québec, K1A 0M8, Canada tourism museum 0.781650158010506 Canada ca Americas Northern America
+trent university 2021-02-03 239067020 way Trent University, 1600, West Bank Drive, Peterborough, Central Ontario, Ontario, K9J 6X5, Canada amenity university 0.629853869659265 Canada ca Americas Northern America
+cic 2021-02-03 297969507 node Isachsen Airport (abandoned), á•¿á‘á–…á‘–á“—á’ƒ Qikiqtaaluk Region, ᓄᓇᕗᑦ Nunavut, Canada aeroway aerodrome 0.294548847777872 Canada ca Americas Northern America
+chime 2021-02-03 210495198 way Canadian Hydrogen Intensity Mapping Experiment, White Lake Trail - East, Area I (Skaha West/Kaleden/Apex), Regional District of Okanagan-Similkameen, British Columbia, V0H 1R4, Canada man_made telescope 0.320054390558144 Canada ca Americas Northern America
+free university of 2021-02-03 308046 node Free Times Cafe, 320, College Street, Kensington Market, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5T 1S3, Canada amenity pub 0.341913844040538 Canada ca Americas Northern America
+saskatchewan 2021-02-03 258121188 relation Saskatchewan, Canada boundary administrative 0.748590173341754 Canada ca Americas Northern America
+university of waterloo 2021-02-03 259427430 relation University of Waterloo, Wilmot, Region of Waterloo, Southwestern Ontario, Ontario, Canada amenity university 0.804103708523755 Canada ca Americas Northern America
+alberta energy 2021-02-03 51904882 node Alberta Energy, Bow River Pathway (South), Sunalta, Scarboro/Sunalta West, Calgary, Alberta, T3C 3N4, Canada tourism artwork 0.201 Canada ca Americas Northern America
+brigham 2021-02-03 259057118 relation Brigham, Brome-Missisquoi, Montérégie, Québec, J2K 4V6, Canada boundary administrative 0.525122105808463 Canada ca Americas Northern America
+institute of ocean sciences 2021-02-03 259251964 relation Institute of Ocean Sciences, 9860, West Saanich Road, Sidney, Capital Regional District, British Columbia, V8L 4B2, Canada building yes 0.401 Canada ca Americas Northern America
+iogen 2021-02-03 191517666 way Iogen, 300, Lindbergh Private, River, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1V 1H7, Canada building yes 0.101 Canada ca Americas Northern America
+quebec 2021-02-03 258336560 relation Québec, Canada boundary administrative 0.752720691937819 Canada ca Americas Northern America
+university of quebec 2021-02-03 113982632 way Concordia University (SGW Campus), Rue Saint-Mathieu, Montagne, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3H 2P4, Canada amenity university 0.592769930727231 Canada ca Americas Northern America
+university of windsor 2021-02-03 259225016 relation University of Windsor, California Avenue, Windsor, Southwestern Ontario, Ontario, N9B 2Z8, Canada amenity university 0.744009006305759 Canada ca Americas Northern America
+saskatchewan university 2021-02-03 171622787 way Saskatchewan Drive NW, River Valley Walterdale, Greater Strathcona, Edmonton, Edmonton (city), Alberta, T6G 2G9, Canada highway tertiary 0.2 Canada ca Americas Northern America
+cftr 2021-02-03 190485478 way Centre de formation du transport routier (CFTR), Rue Maple Dale, East-Farnham, Brome-Missisquoi, Montérégie, Québec, J2K 3H8, Canada amenity college 0.101 Canada ca Americas Northern America
+memorial university of newfoundland 2021-02-03 47197396 node Queen's College Sign, Long Pond Trail, Memorial University of Newfoundland main campus, St. John's, Newfoundland, Newfoundland and Labrador, A1B 3P7, Canada tourism information 0.401 Canada ca Americas Northern America
+group of seven and group 2021-02-03 175104701 way Group of Seven burial site, Kleinburg, Vaughan, York Region, Golden Horseshoe, Ontario, Canada landuse cemetery 0.6 Canada ca Americas Northern America
+nrc herzberg institute of astrophysics 2021-02-03 258668279 relation NRC Herzberg Institute of Astrophysics, Observatory Road, Saanich, Capital Regional District, British Columbia, V9E 2E7, Canada building yes 0.501 Canada ca Americas Northern America
+university of western ontario 2021-02-03 119657580 way Huron University College, Western Road, London, Southwestern Ontario, Ontario, N6G 2V4, Canada building university 0.657411994477751 Canada ca Americas Northern America
+triton 2021-02-03 16414366 node Triton, unincorporated Newfoundland, Newfoundland, Newfoundland and Labrador, Canada place town 0.4 Canada ca Americas Northern America
+universities canada 2021-02-03 123425762 way Ontario Universities' Application Centre, Research Lane, Research Park, Guelph, Southwestern Ontario, Ontario, N1H 8J7, Canada building office 0.201 Canada ca Americas Northern America
+university of guelph 2021-02-03 126276159 way University of Guelph, South Ring Road, Guelph, Southwestern Ontario, Ontario, N1G 3A2, Canada amenity university 0.768891779789467 Canada ca Americas Northern America
+northwest territories 2021-02-03 258121655 relation Northwest Territories, Canada boundary administrative 0.798189772893837 Canada ca Americas Northern America
+mclaren 2021-02-03 22469926 node McLaren, Eldon No. 471, Saskatchewan, Canada place locality 0.225 Canada ca Americas Northern America
+nova university 2021-02-03 174886043 way Public Archives of Nova Scotia, 6016, University Avenue, Marlborough Woods, Halifax, Halifax Regional Municipality, Halifax County, Nova Scotia, B3H 4R2, Canada tourism museum 0.498071657967153 Canada ca Americas Northern America
+pineapple express 2021-02-03 176947657 way Pineapple Express, Area F (West Howe Sound), Sunshine Coast Regional District, British Columbia, V0N 1V7, Canada highway path 0.275 Canada ca Americas Northern America
+ontario ministry of natural resources 2021-02-03 244730689 way Ontario Ministry of Natural Resources, Water Street, Downtown Peterborough, Peterborough, Central Ontario, Ontario, K9J 2T6, Canada office government 0.501 Canada ca Americas Northern America
+natural science 2021-02-03 208925680 way Natural Science, London, Southwestern Ontario, Ontario, N6G 2V4, Canada highway platform 0.3 Canada ca Americas Northern America
+national health commission 2021-02-03 128238070 way Boundary Trails Health Centre, Boundary Commission Trail, Morden, Stanley, Manitoba, R6M 1P3, Canada amenity hospital 0.201 Canada ca Americas Northern America
+mcmaster university in hamilton 2021-02-03 95450699 way McMaster University, Main Street West, Westdale, Hamilton, Golden Horseshoe, Ontario, L8S 1B3, Canada amenity university 0.904585752093457 Canada ca Americas Northern America
+professional institute of the public service of canada 2021-02-03 64283995 node Professional Institute Of The Public Service Of Canada, 250, Tremblay Road, Alta Vista, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1G 3H5, Canada office association 0.801 Canada ca Americas Northern America
+free university 2021-02-03 308046 node Free Times Cafe, 320, College Street, Kensington Market, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5T 1S3, Canada amenity pub 0.341913844040538 Canada ca Americas Northern America
+canadian association of university teachers in ottawa 2021-02-03 64284898 node Canadian Association of University Teachers, 2705, Queensview Drive, Britannia Heights, Bay, Ottawa, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K2B 6B7, Canada office association 0.601 Canada ca Americas Northern America
+mcgill 2021-02-03 295834059 node McGill, Boulevard De Maisonneuve Ouest, Quartier des Spectacles, René-Lévesque, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3A 3J2, Canada railway station 0.472714057293031 Canada ca Americas Northern America
+canadian association of university teachers 2021-02-03 64284898 node Canadian Association of University Teachers, 2705, Queensview Drive, Britannia Heights, Bay, Ottawa, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K2B 6B7, Canada office association 0.501 Canada ca Americas Northern America
+ab 2021-02-03 257625587 relation Alberta, Canada boundary administrative 0.672431047420852 Canada ca Americas Northern America
+calgary university in canada 2021-02-03 15692968 node University of Calgary Downtown Campus, 906, 8 Avenue SW, Connaught, Downtown West End, Calgary, Alberta, T2P 0P7, Canada amenity university 0.301 Canada ca Americas Northern America
+dalhousie university 2021-02-03 52245694 node Faculty of Computer Science, Dalhousie University, 6050, University Avenue, Marlborough Woods, Halifax, Halifax Regional Municipality, Halifax County, Nova Scotia, B3H 4R2, Canada amenity university 0.411644870826829 Canada ca Americas Northern America
+university of manitoba 2021-02-03 259131209 relation University of Manitoba, Sifton Road, Montcalm, Winnipeg, Winnipeg (city), Manitoba, R3T 2N2, Canada amenity university 0.301 Canada ca Americas Northern America
+parks canada 2021-02-03 157069631 way Jasper Park Information Centre, 500, Connaught Drive, Municipality of Jasper, Alberta, T0E 1E0, Canada tourism information 0.508746182183473 Canada ca Americas Northern America
+bown 2021-02-03 10036098 node Bown, Bury, Le Haut-Saint-François, Estrie, Québec, Canada place locality 0.225 Canada ca Americas Northern America
+cancer research institute 2021-02-03 84088132 way Cancer Research Institute, O'Kill Street, Sydenham, Kingston, Eastern Ontario, Ontario, K7L 2V3, Canada building university 0.301 Canada ca Americas Northern America
+alberta 2021-02-03 257625587 relation Alberta, Canada boundary administrative 0.772431047420852 Canada ca Americas Northern America
+brock university in st catharines 2021-02-03 242595633 way Brock University, John Macdonell Street, St. Catharines, Niagara Region, Golden Horseshoe, Ontario, L2V 4T7, Canada amenity university 0.921862401245526 Canada ca Americas Northern America
+university of british columbia 2021-02-03 258186091 relation University of British Columbia, Eagles Drive, Hawthorn Place, University of British Columbia, Electoral Area A, Metro Vancouver Regional District, British Columbia, V6T 1Z4, Canada amenity university 0.962214165030468 Canada ca Americas Northern America
+general administration of press 2021-02-03 12545243 node Press, Senneterre (ville), La Vallée-de-l'Or, Abitibi-Témiscamingue, Québec, Canada place locality 0.225 Canada ca Americas Northern America
+ontario 2021-02-03 258413471 relation Ontario, Canada boundary administrative 0.835597144214394 Canada ca Americas Northern America
+eastman 2021-02-03 259058432 relation Eastman, Memphrémagog, Estrie, Québec, Canada boundary administrative 0.525926152527381 Canada ca Americas Northern America
+mount royal university 2021-02-03 87665637 way Mount Royal University, Richard Road SW, Lincoln Park, Calgary, Alberta, T3E 6L1, Canada amenity university 0.683999520860011 Canada ca Americas Northern America
+kenn borek air 2021-02-03 113538653 way Kenn Borek Air Ltd, George Craig Boulevard NE, Pegasus, Calgary, Alberta, T2E 8A5, Canada building hangar 0.301 Canada ca Americas Northern America
+bay area rapid transit 2021-02-03 259098950 relation Deep Cove, District of North Vancouver, Metro Vancouver Regional District, British Columbia, Canada natural bay 0.224193162948078 Canada ca Americas Northern America
+mrc 2021-02-03 258982901 relation Kiamika, Antoine-Labelle, Laurentides, Québec, Canada boundary administrative 0.429332784738109 Canada ca Americas Northern America
+acadia 2021-02-03 505694 node Acadia, Calgary, Alberta, T2J 1K6, Canada place suburb 0.375 Canada ca Americas Northern America
+institute of ecology 2021-02-03 50878159 node Canadian Institute of Forestry, The Canadian Ecology Centre Road, Mattawa, Nipissing District, Northeastern Ontario, Ontario, P0H 1V0, Canada amenity college 0.301 Canada ca Americas Northern America
+alpha centauri 2021-02-03 45319061 node Mount Alpha Centauri, Area G (Forster Creek/Mount Assiniboine), Regional District of East Kootenay, British Columbia, Canada natural peak 0.5 Canada ca Americas Northern America
+ajax 2021-02-03 258370273 relation Ajax, Durham Region, Golden Horseshoe, Ontario, Canada boundary administrative 0.542805933283467 Canada ca Americas Northern America
+oceans canada 2021-02-03 3422315 node Oceans, 4557, Hurontario Street, Mississauga, Peel Region, Golden Horseshoe, Ontario, L5R 3E7, Canada shop supermarket 0.201 Canada ca Americas Northern America
+university of ottawa 2021-02-03 173311174 way University of Ottawa, 75, Laurier Avenue East, Sandy Hill, Rideau-Vanier, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1N 6N5, Canada amenity university 0.812764144652578 Canada ca Americas Northern America
+south florida shark club 2021-02-03 198593200 way Shark Club, West Hunt Club Road, Knoxdale-Merivale, Nepean, Ottawa, Eastern Ontario, Ontario, K2E 0B7, Canada amenity restaurant 0.201 Canada ca Americas Northern America
+uwc 2021-02-03 259171836 relation Pearson College UWC, Pearson College Drive, Metchosin, Capital Regional District, British Columbia, V9C 4H1, Canada amenity college 0.382582546755277 Canada ca Americas Northern America
+polar environment atmospheric research laboratory 2021-02-03 226391941 way Polar Environment Atmospheric Research Laboratory, Eureka, á•¿á‘á–…á‘–á“—á’ƒ Qikiqtaaluk Region, ᓄᓇᕗᑦ Nunavut, Canada office research 0.501 Canada ca Americas Northern America
+development research center 2021-02-03 129466071 way Defence Research and Development, 9, Defence Research and Development, Tufts Cove, Dartmouth, Halifax Regional Municipality, Halifax County, Nova Scotia, B3A 3C5, Canada landuse military 0.4 Canada ca Americas Northern America
+prince edward island 2021-02-03 258567254 relation Prince Edward Island, Canada place island 0.893570880226373 Canada ca Americas Northern America
+fripon 2021-02-03 111997105 way Lac Fripon, Lac-Saint-Charles, La Haute-Saint-Charles, Québec, Québec (Agglomération), Capitale-Nationale, Québec, Canada natural water 0.3 Canada ca Americas Northern America
+british columbia 2021-02-03 258447774 relation British Columbia, Canada boundary administrative 0.91215515233974 Canada ca Americas Northern America
+public health canada 2021-02-03 76182419 node Public Health, Mivvik Avenue, ᑲá–<8f>á•¿á“‚á–… Rankin inlet / Kangiqtiniq, ᑲá–<8f>á•¿á“‚á–… Rankin Inlet, á‘ᕙᓪᓕᖅ Kivalliq Region, ᓄᓇᕗᑦ Nunavut, Canada amenity clinic 0.301 Canada ca Americas Northern America
+manitoba 2021-02-03 258500059 relation Manitoba, Canada boundary administrative 0.758017394476413 Canada ca Americas Northern America
+sustainable forestry initiative 2021-02-03 65825393 node Sustainable Forestry Initiative, 1306, Wellington Street West, Wellington Village Shopping Area, Hintonburg, Kitchissippi, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1Y 3A8, Canada office association 0.301 Canada ca Americas Northern America
+university of saskatchewan 2021-02-03 188955577 way University of Saskatchewan, 33rd Street East, Saskatoon, Saskatoon (city), Saskatchewan, S7K 3H9, Canada amenity university 0.789594387429839 Canada ca Americas Northern America
+amos 2021-02-03 259153297 relation Amos, Abitibi, Abitibi-Témiscamingue, Québec, Canada boundary administrative 0.541816779161739 Canada ca Americas Northern America
+laurentian university 2021-02-03 1347802 node Laurentian University, University Road, Greater Sudbury, Sudbury District, Northeastern Ontario, Ontario, P3E 2C6, Canada amenity university 0.636203186595559 Canada ca Americas Northern America
+canadian hydrogen intensity mapping experiment 2021-02-03 210495198 way Canadian Hydrogen Intensity Mapping Experiment, White Lake Trail - East, Area I (Skaha West/Kaleden/Apex), Regional District of Okanagan-Similkameen, British Columbia, V0H 1R4, Canada man_made telescope 0.820054390558144 Canada ca Americas Northern America
+newfoundland 2021-02-03 259208749 relation Newfoundland, Newfoundland and Labrador, Canada boundary administrative 0.6 Canada ca Americas Northern America
+national research council canada 2021-02-03 259257626 relation 1191, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, Canada landuse commercial 0.81890455386909 Canada ca Americas Northern America
+carleton university 2021-02-03 88329470 way Carleton University, 1125, Colonel By Drive, Capital, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1S 5B7, Canada amenity university 0.698422783543645 Canada ca Americas Northern America
+university of calgary 2021-02-03 83952183 way University of Calgary, Crowchild Trail NW, Banff Trail, Calgary, Alberta, T2M 4X6, Canada amenity university 0.301 Canada ca Americas Northern America
+blandford 2021-02-03 259301487 relation Saint-Louis-de-Blandford, Arthabaska, Centre-du-Québec, Québec, G0Z 1B0, Canada boundary administrative 0.511911570959931 Canada ca Americas Northern America
+mcgill university 2021-02-03 93463053 way McGill University, Avenue du Parc, Saint-Louis, Plateau Mont-Royal, Montréal, Agglomération de Montréal, Montréal (06), Québec, H2W 1S4, Canada amenity university 0.201 Canada ca Americas Northern America
+eldonia 2021-02-03 97793667 way Eldonia Road, Kawartha Lakes, Central Ontario, Ontario, K0M 1B0, Canada highway residential 0.2 Canada ca Americas Northern America
+biological sciences research council 2021-02-03 61272197 node NRC Institute for Biological Sciences, Lathe Drive, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1J 8B5, Canada office government 0.401 Canada ca Americas Northern America
+university of new brunswick 2021-02-03 93050151 way University of New Brunswick, Rue Winslow, Town Platt, Downtown, Fredericton, York County, New Brunswick / Nouveau-Brunswick, E3B 4C9, Canada amenity university 0.864942671117145 Canada ca Americas Northern America
+genome canada 2021-02-03 48279568 node Genome Dx, 1038, Homer Street, Yaletown, Downtown, Vancouver, District of North Vancouver, Metro Vancouver Regional District, British Columbia, V6B 2W9, Canada place house 0.201 Canada ca Americas Northern America
+fisheries and oceans canada 2021-02-03 75914304 node Fisheries and Oceans Canada, John Yeo Drive, City of Charlottetown, Queens County, Prince Edward Island, C1E 3H6, Canada office government 0.401 Canada ca Americas Northern America
+canadian institute of health 2021-02-03 75247073 node Canadian National Institute of Health, 303, Dalhousie Street, Byward Market, Lowertown, Rideau-Vanier, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K1N 7E5, Canada office educational_institution 0.401 Canada ca Americas Northern America
+nrc herzberg 2021-02-03 258668279 relation NRC Herzberg Institute of Astrophysics, Observatory Road, Saanich, Capital Regional District, British Columbia, V9E 2E7, Canada building yes 0.201 Canada ca Americas Northern America
+knox college 2021-02-03 257189631 relation Knox College, 59, St George Street, Discovery District, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5T 2Z9, Canada building university 0.526239076957718 Canada ca Americas Northern America
+geological survey of canada 2021-02-03 94424539 way Geological Survey of Canada, 32 Avenue NW, University Heights, Calgary, Alberta, T2L 2A6, Canada building yes 0.401 Canada ca Americas Northern America
+cne 2021-02-03 84394987 way Exhibition Place, Old Toronto, Toronto, Golden Horseshoe, Ontario, M6K 3C3, Canada place neighbourhood 0.415434381149213 Canada ca Americas Northern America
+international civil aviation organization 2021-02-03 114910153 way Organisation de l'Aviation Civile Internationale, 999, Boulevard Robert-Bourassa, René-Lévesque, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3C 5H7, Canada office international_organization 0.301 Canada ca Americas Northern America
+cae 2021-02-03 258158704 relation Canada boundary administrative 0.866125910965408 Canada ca Americas Northern America
+mcmaster university 2021-02-03 95450699 way McMaster University, Main Street West, Westdale, Hamilton, Golden Horseshoe, Ontario, L8S 1B3, Canada amenity university 0.704585752093458 Canada ca Americas Northern America
+university of northern british columbia 2021-02-03 189703056 way University of Northern British Columbia, Residence Court, Prince George, Regional District of Fraser-Fort George, British Columbia, V2N 4Z9, Canada amenity university 0.878415816823755 Canada ca Americas Northern America
+research in motion 2021-02-03 99144888 way Scotiabank, Mississauga, Peel Region, Golden Horseshoe, Ontario, Canada landuse commercial 0.2 Canada ca Americas Northern America
+saint mary's university 2021-02-03 84577948 way St Mary's University, Robie Street, Marlborough Woods, Halifax, Halifax Regional Municipality, Halifax County, Nova Scotia, B3H 3B4, Canada amenity university 0.713959851504786 Canada ca Americas Northern America
+university of sherbrooke 2021-02-03 120967475 way Bishop's University, Rue Winder, Lennoxville, Sherbrooke, Estrie, Québec, J1M 1H9, Canada amenity university 0.201 Canada ca Americas Northern America
+tb drug development 2021-02-03 6242511 node Shoppers Drug Mart, 8th Street East, Grosvenor Park, Nutana Suburban Development Area, Saskatoon, Saskatoon (city), Saskatchewan, S7H 5J6, Canada amenity pharmacy 0.201 Canada ca Americas Northern America
+perimeter institute for theoretical physics 2021-02-03 150705575 way Perimeter Institute for Theoretical Physics, 31, Caroline Street North, Uptown, Waterloo, Region of Waterloo, Southwestern Ontario, Ontario, N2L 2Y5, Canada building university 0.845725205949526 Canada ca Americas Northern America
+iris 2021-02-03 296781846 relation Iris, Kings County, Prince Edward Island, Canada boundary administrative 0.45 Canada ca Americas Northern America
+research and innovation 2021-02-03 232469918 way Research Innovation, Christie Lane, Guelph, Southwestern Ontario, Ontario, N1G 0A9, Canada building university 0.201 Canada ca Americas Northern America
+royal navy 2021-02-03 89924668 way Royal Military College, Navy Way, Kingston, Eastern Ontario, Ontario, K7K 7B4, Canada amenity university 0.651709632190723 Canada ca Americas Northern America
+center for medicine 2021-02-03 191344626 way Elmwood Court (Silvera for Seniors), 63 Street NW, Bowness, Calgary, Alberta, T3B 1S4, Canada building yes 0.101 Canada ca Americas Northern America
+ligado networks 2021-02-03 67108376 node Ligado Networks, 1601, Telesat Court, Beacon Hill-Cyrville, Gloucester, Ottawa, Eastern Ontario, Ontario, K1B 1B1, Canada office telecommunication 0.201 Canada ca Americas Northern America
+environment canada 2021-02-03 154537614 way 355, Environment Canada, Gloucester, Ottawa, Eastern Ontario, Ontario, Canada landuse commercial 0.662784569703518 Canada ca Americas Northern America
+southern hemisphere 2021-02-03 77358035 node Southern Hemisphere, 5251, Oak Street, South Cambie, Vancouver, District of North Vancouver, Metro Vancouver Regional District, British Columbia, V6M, Canada leisure garden 0.201 Canada ca Americas Northern America
+bmo financial group 2021-02-03 132092034 way BMO Financial Group, 2194, Lake Shore Boulevard West, Etobicoke—Lakeshore, Etobicoke, Toronto, Golden Horseshoe, Ontario, M8V 4C5, Canada amenity bank 0.301 Canada ca Americas Northern America
+simon fraser university 2021-02-03 113041662 way Simon Fraser University, University Drive West, Burnaby, Metro Vancouver Regional District, British Columbia, V5A 4X6, Canada amenity university 0.794772751234326 Canada ca Americas Northern America
+university of toronto 2021-02-03 86595017 way University of Toronto, Wellesley-Hoskin Cycle Track, Bloor Street Culture Corridor, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5S 1C4, Canada amenity university 0.905105918866445 Canada ca Americas Northern America
+nsf international 2021-02-03 209845746 way NSF International, 125, Chancellors Way, Edinburgh Village, Guelph, Southwestern Ontario, Ontario, N1G 5K1, Canada building commercial 0.201 Canada ca Americas Northern America
+cargill 2021-02-03 22319429 node Cargill, Brockton, Bruce County, Southwestern Ontario, Ontario, Canada place village 0.375 Canada ca Americas Northern America
+jubilee south 2021-02-03 259354642 relation Jubilee, Municipality of Victoria County, Victoria County, Nova Scotia, Canada boundary administrative 0.45 Canada ca Americas Northern America
+university of victoria 2021-02-03 78344431 node University of Victoria, Alumni Chip Trail, Cadboro Bay Village, Saanich, Capital Regional District, British Columbia, V8P 5C0, Canada amenity post_office 0.301 Canada ca Americas Northern America
+oxford university 2021-02-03 98502897 way Cumberland Terrace, 820, Yonge Street, Yorkville, University—Rosedale, Old Toronto, Toronto, Golden Horseshoe, Ontario, M4W 2G8, Canada shop mall 0.317338060184506 Canada ca Americas Northern America
+york university 2021-02-03 259467282 relation York University, 120, Ian Macdonald Boulevard, Humber River—Black Creek, North York, Toronto, Golden Horseshoe, Ontario, M7A 2C5, Canada railway station 0.558338814941197 Canada ca Americas Northern America
+queen's university 2021-02-03 89031530 way Queen's University, Stuart Street, University District, Kingston, Eastern Ontario, Ontario, K7L 3N6, Canada amenity university 0.823019643336546 Canada ca Americas Northern America
+canadian space agency 2021-02-03 156978929 way Canadian Space Agency, Resources Row, Saskatoon, Saskatoon (city), Saskatchewan, S7N 3R3, Canada building industrial 0.301 Canada ca Americas Northern America
+mount allison university 2021-02-03 94182360 way Mount Allison University, Main Street, Sackville, Sackville Parish, Westmorland County, New Brunswick / Nouveau-Brunswick, E4L 4B5, Canada amenity university 0.301 Canada ca Americas Northern America
+new brunswick 2021-02-03 258084050 relation New Brunswick / Nouveau-Brunswick, Canada boundary administrative 0.83371652883794 Canada ca Americas Northern America
+st. francis xavier university in antigonish 2021-02-03 120193265 way St. Francis Xavier University, 5005, Chapel Square, Antigonish, Town of Antigonish, Municipality of the County of Antigonish, Nova Scotia, B2G 2W5, Canada amenity university 0.918973378442822 Canada ca Americas Northern America
+national research council 2021-02-03 259257626 relation 1191, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, Canada landuse commercial 0.71890455386909 Canada ca Americas Northern America
+university of montreal 2021-02-03 113982632 way Concordia University (SGW Campus), Rue Saint-Mathieu, Montagne, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3H 2P4, Canada amenity university 0.592769930727231 Canada ca Americas Northern America
+puma 2021-02-03 41765486 node Puma, Area C (Pemberton Valley/Mount Currie/D'Arcy), Squamish-Lillooet Regional District, British Columbia, Canada natural peak 0.4 Canada ca Americas Northern America
+icao 2021-02-03 114910153 way Organisation de l'Aviation Civile Internationale, 999, Boulevard Robert-Bourassa, René-Lévesque, Ville-Marie, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3C 5H7, Canada office international_organization 0.001 Canada ca Americas Northern America
+george institute 2021-02-03 100163330 way George Harvey Collegiate Institute, 1700, Keele Street, Keelesdale, York South—Weston, York, Toronto, Golden Horseshoe, Ontario, M6M 3W5, Canada amenity school 0.528965278593994 Canada ca Americas Northern America
+national research nuclear university 2021-02-03 104901648 way National High Field Nuclear Magnetic Resonance Centre (NANUC), 87 Avenue NW, University of Alberta Neighbourhood, Greater Strathcona, Edmonton, Edmonton (city), Alberta, T6G, Canada building university 0.301 Canada ca Americas Northern America
+ocean networks canada 2021-02-03 214362677 way NEPTUNE Ocean Observatory Shore Station - Ocean Networks Canada, 2180, Mallory Drive, Cameron Heights, Port Alberni, Alberni-Clayoquot Regional District, British Columbia, V9Y 2A8, Canada office research 0.301 Canada ca Americas Northern America
+canadian museum of nature 2021-02-03 144159501 way Canadian Museum of Nature, Argyle Avenue, Golden Triangle, Centretown, Somerset, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, K2P 1Z4, Canada tourism museum 0.794667642378454 Canada ca Americas Northern America
+cochrane 2021-02-03 149515 node Cochrane, Town of Cochrane, Alberta, T4V 2A7, Canada place town 0.494667642378454 Canada ca Americas Northern America
+rural affairs 2021-02-03 122759813 way Ontario Ministry of Agriculture, Food, and Rural Affairs, 1, Stone Road West, Guelph, Southwestern Ontario, Ontario, N1G 0A9, Canada office government 0.201 Canada ca Americas Northern America
+viking 2021-02-03 225115 node Viking, Town of Viking, Alberta, T0B 4N0, Canada place town 0.4 Canada ca Americas Northern America
+nunavut 2021-02-03 257857561 relation ᓄᓇᕗᑦ Nunavut, Canada boundary administrative 0.712760363996049 Canada ca Americas Northern America
+us national research council 2021-02-03 259257626 relation 1191, National Research Council, Rideau-Rockcliffe, (Old) Ottawa, Ottawa, Eastern Ontario, Ontario, Canada landuse commercial 0.71890455386909 Canada ca Americas Northern America
+northwest passage 2021-02-03 1180737 node Northwest Passage, á•¿á‘á–…á‘–á“—á’ƒ Qikiqtaaluk Region, ᓄᓇᕗᑦ Nunavut, Canada place locality 0.721993908833439 Canada ca Americas Northern America
+public health agency of canada 2021-02-03 194692555 way Public Health Agency of Canada, 130, Colonnade Road South, Fisher Glen, Knoxdale-Merivale, Nepean, Ottawa, Eastern Ontario, Ontario, K2E 7Y1, Canada office government 0.501 Canada ca Americas Northern America
+first nations 2021-02-03 5550556 node First Nations, West Mall, University of British Columbia, Electoral Area A, Metro Vancouver Regional District, British Columbia, V6T 1Z2, Canada emergency phone 0.201 Canada ca Americas Northern America
+zealandia 2021-02-03 296584586 relation Zealandia, Saskatchewan, Canada boundary administrative 0.55 Canada ca Americas Northern America
+george brown college 2021-02-03 138263548 way George Brown College, Richmond Street East, Moss Park, Toronto Centre, Old Toronto, Toronto, Golden Horseshoe, Ontario, M5A 4T7, Canada building yes 0.301 Canada ca Americas Northern America
+bhp billiton 2021-02-03 187584260 way BHP Billiton, 130, 3rd Avenue South, Saskatoon, Saskatoon (city), Saskatchewan, S7K 1L3, Canada office company 0.201 Canada ca Americas Northern America
+university of alberta 2021-02-03 259278235 relation University of Alberta, 115 Street NW, University of Alberta Neighbourhood, Greater Strathcona, Edmonton, Edmonton (city), Alberta, T6G 0N1, Canada amenity university 0.835188313007839 Canada ca Americas Northern America
+scarbo 2021-02-03 258831502 relation Scarbo Lake, Unorganized North Algoma, Algoma District, Northeastern Ontario, Ontario, Canada natural water 0.3 Canada ca Americas Northern America
+polytechnique montreal 2021-02-03 76938927 node Polytechnique Montréal, 2500, Chemin de Polytechnique, Édouard-Montpetit, Côte-des-Neiges–Notre-Dame-de-Grâce, Montréal, Agglomération de Montréal, Montréal (06), Québec, H3T 1J4, Canada amenity university 0.101 Canada ca Americas Northern America
+defense forces 2021-02-03 62153208 node Collège de Hautes Etudes de Stratégies de Défense Militaire, Avenue des Forces Armées, Haut Commandement, Gombe, Kinshasa, B.P 7955, République démocratique du Congo amenity college 0.101 République démocratique du Congo cd Africa Middle Africa
+itpr 2021-02-03 76683548 node Ministère des ITPR, Route T.P., Maniema, Tshopo, République démocratique du Congo office administrative 0.101 République démocratique du Congo cd Africa Middle Africa
+alima 2021-02-03 11732216 node Alima, Mambasa, Ituri, République démocratique du Congo place village 0.375 République démocratique du Congo cd Africa Middle Africa
+woods hole research center 2021-02-03 24158480 node Woods Hole Research Center, Avenue Clinique, Ibanga, Mbandaka, Équateur, République démocratique du Congo office ngo 0.401 République démocratique du Congo cd Africa Middle Africa
+inrb 2021-02-03 196637632 way INRB, Avenue des Huileries, Golf, Gombe, Kinshasa, 012, République démocratique du Congo building yes 0.101 République démocratique du Congo cd Africa Middle Africa
+democratic republic of the congo 2021-02-03 258410829 relation République démocratique du Congo boundary administrative 0.822405117667525 République démocratique du Congo cd Africa Middle Africa
+drc 2021-02-03 258410829 relation République démocratique du Congo boundary administrative 0.722405117667525 République démocratique du Congo cd Africa Middle Africa
+gaw 2021-02-03 53362850 node Gaw, Bosobolo, Nord-Ubangi, République démocratique du Congo place village 0.375 République démocratique du Congo cd Africa Middle Africa
+zaire 2021-02-03 258410829 relation République démocratique du Congo boundary administrative 0.722405117667525 République démocratique du Congo cd Africa Middle Africa
+central african republic 2021-02-03 257558721 relation Ködörösêse tî Bêafrîka - République Centrafricaine boundary administrative 0.669810150148004 Ködörösêse tî Bêafrîka - République Centrafricaine cf Africa Middle Africa
+global fund 2021-02-03 42017839 node IFRC Global Fund office, RN 2, Bangî - Bangui, Ködörösêse tî Bêafrîka - République Centrafricaine office ngo 0.201 Ködörösêse tî Bêafrîka - République Centrafricaine cf Africa Middle Africa
+pasteur institute 2021-02-03 19127860 node Institut Pasteur, Avenue de l'Indépendance, Bangî - Bangui, Ködörösêse tî Bêafrîka - République Centrafricaine amenity hospital 0.101 Ködörösêse tî Bêafrîka - République Centrafricaine cf Africa Middle Africa
+army 2021-02-03 51674182 node Army, Vakaga, Ködörösêse tî Bêafrîka - République Centrafricaine place village 0.375 Ködörösêse tî Bêafrîka - République Centrafricaine cf Africa Middle Africa
+institut pasteur 2021-02-03 243797129 way Institut Pasteur, Avenue de l'Indépendance, Bangî - Bangui, Ködörösêse tî Bêafrîka - République Centrafricaine amenity hospital 0.201 Ködörösêse tî Bêafrîka - République Centrafricaine cf Africa Middle Africa
+mbari 2021-02-03 258465218 relation Mbari, Mbomou, Ködörösêse tî Bêafrîka - République Centrafricaine waterway river 0.4 Ködörösêse tî Bêafrîka - République Centrafricaine cf Africa Middle Africa
+republic of the congo 2021-02-03 257866268 relation Congo boundary administrative 0.767415764799089 Congo cg Africa Middle Africa
+congo 2021-02-03 257866268 relation Congo boundary administrative 0.767415764799089 Congo cg Africa Middle Africa
+unhcr 2021-02-03 95164232 way Haut Commissariat des Nations Unies pour les Réfugiés, 94, Rue de Montbrillant, Le Petit-Saconnex, Petit-Saconnex et Servette, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra office government 0.415725100553218 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of lugano 2021-02-03 165141553 way Franklin University Switzerland, 29, Via Ponte Tresa, Sorengo, Circolo di Vezia, Distretto di Lugano, Ticino, 6924, Schweiz/Suisse/Svizzera/Svizra building school 0.201 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+tess 2021-02-03 258262464 relation Diesse, Plateau de Diesse, Arrondissement administratif du Jura bernois, Région administrative du Jura bernois, Bern/Berne, 2517, Schweiz/Suisse/Svizzera/Svizra boundary administrative 0.34859234613195 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+international committee 2021-02-03 96347471 way Comité International de la Croix-Rouge, 19, Avenue de la Paix, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra building yes 0.569349108620761 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+etzel 2021-02-03 4383703 node Etzel, Etzelweg, Einsiedeln, Schwyz, 8840, Schweiz/Suisse/Svizzera/Svizra tourism viewpoint 0.528982931011336 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of fribourg 2021-02-03 79253283 node Department of Geosciences at the University of Fribourg, Chemin du Musée, Pérolles, Fribourg - Freiburg, District de la Sarine, Fribourg/Freiburg, 1705, Schweiz/Suisse/Svizzera/Svizra office educational_institution 0.301 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+switzerland 2021-02-03 257695656 relation Schweiz/Suisse/Svizzera/Svizra boundary administrative 0.826485171575252 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of neuchâtel 2021-02-03 239101899 way HEP-BEJUNE, Rue du 1er-Août, La Chaux-de-Fonds, Neuchâtel, 2300, Schweiz/Suisse/Svizzera/Svizra amenity university 0.101 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+caffe 2021-02-03 6217481 node La Caffe, Le Fays, Martigny-Combe, Martigny, Valais/Wallis, 1929, Schweiz/Suisse/Svizzera/Svizra place hamlet 0.35 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+del genio 2021-02-03 52436434 node Del Genio, 44, Route de Vissigen, Sion, Valais/Wallis, 1950, Schweiz/Suisse/Svizzera/Svizra shop butcher 0.201 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of freiberg 2021-02-03 863524 node Université de Fribourg Pérolles, Chemin du Musée, Pérolles, Fribourg - Freiburg, District de la Sarine, Fribourg/Freiburg, 1705, Schweiz/Suisse/Svizzera/Svizra amenity university 0.001 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+world intellectual property organization 2021-02-03 75817483 node World Intellectual Property Organization, Chemin des Colombettes, Moillebeau, Petit-Saconnex et Servette, Genève, 1209, Schweiz/Suisse/Svizzera/Svizra office yes 0.401 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+lausanne university hospital 2021-02-03 95776304 way Université de Lausanne, A1a, Quartier Chamberonne, Chavannes-près-Renens, District de l'Ouest lausannois, Vaud, 1022, Schweiz/Suisse/Svizzera/Svizra amenity university 0.616266928066907 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+blue brain project 2021-02-03 37531863 node Blue Brain Project, Route Cantonale, Ecublens, District de l'Ouest lausannois, Vaud, 1025, Schweiz/Suisse/Svizzera/Svizra office research 0.702603435932822 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+world economic forum 2021-02-03 49134466 node World Economic Forum, 91, Route de la Capite, Ruth, Cologny, Genève, 1253, Schweiz/Suisse/Svizzera/Svizra office foundation 0.301 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+swiss tropical and public health institute 2021-02-03 225947974 way Schweizerisches Tropen- und Public Health-Institut, 57, Socinstrasse, Am Ring, Grossbasel, Basel, Basel-Stadt, 4051, Schweiz/Suisse/Svizzera/Svizra amenity hospital 0.201 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+world trade organization 2021-02-03 211703140 way Organisation Mondiale du Commerce, Rue de Lausanne, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra office government 0.613282888246145 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+médecins sans frontières 2021-02-03 145205796 way Médecins Sans Frontières, 78, Rue de Lausanne, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra office ngo 0.849022542887286 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+aspi 2021-02-03 22396364 node Aspi, Lützelflüh, Verwaltungskreis Emmental, Verwaltungsregion Emmental-Oberaargau, Bern/Berne, 3434, Schweiz/Suisse/Svizzera/Svizra place hamlet 0.35 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+international telecommunications union 2021-02-03 109351662 way Union Internationale des Télécommunications (UIT), Place des Nations, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra building yes 0.433228686818865 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of lausanne 2021-02-03 95776304 way Université de Lausanne, A1a, Quartier Chamberonne, Chavannes-près-Renens, District de l'Ouest lausannois, Vaud, 1022, Schweiz/Suisse/Svizzera/Svizra amenity university 0.616266928066907 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+paul scherrer institute 2021-02-03 300115214 way Paul Scherrer Institut, 111, Forschungsstrasse, Würenlingen, Bezirk Baden, Aargau, 5232, Schweiz/Suisse/Svizzera/Svizra amenity research_institute 0.567865768074584 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+arcadia fund 2021-02-03 112622320 way Fund, Canavee, Miglieglia, Circolo di Breno, Distretto di Lugano, Ticino, 6986, Schweiz/Suisse/Svizzera/Svizra highway footway 0.175 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+ecole polytechnique fédérale de lausanne 2021-02-03 95072766 way École Polytechnique Fédérale de Lausanne, Route de la Sorge, Quartier Sorge, Ecublens, District de l'Ouest lausannois, Vaud, 1015, Schweiz/Suisse/Svizzera/Svizra amenity university 0.883095905643059 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+who regional office 2021-02-03 91298032 way Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+wipo 2021-02-03 134711656 way Organisation Mondiale de la Propriété Intellectuelle, 34, Chemin des Colombettes, Moillebeau, Petit-Saconnex et Servette, Genève, 1209, Schweiz/Suisse/Svizzera/Svizra building yes 0.361912708763218 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+snsf 2021-02-03 23413803 node Schweizerischer Nationalfonds (SNF), Wildhainweg, Stadtbach, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra office government 0.001 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of zurich 2021-02-03 114961958 way Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra amenity university 0.354152289914814 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+who 2021-02-03 91298032 way Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of bern 2021-02-03 258566275 relation Universität Bern, Falkenplatz, Länggasse, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra amenity university 0.626372678886767 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+swiss federal institute 2021-02-03 120741454 way Eawag: Das Wasserforschungs-Institut des ETH-Bereichs, Seestrasse, Winkel, Kastanienbaum, Horw, Luzern, 6047, Schweiz/Suisse/Svizzera/Svizra amenity university 0.001 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university hospital zürich 2021-02-03 114961958 way Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra amenity university 0.454152289914814 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+wmo 2021-02-03 89750216 way Organisation Météorologique Mondiale, 7 bis, Avenue de la Paix, Sécheron, Pâquis, Genève, 1211, Schweiz/Suisse/Svizzera/Svizra office government 0.474195817992651 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+ofac 2021-02-03 43854237 node OFAC, 7, Rue Pedro-Meylan, Champel, Genève, 1208, Schweiz/Suisse/Svizzera/Svizra place house 0.101 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of geneva 2021-02-03 79436448 node Bioscope, Rue Michel Servet, Champel, Genève, 1206, Schweiz/Suisse/Svizzera/Svizra tourism museum 0.001 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+epfl 2021-02-03 95072766 way École Polytechnique Fédérale de Lausanne, Route de la Sorge, Quartier Sorge, Ecublens, District de l'Ouest lausannois, Vaud, 1015, Schweiz/Suisse/Svizzera/Svizra amenity university 0.483095905643059 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+the world health organization 2021-02-03 91298032 way Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of basel 2021-02-03 51795099 node Faculty of Psychology, University of Basel, 60-62, Missionsstrasse, Am Ring, Grossbasel, Basel, Basel-Stadt, 4055, Schweiz/Suisse/Svizzera/Svizra amenity university 0.301 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university of berne 2021-02-03 258566275 relation Universität Bern, Falkenplatz, Länggasse, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra amenity university 0.626372678886767 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+eth zurich 2021-02-03 45376322 node ETH Merchandise Store, 3, Sonneggstrasse, Oberstrass, Kreis 6, Zürich, Bezirk Zürich, Zürich, 8092, Schweiz/Suisse/Svizzera/Svizra shop clothes 0.101 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+world health organization 2021-02-03 91298032 way Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra building commercial 0.576611286810515 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+international olympic committee 2021-02-03 213449037 way Comité International Olympique, Route de Vidy, Lausanne, District de Lausanne, Vaud, 1020, Schweiz/Suisse/Svizzera/Svizra office ngo 0.101 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+wyss center 2021-02-03 115936808 way Wyss, Bürglen (UR), Uri, 6463, Schweiz/Suisse/Svizzera/Svizra highway unclassified 0.2 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+gsk 2021-02-03 226292997 way GSK, Prangins, District de Nyon, Vaud, 1197, Schweiz/Suisse/Svizzera/Svizra landuse industrial 0.3 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+ch 2021-02-03 257695656 relation Schweiz/Suisse/Svizzera/Svizra boundary administrative 0.926485171575252 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+lonza 2021-02-03 197344166 way Lonza, Goppenstein, Ferden, Westlich Raron, Valais/Wallis, 3916, Schweiz/Suisse/Svizzera/Svizra waterway river 0.375 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+institute of evolutionary biology 2021-02-03 45075228 node Zoological Institute, Evolutionary Biology, 1, Vesalgasse, Vorstädte, Grossbasel, Basel, Basel-Stadt, 4051, Schweiz/Suisse/Svizzera/Svizra building university 0.301 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+federal commission of electricity 2021-02-03 67545483 node Schweizerische Elektrizitätskommission, Christoffelgasse, Rotes Quartier, Stadtteil I, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3011, Schweiz/Suisse/Svizzera/Svizra office government 0.101 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+astra 2021-02-03 44480865 node ASTRA, 2, Mühlestrasse, Im Park, Worblaufen, Ittigen, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3063, Schweiz/Suisse/Svizzera/Svizra office government 0.413179143195807 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university hospital of zurich 2021-02-03 114961958 way Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra amenity university 0.354152289914814 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+swiss national science foundation 2021-02-03 23413803 node Schweizerischer Nationalfonds (SNF), Wildhainweg, Stadtbach, Stadtteil II, Bern, Verwaltungskreis Bern-Mittelland, Verwaltungsregion Bern-Mittelland, Bern/Berne, 3012, Schweiz/Suisse/Svizzera/Svizra office government 0.101 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+international telecommunication union 2021-02-03 109351662 way Union Internationale des Télécommunications (UIT), Place des Nations, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra building yes 0.433228686818865 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+university hospital zurich 2021-02-03 114961958 way Zürcher Hochschule für Angewandte Wissenschaften, Obergasse, Altstadt, Stadt, Winterthur, Bezirk Winterthur, Zürich, 8402, Schweiz/Suisse/Svizzera/Svizra amenity university 0.354152289914814 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+msf 2021-02-03 145205796 way Médecins Sans Frontières, 78, Rue de Lausanne, Sécheron, Pâquis, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra office ngo 0.549022542887286 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+ibm zurich 2021-02-03 61527465 node IBM, 106, Vulkanstrasse, Werdwies, Altstetten, Kreis 9, Zürich, Bezirk Zürich, Zürich, 8048, Schweiz/Suisse/Svizzera/Svizra office company 0.101 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+incyte 2021-02-03 258303830 relation Incyte, Morges, District de Morges, Vaud, 1110, Schweiz/Suisse/Svizzera/Svizra landuse industrial 0.3 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+world health organisation 2021-02-03 91298032 way Organisation Mondiale de la Santé, 20, Avenue Appia, Pâquis, Chambésy, Pregny-Chambésy, Genève, 1202, Schweiz/Suisse/Svizzera/Svizra building commercial 0.676611286810515 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+comac 2021-02-03 10475233 node Comac, Rue des Terreaux, Neuchâtel, 2001, Schweiz/Suisse/Svizzera/Svizra shop computer 0.101 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+riken 2021-02-03 5691099 node Riken, Murgenthal, Bezirk Zofingen, Aargau, 4853, Schweiz/Suisse/Svizzera/Svizra place village 0.375 Schweiz/Suisse/Svizzera/Svizra ch Europe Western Europe
+amon 2021-02-03 38034163 node Amon, Mé, Lagunes, Côte d’Ivoire place village 0.375 Côte d’Ivoire ci Africa Western Africa
+côte d'ivoire 2021-02-03 257869389 relation Côte d’Ivoire boundary administrative 1.00385204918839 Côte d’Ivoire ci Africa Western Africa
+cote d'ivoire 2021-02-03 257869389 relation Côte d’Ivoire boundary administrative 0.903852049188393 Côte d’Ivoire ci Africa Western Africa
+cook islands 2021-02-03 258611909 relation KÅ«ki 'Ä€irani boundary administrative 0.612597091402647 KÅ«ki 'Ä€irani ck Oceania Polynesia
+toms 2021-02-03 259209070 relation Tom's, Palmerston, KÅ«ki 'Ä€irani place islet 0.25 KÅ«ki 'Ä€irani ck Oceania Polynesia
+university of chile 2021-02-03 67050535 node UTEM, Universidad Tecnológica Metropolitana. Escuela de Arquitectura, 232, Dieciocho, Santiago, Provincia de Santiago, Región Metropolitana de Santiago, 8330180, Chile amenity university 0.101 Chile cl Americas South America
+ipcc 2021-02-03 47368685 node IPCC, San Ignacio, Santiago, Provincia de Santiago, Región Metropolitana de Santiago, 8330180, Chile amenity university 0.101 Chile cl Americas South America
+university of talca 2021-02-03 113890190 way Universidad de Talca, Avenida Lircay, Don Enrique, Lircay, Talca, Provincia de Talca, Región del Maule, 346000, Chile amenity university 0.438041195081873 Chile cl Americas South America
+university of la serena 2021-02-03 109529973 way Campus Enrique Molina Garmendia (ULS), Ruta 5 Norte, La Serena, Provincia de Elqui, Región de Coquimbo, 17000000, Chile amenity university 0.201 Chile cl Americas South America
+pro-test italia 2021-02-03 190529016 way Renault Pro +, 1195, Avenida Irarrázaval, Barrio Italia, Ñuñoa, Provincia de Santiago, Región Metropolitana de Santiago, 7770417, Chile shop car 0.201 Chile cl Americas South America
+cerro tololo inter-american observatory 2021-02-03 122415298 way Cerro Tololo Inter American Observatory, Vicuña, Provincia de Elqui, Región de Coquimbo, Chile landuse observatory 0.7 Chile cl Americas South America
+alma 2021-02-03 36357918 node Atacama Large Millimeter/submillimeter Array, San Pedro de Atacama, Provincia de El Loa, Región de Antofagasta, Chile place hamlet 0.448129702072077 Chile cl Americas South America
+atacama cosmology telescope 2021-02-03 109534275 way Atacama Cosmology Telescope (ACT), San Pedro de Atacama - Paso Jama, San Pedro de Atacama, Provincia de El Loa, Región de Antofagasta, Chile man_made telescope 0.626239076957718 Chile cl Americas South America
+chile 2021-02-03 257831844 relation Chile boundary administrative 0.87834210834697 Chile cl Americas South America
+cerro tololo 2021-02-03 23589264 node Cerro Tololo, Vicuña, Provincia de Elqui, Región de Coquimbo, Chile place locality 0.325 Chile cl Americas South America
+giant magellan telescope 2021-02-03 5515191 node Giant Magellan Telescope, Las Campanas, La Higuera, Provincia de Elqui, Región de Coquimbo, Chile man_made telescope 0.301 Chile cl Americas South America
+large synoptic survey telescope 2021-02-03 171609756 way Large Synoptic Survey Telescope, El Peñón Peak, Vicuña, Provincia de Elqui, Región de Coquimbo, Chile landuse construction 0.786844598253808 Chile cl Americas South America
+technological university of pereira 2021-02-03 123708466 way INACAP, 2519, Nelson Pereira, Rancagua, Provincia de Cachapoal, Región del Libertador General Bernardo O'Higgins, 2850546, Chile amenity university 0.101 Chile cl Americas South America
+la silla observatory 2021-02-03 122581340 way La Silla Observatory, La Silla internal road, La Higuera, Provincia de Elqui, Región de Coquimbo, Chile amenity research_institute 0.301 Chile cl Americas South America
+cerro paranal 2021-02-03 13674948 node Cerro Paranal, Taltal, Provincia de Antofagasta, Región de Antofagasta, Chile natural peak 0.557411994477751 Chile cl Americas South America
+punta arenas 2021-02-03 258446317 relation Punta Arenas, Provincia de Magallanes, Región de Magallanes y de la Antártica Chilena, Chile boundary administrative 0.702705295739513 Chile cl Americas South America
+juan de fuca 2021-02-03 94632616 way Juan de Fuca, Lo Prado, Provincia de Santiago, Región Metropolitana de Santiago, 8980000, Chile highway living_street 0.4 Chile cl Americas South America
+cerro armazones 2021-02-03 6398940 node Cerro Armazones, Antofagasta, Provincia de Antofagasta, Región de Antofagasta, Chile natural peak 0.489701883147039 Chile cl Americas South America
+las campanas observatory 2021-02-03 102955757 way Las Campanas Observatory, Vallenar, Provincia de Huasco, Región de Atacama, Chile landuse observatory 0.5 Chile cl Americas South America
+conicyt 2021-02-03 18074608 node CONICYT, Bernarda MorÃn, Providencia, Provincia de Santiago, Región Metropolitana de Santiago, 7501091, Chile amenity bicycle_parking 0.101 Chile cl Americas South America
+paranal observatory 2021-02-03 97009449 way Paranal Observatory, Acceso Observatorio Paranal, Antofagasta, Provincia de Antofagasta, Región de Antofagasta, Chile tourism attraction 0.684915797907489 Chile cl Americas South America
+james ax observatory 2021-02-03 185920082 way Huan Tran Telescope (James Ax observatory), San Pedro de Atacama - Paso Jama, San Pedro de Atacama, Provincia de El Loa, Región de Antofagasta, Chile man_made telescope 0.301 Chile cl Americas South America
+el sauce observatory 2021-02-03 54499584 node Observatorio El Sauce, RÃo Hurtado, Provincia de LimarÃ, Región de Coquimbo, Chile place locality 0.325 Chile cl Americas South America
+university of yaoundé 2021-02-03 135385489 way Université de Yaoundé I, Rue 3.729, Ngoa-Ékélé, Communauté urbaine de Yaoundé, Mfoundi, Centre, 860 YDÃ<8f>¿½, Cameroun amenity university 0.383208261767925 Cameroun cm Africa Middle Africa
+international institute of tropical agriculture 2021-02-03 259457036 relation Institut International d'Agriculture Tropicale, Rue 6.501, Nkolbisson, Yaoundé VII, Communauté urbaine de Yaoundé, Mfoundi, Centre, PB. 185 YAOUNDÉ, Cameroun amenity college 0.301 Cameroun cm Africa Middle Africa
+southwest 2021-02-03 258706250 relation Southwest, Cameroun boundary administrative 0.575363976054984 Cameroun cm Africa Middle Africa
+eta 2021-02-03 24334914 node Eta, Ngoyla, Haut-Nyong, Est, Cameroun place village 0.375 Cameroun cm Africa Middle Africa
+cameroon 2021-02-03 258195704 relation Cameroun boundary administrative 0.719266805257029 Cameroun cm Africa Middle Africa
+air force 2021-02-03 66242004 node AIR FORCE, Baladji, Ngaoundéré, Communauté urbaine de Ngaoundéré, Vina, Adamaoua, BP 353/NGAOUNDÉRÉ, Cameroun place PETIT MARCHE 0.4 Cameroun cm Africa Middle Africa
+mpo 2021-02-03 141599632 way Mpo, Atok, Haut-Nyong, Est, Cameroun waterway river 0.375 Cameroun cm Africa Middle Africa
+ocean 2021-02-03 258448571 relation Océan, Sud, Cameroun boundary administrative 0.379599826756761 Cameroun cm Africa Middle Africa
+hunan 2021-02-03 258328378 relation æ¹–å<8d>—çœ<81>, ä¸å›½ boundary administrative 0.69379355759446 ä¸å›½ cn Asia Eastern Asia
+institute of vertebrate paleontology 2021-02-03 154175740 way Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½ amenity public_building 0.401 ä¸å›½ cn Asia Eastern Asia
+dama 2021-02-03 55283412 node 大马镇, 鄢陵县, 许昌市, æ²³å<8d>—çœ<81>, ä¸å›½ place town 0.3 ä¸å›½ cn Asia Eastern Asia
+beijing institute of technology 2021-02-03 97776882 way 北京ç<90>†å·¥å¤§å¦, 5, ä¸å…³æ<9d>‘å<8d>—大街, 万柳地区, 海淀区, 北京市, 100872, ä¸å›½ amenity university 0.429216387348702 ä¸å›½ cn Asia Eastern Asia
+foreign correspondents club 2021-02-03 182742528 way 香港外國記者會 The Foreign Correspondents' Club, Hong Kong, 2, 下亞厘畢é<81>“ Lower Albert Road, SoHo, ä¸ç’° Central, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ building yes 0.301 ä¸å›½ cn Asia Eastern Asia
+siae 2021-02-03 119339783 way 机场, 西禹高速, 临潼区 (Chang'an), 西安市, 陕西çœ<81>, ä¸å›½ aeroway aerodrome 0.402243537687533 ä¸å›½ cn Asia Eastern Asia
+science and economic development 2021-02-03 149149294 way 国盛科技å›, 北京ç»<8f>济技术开å<8f>‘区, è<8d>£å<8d>Žè¡—é<81>“, 大兴区, 北京市, ä¸å›½ landuse industrial 0.2 ä¸å›½ cn Asia Eastern Asia
+department of public security 2021-02-03 149888559 way 深圳市公安局出入境管ç<90>†å¤„, 4016, 解放路, 蔡屋围, æ¡‚å›è¡—é<81>“, 罗湖区, 深圳市, 广东çœ<81>, 518000, ä¸å›½ office government 0.001 ä¸å›½ cn Asia Eastern Asia
+university of nanjing 2021-02-03 110545344 way å<8d>—京大å¦, å<8d>«å··, 鼓楼区, 玄æ¦åŒº, å<8d>—京市, 210093, ä¸å›½ amenity university 0.498289975489913 ä¸å›½ cn Asia Eastern Asia
+school of microelectronics 2021-02-03 159138504 way 微电å<90>å¦é™¢, å<8d>—æ´‹å<8d>—è·¯, 紫竹科技å›åŒº, 闵行区, 200240, ä¸å›½ building university 0.001 ä¸å›½ cn Asia Eastern Asia
+xinhua 2021-02-03 258772903 relation 新化县, 娄底市, æ¹–å<8d>—çœ<81>, 417625, ä¸å›½ boundary administrative 0.490764246652934 ä¸å›½ cn Asia Eastern Asia
+university of hong kong 2021-02-03 258613825 relation é¦™æ¸¯å¤§å¸ The University of Hong Kong, åˆ—å ¤é “é<81>“ Lyttelton Road, 西å<8d>Šå±± Mid-Levels West, 西營盤 Sai Ying Pun, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ amenity university 0.929678345929394 ä¸å›½ cn Asia Eastern Asia
+huazhong university of science and technology 2021-02-03 259583364 relation å<8d>Žä¸ç§‘技大å¦, 1037å<8f>·, ç<8f>žå–»è·¯, 东湖新技术开å<8f>‘区, 关东街é<81>“, 东湖新技术开å<8f>‘区(托管), 洪山区, 湖北çœ<81>, 430074, ä¸å›½ amenity university 0.438450184063098 ä¸å›½ cn Asia Eastern Asia
+south china agricultural university 2021-02-03 259059311 relation å<8d>Žå<8d>—农业大å¦, 金钟山路, å<8d>Žå<8d>—ç<90>†å·¥å¤§å¦å<8d>—æ–°æ<9d>‘, 五山街é<81>“, 天河区, 广州市, 广东çœ<81>, 510630, ä¸å›½ amenity university 0.398715419165327 ä¸å›½ cn Asia Eastern Asia
+hunan normal university 2021-02-03 71437400 node æ¹–å<8d>—师大, 木兰路, 长沙市, 岳麓区, 长沙市, æ¹–å<8d>—çœ<81>, 410006, ä¸å›½ railway station 0.001 ä¸å›½ cn Asia Eastern Asia
+liaoning 2021-02-03 257963869 relation è¾½å®<81>çœ<81>, ä¸å›½ boundary administrative 0.655891404596791 ä¸å›½ cn Asia Eastern Asia
+china 2021-02-03 257605389 relation ä¸å›½ boundary administrative 0.87882659637803 ä¸å›½ cn Asia Eastern Asia
+state administration of taxation 2021-02-03 181175059 way State Administration of Taxation, G316, 通泰街é<81>“, 邵æ¦å¸‚, å<8d>—平市, ç¦<8f>建çœ<81>, ä¸å›½ office government 0.401 ä¸å›½ cn Asia Eastern Asia
+cuhk 2021-02-03 259201755 relation 香港ä¸æ–‡å¤§å¸ The Chinese University of Hong Kong, å<90><90>露港公路 Tolo Highway, 馬料水 Ma Liu Shui, 馬éž<8d>å±± Ma On Shan, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½ amenity university 0.515796938688453 ä¸å›½ cn Asia Eastern Asia
+chinese academy of agricultural sciences 2021-02-03 299451471 way ä¸å›½å†œä¸šç§‘å¦é™¢, 北三环, 万柳地区, 海淀区, 北京市, 100098, ä¸å›½ amenity research_institute 0.001 ä¸å›½ cn Asia Eastern Asia
+ihu 2021-02-03 258689452 relation 义乌市, 金å<8d>Žå¸‚, 浙江çœ<81>, ä¸å›½ boundary administrative 0.490850025928259 ä¸å›½ cn Asia Eastern Asia
+institute of biotechnology 2021-02-03 152857882 way é¦™æ¸¯ç”Ÿç‰©ç§‘æŠ€ç ”ç©¶é™¢ Hong Kong Institute of Biotechnology, 生物科技路 Biotechnology Avenue, 馬料水 Ma Liu Shui, 馬éž<8d>å±± Ma On Shan, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, DD29 1007, ä¸å›½ building yes 0.301 ä¸å›½ cn Asia Eastern Asia
+beijing huayi 2021-02-03 131049528 way Beijing -Chengde Expressway, 郑家庄æ<9d>‘, 怀柔区 / Huairou, 北京市, ä¸å›½ highway motorway 0.2 ä¸å›½ cn Asia Eastern Asia
+usi 2021-02-03 258635882 relation æ— é”¡å¸‚, 214000, ä¸å›½ boundary administrative 0.547775869917964 ä¸å›½ cn Asia Eastern Asia
+state academy of sciences 2021-02-03 52408051 node 科å¦é™¢ç«™, 天æº<90>è·¯, 龙洞街é<81>“, 天河区, 广州市, 广东çœ<81>, 510650, ä¸å›½ highway bus_stop 0.001 ä¸å›½ cn Asia Eastern Asia
+china national computer congress 2021-02-03 196797629 way ä¸å›½å…±äº§å…šç¬¬äºŒæ¬¡å…¨å›½ä»£è¡¨å¤§ä¼šä¼šå<9d>€, 30, 延安高架路, é<9d>™å®‰åŒº, 200070, ä¸å›½ historic memorial 0.259145294756841 ä¸å›½ cn Asia Eastern Asia
+nanjing university 2021-02-03 110545344 way å<8d>—京大å¦, å<8d>«å··, 鼓楼区, 玄æ¦åŒº, å<8d>—京市, 210093, ä¸å›½ amenity university 0.498289975489913 ä¸å›½ cn Asia Eastern Asia
+king's college 2021-02-03 134145090 way 英皇書院 King's College, 63A, 般咸é<81>“ Bonham Road, 西å<8d>Šå±± Mid-Levels West, 西營盤 Sai Ying Pun, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ amenity school 0.668648909480289 ä¸å›½ cn Asia Eastern Asia
+jiangsu 2021-02-03 296043922 relation 江è‹<8f>çœ<81>, ä¸å›½ boundary administrative 0.67413115257446 ä¸å›½ cn Asia Eastern Asia
+wellcome 2021-02-03 11400763 node æƒ åº· Wellcome, 40, 馬é 角é<81>“ Ma Tau Kok Road, é<9d> 背壟 Kau Pui Lung, 馬é åœ<8d> Ma Tau Wai, ä¹<9d>é¾<8d>城å<8d>€ Kowloon City District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½ shop supermarket 0.101 ä¸å›½ cn Asia Eastern Asia
+hainan 2021-02-03 258588983 relation æµ·å<8d>—çœ<81>, ä¸å›½ boundary administrative 0.61214060827491 ä¸å›½ cn Asia Eastern Asia
+guangzhou women and children's medical center 2021-02-03 217534561 way 妇儿ä¸å¿ƒ, 金穗路隧é<81>“, ç<8f> 江新城, 冼æ<9d>‘è¡—é<81>“, 天河区, 广州市, 广东çœ<81>, 510623, ä¸å›½ building train_station 0.35609057542022 ä¸å›½ cn Asia Eastern Asia
+ipm 2021-02-03 135424854 way 澳門ç<90>†å·¥å¸é™¢ Instituto Politecnico de Macau, 高美士街 Rua de LuÃs Gonzaga Gomes, æ–°å<8f>£å²¸å¡«æµ·å<8d>€ Zona de Aterros do Porto Exterior, æ–°å<8f>£å²¸æ–°å¡«æµ·å<8d>€(皇æœ<9d>å<8d>€) Zona Nova de Aterros do Porto Exterior, å¤§å ‚å<8d>€ Sé, 澳門 Macau, 853, ä¸å›½ amenity college 0.359793334348642 ä¸å›½ cn Asia Eastern Asia
+tianjin university in china 2021-02-03 144399984 way ä¸å›½æ°‘航大å¦, 津北公路, 东丽区, 东丽区 (Dongli), 天津市, 300300, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+air 2021-02-03 97128317 way æ©Ÿå ´ Airport, 翔天路 Sky Plaza Road, 離島å<8d>€ Islands District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½ railway station 0.479338672131387 ä¸å›½ cn Asia Eastern Asia
+chinese communist party 2021-02-03 178219809 way ä¸å…±ä¸€å¤§ä¼šå<9d>€, 374, 黄陂å<8d>—è·¯, æº<90>æˆ<90>里å°<8f>区, 淮海ä¸è·¯è¡—é<81>“, 上海市, 黄浦区, 200021, ä¸å›½ tourism museum 0.406597918617146 ä¸å›½ cn Asia Eastern Asia
+chongqing university 2021-02-03 69380859 node é‡<8d>庆大å¦, æ²™å<9d>ªå<9d><9d>北街, æ²™å<9d>ªå<9d><9d>è¡—é<81>“, æ²™å<9d>ªå<9d><9d>区, é‡<8d>庆ä¸å¿ƒåŸŽåŒº, é‡<8d>庆市, 400030, ä¸å›½ railway station 0.001 ä¸å›½ cn Asia Eastern Asia
+university of macau 2021-02-03 259347553 relation Universidade de Ciência e Tecnologia de Macau æ¾³é–€ç§‘æŠ€å¤§å¸ Macau University of Science and Technology, é›žé ¸é¦¬è·¯ Estrada da Ponta da Cabrita, 北安 Pac On, å˜‰æ¨¡å ‚å<8d>€ Nossa Senhora do Carmo, 氹仔 Taipa, 澳門 Macau, 999078, ä¸å›½ amenity university 0.666591667934692 ä¸å›½ cn Asia Eastern Asia
+nei 2021-02-03 59452923 node 内æ<81>©, å<8d>—å®<81>市, 广西壮æ—<8f>自治区, ä¸å›½ place village 0.275 ä¸å›½ cn Asia Eastern Asia
+uiuc 2021-02-03 207804111 way 浙江大å¦ä¼Šåˆ©è¯ºä¼Šå¤§å¦åŽ„å·´çº³é¦™æ§Ÿæ ¡åŒºè<81>”å<90>ˆå¦é™¢, å<8d>—环路, 鹃湖科技城, æµ·å®<81>市, 嘉兴市, 浙江çœ<81>, 314400, ä¸å›½ building university 0.001 ä¸å›½ cn Asia Eastern Asia
+ustc 2021-02-03 156022554 way ä¸å›½ç§‘å¦æŠ€æœ¯å¤§å¦ ä¸œæ ¡åŒº, 96, 金寨路, ä¸è¡Œå®¿èˆ<8d>, 稻香æ<9d>‘è¡—é<81>“, 蜀山区 (Shushan), å<90>ˆè‚¥å¸‚, 230026, ä¸å›½ amenity university 0.464121550533476 ä¸å›½ cn Asia Eastern Asia
+tongji medical college 2021-02-03 121878064 way å<8d>Žä¸ç§‘技大å¦å<90>ŒæµŽåŒ»å¦é™¢, 航空路, å®<9d>丰街é<81>“, ç¡šå<8f>£åŒº, 江汉区, 湖北çœ<81>, 430030, ä¸å›½ amenity university 0.3004701084432 ä¸å›½ cn Asia Eastern Asia
+chc 2021-02-03 257605389 relation ä¸å›½ boundary administrative 0.87882659637803 ä¸å›½ cn Asia Eastern Asia
+qinghai 2021-02-03 257865875 relation é<9d>’æµ·çœ<81>, ä¸å›½ boundary administrative 0.610517291768724 ä¸å›½ cn Asia Eastern Asia
+inner mongolia 2021-02-03 257842595 relation 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½ boundary administrative 0.65384947808461 ä¸å›½ cn Asia Eastern Asia
+huashan hospital 2021-02-03 258491124 relation 花山区 (Huashan), 马éž<8d>山市, 243000, ä¸å›½ boundary administrative 0.511447002935904 ä¸å›½ cn Asia Eastern Asia
+university of the chinese academy of sciences 2021-02-03 64279650 node UCAS, 玉泉路, ç”°æ<9d>‘, 海淀区, 北京市, 100049, ä¸å›½ amenity university 0.385200970199076 ä¸å›½ cn Asia Eastern Asia
+people's daily 2021-02-03 52429330 node 人民日报广东分社站②, 黄埔大é<81>“西, 天河å<8d>—è¡—é<81>“, 天河区, 广州市, 广东çœ<81>, 510620, ä¸å›½ highway bus_stop 0.001 ä¸å›½ cn Asia Eastern Asia
+times higher education 2021-02-03 83556554 node 时代è<81>”å<8d>Žè¶…市, å¦æž—è¡—, 白æ<9d>¨è¡—é<81>“, 钱塘新区, æ<9d>州市, 浙江çœ<81>, 310018, ä¸å›½ shop yes 0.001 ä¸å›½ cn Asia Eastern Asia
+yunnan 2021-02-03 258085373 relation 云å<8d>—çœ<81>, ä¸å›½ boundary administrative 0.665684201955769 ä¸å›½ cn Asia Eastern Asia
+icc 2021-02-03 96538994 way ç’°ç<90>ƒè²¿æ˜“å»£å ´ International Commerce Centre, 1, 柯士甸é<81>“西 Austin Road West, 西ä¹<9d>é¾<8d> West Kowloon, 油麻地 Yau Ma Tei, 油尖旺å<8d>€ Yau Tsim Mong District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ building tower 0.466329902238883 ä¸å›½ cn Asia Eastern Asia
+shanghaitech university 2021-02-03 258792021 relation 上海科技大å¦, 393å<8f>·, å<8d>Žå¤<8f>ä¸è·¯, 康桥镇, 浦东新区, 101201, ä¸å›½ amenity university 0.377613648458292 ä¸å›½ cn Asia Eastern Asia
+aipi 2021-02-03 302227361 node 矮陂, æƒ å·žå¸‚, 广东çœ<81>, ä¸å›½ place village 0.275 ä¸å›½ cn Asia Eastern Asia
+nanjing university of science and technology 2021-02-03 258596617 relation å<8d>—京ç<90>†å·¥å¤§å¦, å…‰å<8d>Žè·¯, 秦淮区, 玄æ¦åŒº, å<8d>—京市, 210012, ä¸å›½ amenity university 0.416302457462662 ä¸å›½ cn Asia Eastern Asia
+southern university of science and technology 2021-02-03 193573154 way å<8d>—方科技大å¦, 1088, å¦è‹‘大é<81>“, 深圳大å¦åŸŽ, 桃å›è¡—é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518055, ä¸å›½ amenity university 0.310439474412231 ä¸å›½ cn Asia Eastern Asia
+xinjiang 2021-02-03 257472610 relation 新疆维å<90>¾å°”自治区, ä¸å›½ boundary administrative 0.674183703517689 ä¸å›½ cn Asia Eastern Asia
+national people's congress 2021-02-03 143598039 way 湛江人民代表大会 Congrès National du Peuple de Zhanjiang, 人民四西路, 工农街é<81>“, 霞山区, 湛江市, 广东çœ<81>, ä¸å›½ building yes 0.201 ä¸å›½ cn Asia Eastern Asia
+institute of vertebrate paleontology and paleoanthropology 2021-02-03 154175740 way Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½ amenity public_building 0.601 ä¸å›½ cn Asia Eastern Asia
+chinese university of hong kong 2021-02-03 259201755 relation 香港ä¸æ–‡å¤§å¸ The Chinese University of Hong Kong, å<90><90>露港公路 Tolo Highway, 馬料水 Ma Liu Shui, 馬éž<8d>å±± Ma On Shan, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½ amenity university 1.01579693868845 ä¸å›½ cn Asia Eastern Asia
+hong kong university of science and technology 2021-02-03 51695244 node é¦™æ¸¯ç§‘æŠ€å¤§å¸ Hong Kong University of Science and Technology, 大å¸é<81>“ University Road, 碧水新æ<9d>‘ Pik Shui San Tsuen, 大埔仔 Tai Po Tsai, 西貢å<8d>€ Sai Kung District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½ highway bus_stop 0.701 ä¸å›½ cn Asia Eastern Asia
+high court 2021-02-03 113553479 way 高ç‰æ³•é™¢ The High Court, 金é<90>˜é<81>“ Queensway, ä¸å<8d>Šå±± Mid-Levels Central, 金é<90>˜ Admiralty, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ amenity courthouse 0.557784396815435 ä¸å›½ cn Asia Eastern Asia
+life technologies 2021-02-03 54415927 node Just Life restaurant, å<9d>‚雪岗大é<81>“ BÇŽnxuÄ› GÇŽng Av, å<8d>Žä¸ºæŠ€æœ¯æœ‰é™<90>å…¬å<8f>¸, 龙岗区, 深圳市, 广东çœ<81>, 518100, ä¸å›½ tourism attraction 0.101 ä¸å›½ cn Asia Eastern Asia
+caa 2021-02-03 258898604 relation ä¸å›½ç¾Žæœ¯å¦é™¢, å<8d>—山路, 清波街é<81>“, 上城区, æ<9d>州市, 浙江çœ<81>, 310002, ä¸å›½ amenity university 0.4192479107425 ä¸å›½ cn Asia Eastern Asia
+tianhe ii 2021-02-03 258569294 relation 天河区, 广州市, 广东çœ<81>, ä¸å›½ boundary administrative 0.472775653790836 ä¸å›½ cn Asia Eastern Asia
+jiangxi 2021-02-03 258491397 relation 江西çœ<81>, ä¸å›½ boundary administrative 0.660896625230364 ä¸å›½ cn Asia Eastern Asia
+rac 2021-02-03 21930851 node é¦¬å ´ Racecourse, 大埔公路ï¼<8d>沙田段 Tai Po Road – Sha Tin, è<90>½è·¯ä¸‹ Lok Lo Ha, ä¹<9d>è‚š Kau To, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½ railway station 0.471239527648604 ä¸å›½ cn Asia Eastern Asia
+songshan national nature reserve 2021-02-03 226360739 way 北京æ<9d>¾å±±å›½å®¶çº§è‡ªç„¶ä¿<9d>护区, 延庆区, 北京市, ä¸å›½ boundary protected_area 0.298558873147647 ä¸å›½ cn Asia Eastern Asia
+nantong university 2021-02-03 160989544 way å<8d>—通大å¦, å°<8f>æµ·è¡—é<81>“, å´‡å·<9d>区, å<8d>—通市, 226000, ä¸å›½ leisure park 0.15 ä¸å›½ cn Asia Eastern Asia
+sichuan 2021-02-03 257966453 relation å››å·<9d>çœ<81>, ä¸å›½ boundary administrative 0.711286195807749 ä¸å›½ cn Asia Eastern Asia
+china national space administration 2021-02-03 226170093 way ä¸å›½ç©ºé—´æŠ€æœ¯ç ”究院, å”<90>家å²æ<9d>‘, 海淀区, 北京市, ä¸å›½ landuse commercial 0.370940340656356 ä¸å›½ cn Asia Eastern Asia
+southern medical university 2021-02-03 51886881 node å<8d>—方医科大å¦ç«™, 沙太北路, 京溪街é<81>“, 白云区, 广州市, 广东çœ<81>, 510515, ä¸å›½ highway bus_stop 0.001 ä¸å›½ cn Asia Eastern Asia
+open science 2021-02-03 24025212 node Open Oyster, 科å¸é¤¨å»£å ´ Science Museum Square, 尖沙咀æ<9d>± East Tsim Sha Tsui, 尖沙咀 Tsim Sha Tsui, 油尖旺å<8d>€ Yau Tsim Mong District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½ amenity restaurant 0.201 ä¸å›½ cn Asia Eastern Asia
+open university of hong kong 2021-02-03 156773961 way é¦™æ¸¯å…¬é–‹å¤§å¸ The Open University of Hong Kong, 81, å¿ å<9d>è¡— Chung Hau Street, 何文田山 Ho Man Tin Hill, 何文田 Ho Man Tin, ä¹<9d>é¾<8d>城å<8d>€ Kowloon City District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½ building university 0.888105956498361 ä¸å›½ cn Asia Eastern Asia
+national space science center 2021-02-03 48238029 node ä¸å›½ç§‘å¦é™¢å›½å®¶ç©ºé—´ç§‘å¦ä¸å¿ƒ, 1, ä¸å…³æ<9d>‘å<8d>—四街, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½ office research 0.001 ä¸å›½ cn Asia Eastern Asia
+shanghai ocean university 2021-02-03 205461712 way 上海海洋大å¦ï¼ˆä¸´æ¸¯æ ¡åŒºï¼‰, 东海大桥, 浦东新区, 201306, ä¸å›½ amenity university 0.370639694209592 ä¸å›½ cn Asia Eastern Asia
+qub 2021-02-03 299390583 way é°‚éšæ¶Œ Quarry Bay, 896, 英皇é<81>“ King's Road, 七姊妹 Tsat Tsz Mui, é°‚éšæ¶Œ Quarry Bay, æ<9d>±å<8d>€ Eastern District, 香港島 Hong Kong Island, 香港 Hong Kong, ä¸å›½ building train_station 0.398332012645065 ä¸å›½ cn Asia Eastern Asia
+henan 2021-02-03 258289127 relation æ²³å<8d>—çœ<81>, ä¸å›½ boundary administrative 0.699353793876879 ä¸å›½ cn Asia Eastern Asia
+jilin university 2021-02-03 160258991 way å<90>‰æž—大å¦ï¼ˆæœ<9d>é˜³æ ¡åŒºï¼‰, 西民主大街 West Minzhu St, 清和街é<81>“, æœ<9d>阳区, 长春市, å<90>‰æž—çœ<81>, 130000, ä¸å›½ amenity university 0.446917790002857 ä¸å›½ cn Asia Eastern Asia
+shandong 2021-02-03 257941393 relation 山东çœ<81>, ä¸å›½ boundary administrative 0.718289642729985 ä¸å›½ cn Asia Eastern Asia
+research institute 2021-02-03 235380215 way research institute, Foot Path, é›<81>塔区 (Yanta), 西安市, 陕西çœ<81>, 710048, ä¸å›½ office research 0.201 ä¸å›½ cn Asia Eastern Asia
+dsn 2021-02-03 121641844 way 鄂尔多斯伊金éœ<8d>洛机场, 阿大一级公路, 乌兰木伦镇, 伊金éœ<8d>洛旗, 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½ aeroway aerodrome 0.444828356030634 ä¸å›½ cn Asia Eastern Asia
+chinese academy of sciences' institute of vertebrate paleontology 2021-02-03 154175740 way Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½ amenity public_building 0.801 ä¸å›½ cn Asia Eastern Asia
+china institute of water resources and hydropower research 2021-02-03 72695777 node China Institute of Water Resources and Hydropower Research, 1, 玉渊æ½å<8d>—è·¯, 海淀区, 北京市, 100038, ä¸å›½ office Institute 0.801 ä¸å›½ cn Asia Eastern Asia
+chinese academy of sciences institute of chemistry 2021-02-03 218888877 way ä¸å›½ç§‘å¦é™¢åŒ–å¦ç ”究所, ä¸å…³æ<9d>‘北二æ<9d>¡, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½ amenity research_institute 0.222549534893346 ä¸å›½ cn Asia Eastern Asia
+nyu shanghai 2021-02-03 164692824 way NYU Shanghai, 1555, 世纪大é<81>“, å¼ å®¶æ¥¼, 花木镇, 浦东新区, 200120, ä¸å›½ amenity university 0.201 ä¸å›½ cn Asia Eastern Asia
+hong kong polytechnic university 2021-02-03 99717473 way 香港ç<90>†å·¥å¤§å¸ The Hong Kong Polytechnic University, 11, 育æ‰<8d>é<81>“ Yuk Choi Road, 紅磡ç<81>£ Hung Hom Bay, 尖沙咀 Tsim Sha Tsui, 油尖旺å<8d>€ Yau Tsim Mong District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½ amenity university 0.890914282128039 ä¸å›½ cn Asia Eastern Asia
+first affiliated hospital of zhejiang university 2021-02-03 203868614 way 浙江大å¦é™„属第一医院, 庆春路, å°<8f>è<90>¥è¡—é<81>“, 上城区, æ<9d>州市, 浙江çœ<81>, 310003, ä¸å›½ amenity hospital 0.001 ä¸å›½ cn Asia Eastern Asia
+tianjin university 2021-02-03 103498362 way 天津大å¦, 湖滨é<81>“, å<8d>—开区 (Nankai), 天津市, 300084, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+hainan university 2021-02-03 143082445 way æµ·å<8d>—大å¦, 海甸四西路 - Haidian 4th West Road, 人民路街é<81>“, 海甸岛, 美兰区, æµ·å<8f>£å¸‚, æµ·å<8d>—çœ<81>, 570208, ä¸å›½ amenity university 0.400132318333933 ä¸å›½ cn Asia Eastern Asia
+chinese academy of sciences institute of vertebrate paleontology 2021-02-03 154175740 way Institute of Vertebrate Paleontology and Paleoanthropology (IVPP). Chinese Academy of Sciences, 西直门外大街, 西城区, 北京市, 100032, ä¸å›½ amenity public_building 0.801 ä¸å›½ cn Asia Eastern Asia
+scarborough shoal 2021-02-03 302688259 way 黄岩岛(民主ç¤<81>) - Scarborough Shoal, 三沙市, æµ·å<8d>—çœ<81>, ä¸å›½ place island 0.633219531977835 ä¸å›½ cn Asia Eastern Asia
+donghua university 2021-02-03 156972924 way 东å<8d>Žå¤§å¦, 凯旋路, é•¿å®<81>区, 200050, ä¸å›½ amenity university 0.409150861243221 ä¸å›½ cn Asia Eastern Asia
+renmin university 2021-02-03 4331354 node 人民大å¦, 北三环, 万柳地区, 海淀区, 北京市, 100872, ä¸å›½ railway stop 0.001 ä¸å›½ cn Asia Eastern Asia
+shaanxi 2021-02-03 258564458 relation 陕西çœ<81>, ä¸å›½ boundary administrative 0.672615420866457 ä¸å›½ cn Asia Eastern Asia
+lanzhou veterinary research institute 2021-02-03 185815023 way ä¸å›½å†œä¸šç§‘å¦é™¢å…°å·žå…½åŒ»ç ”究所, 1, å¾<90>家å<9d>ª, ç›<90>场路街é<81>“, 兰州市, 城关区, 兰州市, 甘肃çœ<81>, 730046, ä¸å›½ office research 0.001 ä¸å›½ cn Asia Eastern Asia
+guangdong technion israel institute of technology 2021-02-03 204544197 way 广东以色列ç<90>†å·¥å¦é™¢, 241å<8f>·, 大å¦è·¯, 鮀江街é<81>“, 金平区, 汕头市, 广东çœ<81>, 515063, ä¸å›½ amenity university 0.35112554102268 ä¸å›½ cn Asia Eastern Asia
+guizhou 2021-02-03 258210629 relation 贵州çœ<81>, ä¸å›½ boundary administrative 0.653351269063716 ä¸å›½ cn Asia Eastern Asia
+csns 2021-02-03 209031547 way CSNS, 大朗镇, 东莞市, 广东çœ<81>, ä¸å›½ highway residential 0.2 ä¸å›½ cn Asia Eastern Asia
+guangxi 2021-02-03 257932217 relation 广西壮æ—<8f>自治区, ä¸å›½ boundary administrative 0.653225316203717 ä¸å›½ cn Asia Eastern Asia
+xi'an jiaotong university 2021-02-03 156097263 way 西安交通大å¦å…´åº†æ ¡åŒº, å<8f>‹è°Šä¸œè·¯, 碑林区 (Beilin), 西安市, 陕西çœ<81>, 710048, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+citic securities 2021-02-03 149771411 way ä¸ä¿¡è¯<81>券大厦, 8å<8f>·, ä¸å¿ƒä¸‰è·¯, å<8d>“越时代广场, ç¦<8f>田区, 深圳市, 广东çœ<81>, 518048, ä¸å›½ building commercial 0.001 ä¸å›½ cn Asia Eastern Asia
+university of siena 2021-02-03 58928209 node å¤§å¸ University, 沙田å<8d>€å–®è»Šä¸»å¹¹ç¶« Major Cycle Track of Sha Tin District, 馬料水 Ma Liu Shui, ä¹<9d>è‚š Kau To, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½ railway station 0.582526166251558 ä¸å›½ cn Asia Eastern Asia
+nankai university 2021-02-03 101663669 way å<8d>—开大å¦, å¤<8d>康路辅路, å<8d>—开区 (Nankai), 天津市, 300381, ä¸å›½ amenity university 0.579467215043441 ä¸å›½ cn Asia Eastern Asia
+zhejiang gongshang university 2021-02-03 173484760 way 浙江工商大å¦(æ•™å·¥è·¯æ ¡åŒº), 149å<8f>·, 教工路, 西湖区, æ<9d>州市, 浙江çœ<81>, 310012, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+national astronomical observatories 2021-02-03 48659152 node 国家天文å<8f>°, 北辰西路, æœ<9d>阳区, 北京市, 100012, ä¸å›½ amenity research_institute 0.001 ä¸å›½ cn Asia Eastern Asia
+tongji 2021-02-03 58307078 node 童集, å<90>ˆè‚¥å¸‚, ä¸å›½ place village 0.275 ä¸å›½ cn Asia Eastern Asia
+hubei 2021-02-03 257842089 relation 湖北çœ<81>, ä¸å›½ boundary administrative 0.677032187273797 ä¸å›½ cn Asia Eastern Asia
+shandong university 2021-02-03 61783127 node 山东大å¦, è“<9d>è°·è·¯, å<8d>³å¢¨åŒº, é<9d>’岛市, 山东çœ<81>, 266200, ä¸å›½ railway station 0.001 ä¸å›½ cn Asia Eastern Asia
+yunnan university 2021-02-03 50461251 node 云å<8d>—大å¦, é<9d>’云街, å<8d>Žå±±è¡—é<81>“, 五å<8d>ŽåŒº, 昆明市, 云å<8d>—çœ<81>, 650031, ä¸å›½ highway bus_stop 0.001 ä¸å›½ cn Asia Eastern Asia
+university of science and technology of china 2021-02-03 155145876 way ä¸å›½ç§‘å¦æŠ€æœ¯å¤§å¦ åŒ—æ ¡åŒº, 黄山路, 通和大厦, 三里庵街é<81>“, å<90>ˆè‚¥å¸‚区, å<90>ˆè‚¥å¸‚, 230022, ä¸å›½ amenity university 0.464121550533476 ä¸å›½ cn Asia Eastern Asia
+center for food safety 2021-02-03 302473941 way 食物安全ä¸å¿ƒ Centre for Food Safety, 磅巷 Pound Lane, 西å<8d>Šå±± Mid-Levels West, å<8d>Šå±±å<8d>€ Mid-Levels, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, N/A, ä¸å›½ building yes 0.301 ä¸å›½ cn Asia Eastern Asia
+beijing normal university 2021-02-03 98084241 way 北京师范大å¦, 19, æ–°è¡—å<8f>£å¤–大街, 海淀区, 北京市, 100875, ä¸å›½ amenity university 0.477635896973777 ä¸å›½ cn Asia Eastern Asia
+xi'an jiaotong-liverpool university 2021-02-03 200616846 way 西交利物浦大å¦, 文景路, 星慧社区, 月亮湾社工委, è‹<8f>州工业å›åŒºç›´å±žé•‡, è‹<8f>州工业å›åŒº, è‹<8f>州市, 215123, ä¸å›½ amenity university 0.397362929796699 ä¸å›½ cn Asia Eastern Asia
+imperial college 2021-02-03 98640872 way 国å<90>监, 五é<81>“è<90>¥èƒ¡å<90>Œ, 东城区, 北京市, 100010, ä¸å›½ tourism attraction 0.375002297808295 ä¸å›½ cn Asia Eastern Asia
+wuhan university of technology 2021-02-03 130531770 way æ¦æ±‰ç<90>†å·¥å¤§å¦ä½™å®¶å¤´æ ¡åŒº, ç<90>†å·¥äºŒæ¡¥, æ<9d>¨å›è¡—é<81>“, æ¦æ˜ŒåŒº, 湖北çœ<81>, 430080, ä¸å›½ amenity university 0.411679724670082 ä¸å›½ cn Asia Eastern Asia
+china central television 2021-02-03 156562290 way ä¸å¤®å¹¿æ’电视总å<8f>°å¤<8d>兴路办公区, 海淀区, 北京市, ä¸å›½ landuse commercial 0.543449477148185 ä¸å›½ cn Asia Eastern Asia
+xiamen university 2021-02-03 126438748 way 厦门大å¦, 422, æ€<9d>明å<8d>—è·¯, 厦港街é<81>“, æ€<9d>明区, 厦门市, æ€<9d>明区, 厦门市, ç¦<8f>建çœ<81>, 361005, ä¸å›½ amenity university 0.451951803030286 ä¸å›½ cn Asia Eastern Asia
+cha university 2021-02-03 114396997 way 茶港路, æ¦æ±‰å¤§å¦, ç<8f>žç<8f>ˆå±±è¡—é<81>“, æ¦æ˜ŒåŒº, 湖北çœ<81>, 430072, ä¸å›½ highway residential 0.1 ä¸å›½ cn Asia Eastern Asia
+southern china 2021-02-03 258717462 relation å<8d>—å<8d>€ Southern District, 香港島 Hong Kong Island, 香港 Hong Kong, ä¸å›½ boundary administrative 0.57805930713623 ä¸å›½ cn Asia Eastern Asia
+wuhan university 2021-02-03 259347472 relation æ¦æ±‰å¤§å¦, 299å<8f>·, 八一路, ç<8f>žç<8f>ˆå±±è¡—é<81>“, æ¦æ˜ŒåŒº, 湖北çœ<81>, 430072, ä¸å›½ amenity university 0.472024029849061 ä¸å›½ cn Asia Eastern Asia
+wuhan institute of virology 2021-02-03 240734527 way ä¸å›½ç§‘å¦é™¢æ¦æ±‰ç—…æ¯’ç ”ç©¶æ‰€, 金龙大街, 纸å<9d>Šè¡—, 江å¤<8f>区, 湖北çœ<81>, ä¸å›½ amenity research_institute 0.001 ä¸å›½ cn Asia Eastern Asia
+fudan university 2021-02-03 258558662 relation å¤<8d>旦大å¦, 220, 邯郸路, æ<9d>¨æµ¦åŒº, 200433, ä¸å›½ amenity university 0.510109744363923 ä¸å›½ cn Asia Eastern Asia
+beijing forestry university 2021-02-03 183393105 way 北京林业大å¦, 白蜡大é<81>“, 八家æ<9d>‘, 海淀区, 北京市, 010-62332281, ä¸å›½ amenity university 0.39975765213835 ä¸å›½ cn Asia Eastern Asia
+city university of hong kong 2021-02-03 258416888 relation é¦™æ¸¯åŸŽå¸‚å¤§å¸ City University of Hong Kong, 煙墩山隧é<81>“ Beacon Hill Tunnel, 顯田 Hin Tin, 深水埗å<8d>€ Sham Shui Po District, ä¹<9d>é¾<8d> Kowloon, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, 000000, ä¸å›½ amenity university 0.995013581495974 ä¸å›½ cn Asia Eastern Asia
+zhejiang university 2021-02-03 201716562 way 浙江大å¦ä¹‹æ±Ÿæ ¡åŒº, 之江路, 西湖街é<81>“, 西湖区, æ<9d>州市, 浙江çœ<81>, 310008, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+shanxi 2021-02-03 258080027 relation 山西çœ<81>, ä¸å›½ boundary administrative 0.673000372829377 ä¸å›½ cn Asia Eastern Asia
+tongji university 2021-02-03 95605064 way å<90>ŒæµŽå¤§å¦, 1239, 四平路, æ<9d>¨æµ¦åŒº, 200092, ä¸å›½ amenity university 0.469803068930215 ä¸å›½ cn Asia Eastern Asia
+first affiliated hospital of zhengzhou university 2021-02-03 210240098 way 郑州大å¦ç¬¬ä¸€é™„属医院, 1å<8f>·, 龙湖ä¸çŽ¯è·¯, 金水区, 郑州市, æ²³å<8d>—çœ<81>, 450003, ä¸å›½ amenity hospital 0.001 ä¸å›½ cn Asia Eastern Asia
+national autonomous university 2021-02-03 68277017 node æ— äººå€¼å®ˆå›¾ä¹¦é¦†, 1088, å¦è‹‘大é<81>“, 深圳大å¦åŸŽ, 桃å›è¡—é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518000, ä¸å›½ amenity library 0.001 ä¸å›½ cn Asia Eastern Asia
+chinese academy of sciences 2021-02-03 163215118 way ä¸å›½ç§‘å¦é™¢ç‰©ç<90>†ç ”究所, ä¸å…³æ<9d>‘å<8d>—一æ<9d>¡, 新科祥å›, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½ amenity research_institute 0.249182950422608 ä¸å›½ cn Asia Eastern Asia
+xinjiang uyghur autonomous region 2021-02-03 257472610 relation 新疆维å<90>¾å°”自治区, ä¸å›½ boundary administrative 0.674183703517689 ä¸å›½ cn Asia Eastern Asia
+gansu 2021-02-03 257817395 relation 甘肃çœ<81>, ä¸å›½ boundary administrative 0.655464380043053 ä¸å›½ cn Asia Eastern Asia
+zhejiang 2021-02-03 258327108 relation 浙江çœ<81>, ä¸å›½ boundary administrative 0.684734858394146 ä¸å›½ cn Asia Eastern Asia
+green party 2021-02-03 296801653 node The Green Party, é’Ÿå<8d>—è¡—, è<8f><81>å<8d>Žç¤¾åŒº, 东沙湖社工委, è‹<8f>州工业å›åŒºç›´å±žé•‡, è‹<8f>州工业å›åŒº, è‹<8f>州市, 江è‹<8f>çœ<81>, 215028, ä¸å›½ shop variety_store 0.201 ä¸å›½ cn Asia Eastern Asia
+tsinghua university 2021-02-03 259261903 relation 清å<8d>Žå¤§å¦, 30, å<8f>Œæ¸…è·¯, 五é<81>“å<8f>£, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100084, ä¸å›½ amenity university 0.540801021048672 ä¸å›½ cn Asia Eastern Asia
+shenzhen stock exchange 2021-02-03 244033990 way 2012å<8f>·, 深圳è¯<81>券交易所, ç¦<8f>田区, 深圳市, 广东çœ<81>, 518038, ä¸å›½ landuse commercial 0.444601849346538 ä¸å›½ cn Asia Eastern Asia
+kuomintang 2021-02-03 162507523 way ä¸å›½å›½æ°‘党一大旧å<9d>€, 龙虎墙, 大塘街é<81>“, 越秀区, 广州市, 广东çœ<81>, 510375, ä¸å›½ tourism museum 0.254365194683011 ä¸å›½ cn Asia Eastern Asia
+education bureau 2021-02-03 181667938 way Education Bureau, Bayi Bridge, 水北街é<81>“, 邵æ¦å¸‚, å<8d>—平市, ç¦<8f>建çœ<81>, ä¸å›½ office government 0.201 ä¸å›½ cn Asia Eastern Asia
+first affiliated hospital of guangzhou medical university 2021-02-03 199861213 way 广州医科大å¦é™„属第一医院, é<9d>–æµ·è·¯, 人民街é<81>“, 越秀区, 广州市, 广东çœ<81>, 510115, ä¸å›½ amenity hospital 0.158083983169266 ä¸å›½ cn Asia Eastern Asia
+duke kunshan university 2021-02-03 181887054 way Duke Kunshan University, æ<9d>œå…‹å¤§é<81>“, 玉山镇, 昆山市, è‹<8f>州市, ä¸å›½ amenity university 0.703405604298285 ä¸å›½ cn Asia Eastern Asia
+academy of sciences 2021-02-03 52408051 node 科å¦é™¢ç«™, 天æº<90>è·¯, 龙洞街é<81>“, 天河区, 广州市, 广东çœ<81>, 510650, ä¸å›½ highway bus_stop 0.001 ä¸å›½ cn Asia Eastern Asia
+hunan university 2021-02-03 70146415 node æ¹–å<8d>—大å¦, æ•™å¦1å<8f>·, 长沙市, 岳麓区, 长沙市, æ¹–å<8d>—çœ<81>, 410082, ä¸å›½ railway station 0.20962395537125 ä¸å›½ cn Asia Eastern Asia
+peking university 2021-02-03 259319792 relation 北京大å¦, 5å<8f>·, é¢<90>å’Œå›è·¯, 万柳地区, 海淀区, 北京市, 100871, ä¸å›½ amenity university 0.557740373274367 ä¸å›½ cn Asia Eastern Asia
+guangdong 2021-02-03 257937455 relation 广东çœ<81>, ä¸å›½ boundary administrative 0.685068695817348 ä¸å›½ cn Asia Eastern Asia
+sinopharm 2021-02-03 300321655 node Sinopharm, é¾™å<8d>Žä¸œè·¯, 五里桥街é<81>“, 上海市, 黄浦区, 1072, ä¸å›½ office yes 0.101 ä¸å›½ cn Asia Eastern Asia
+second military medical university 2021-02-03 165511350 way 第二军医大å¦, 800, 翔殷路, 五角场街é<81>“, æ<9d>¨æµ¦åŒº, 200433, ä¸å›½ amenity university 0.403582454919981 ä¸å›½ cn Asia Eastern Asia
+tgo 2021-02-03 124970678 way 通辽机场, G111, 育新镇, 科尔æ²<81>区, 通辽市, 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½ aeroway aerodrome 0.425184329336588 ä¸å›½ cn Asia Eastern Asia
+guangzhou medical university 2021-02-03 299916891 node 广医大(ç•ªç¦ºæ ¡åŒº)ç«™, S296, æ–°é€ é•‡, 番禺区, 广州市, 广东çœ<81>, 511434, ä¸å›½ highway bus_stop 0.001 ä¸å›½ cn Asia Eastern Asia
+sichuan university 2021-02-03 162743780 way å››å·<9d>大å¦ï¼ˆæœ›æ±Ÿæ ¡åŒºï¼‰, å¼ æ¾œè·¯, æ¦ä¾¯åŒº, æˆ<90>都市, å››å·<9d>çœ<81>, 610021, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+national institute of biological sciences 2021-02-03 21241550 node National Institute of Biological Sciences (NIBS), 7, 科å¦å›è·¯, 西å<8d>Šå£<81>店æ<9d>‘, 昌平区, 北京市, 102206, ä¸å›½ building office 0.501 ä¸å›½ cn Asia Eastern Asia
+chinese academy of sciences' institute of theoretical physics 2021-02-03 213466451 way ä¸å›½ç§‘å¦é™¢ç<90>†è®ºç‰©ç<90>†ç ”究所, 55å<8f>·, ä¸å…³æ<9d>‘东路, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½ office research 0.001 ä¸å›½ cn Asia Eastern Asia
+university of hong kong in china 2021-02-03 258613825 relation é¦™æ¸¯å¤§å¸ The University of Hong Kong, åˆ—å ¤é “é<81>“ Lyttelton Road, 西å<8d>Šå±± Mid-Levels West, 西營盤 Sai Ying Pun, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ amenity university 1.02967834592939 ä¸å›½ cn Asia Eastern Asia
+shanghai jiao tong university 2021-02-03 124491612 way 上海交通大å¦ï¼ˆå¾<90>æ±‡æ ¡åŒºï¼‰, å<8d>Žå±±è·¯, å¾<90>汇区, 200030, ä¸å›½ amenity university 0.501020559978481 ä¸å›½ cn Asia Eastern Asia
+hong kong baptist university 2021-02-03 19213852 node é¦™æ¸¯æµ¸æœƒå¤§å¸ Hong Kong Baptist University, 安明街 On Ming Street, 石門 Shek Mun, 牛皮沙æ<9d>‘ Ngau Pei Sha Village, 沙田å<8d>€ Sha Tin District, æ–°ç•Œ New Territories, 香港 Hong Kong, ä¸å›½ railway subway_entrance 0.401 ä¸å›½ cn Asia Eastern Asia
+google china 2021-02-03 67831332 node Google, 555, 軒尼詩é<81>“ Hennessy Road, 摩利臣山 Morrison Hill, 銅鑼ç<81>£ Causeway Bay, ç<81>£ä»”å<8d>€ Wan Chai District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ office company 0.101 ä¸å›½ cn Asia Eastern Asia
+ets 2021-02-03 25065834 node å°–æ<9d>± East Tsim Sha Tsui, 梳士巴利é<81>“ Salisbury Road, 尖沙咀æ<9d>± East Tsim Sha Tsui, 尖沙咀 Tsim Sha Tsui, 油尖旺å<8d>€ Yau Tsim Mong District, ä¹<9d>é¾<8d> Kowloon, 香港 Hong Kong, 000000, ä¸å›½ railway yes 0.40331698832418 ä¸å›½ cn Asia Eastern Asia
+legislative council 2021-02-03 113505472 way 立法會綜å<90>ˆå¤§æ¨“ Legislative Council Complex, 添美é<81>“ Tim Mei Avenue, ä¸å<8d>Šå±± Mid-Levels Central, 金é<90>˜ Admiralty, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ amenity townhall 0.715868379984702 ä¸å›½ cn Asia Eastern Asia
+hohai university 2021-02-03 127543175 way 河海大å¦, 汉å<8f>£è¥¿è·¯, 鼓楼区, å<8d>—京市, 210098, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+institute of geographic sciences and natural resources research 2021-02-03 141475601 way ä¸å›½ç§‘å¦é™¢åœ°ç<90>†ç§‘å¦ä¸Žèµ„æº<90>ç ”ç©¶æ‰€, 大屯路, 天创世缘, æœ<9d>阳区, 北京市, 100101, ä¸å›½ office research 0.001 ä¸å›½ cn Asia Eastern Asia
+harbin institute of technology 2021-02-03 258684322 relation 哈尔滨工业大å¦, 教化街, 花å›è¡—é<81>“办事处, å<8d>—岗区, 哈尔滨市, 黑龙江çœ<81>, 150000, ä¸å›½ building university 0.001 ä¸å›½ cn Asia Eastern Asia
+gan 2021-02-03 258491397 relation 江西çœ<81>, ä¸å›½ boundary administrative 0.660896625230364 ä¸å›½ cn Asia Eastern Asia
+sun yat-sen university 2021-02-03 162813155 way ä¸å±±å¤§å¦å<8d>—æ ¡åŒº, 135, 新港西路, 新港街é<81>“, æµ·ç<8f> 区, 广州市, 广东çœ<81>, 510275, ä¸å›½ amenity university 0.474754845855875 ä¸å›½ cn Asia Eastern Asia
+china geological survey 2021-02-03 74604676 node China Geological Survey, 一环路北三段, 星辰苑, 人民北路街é<81>“, æˆ<90>都市, å››å·<9d>çœ<81>, 610084, ä¸å›½ office government 0.301 ä¸å›½ cn Asia Eastern Asia
+lmc 2021-02-03 120334390 way è<90>½é¦¬æ´² Lok Ma Chau, è<90>½é¦¬æ´²æ”¯ç·šç®¡åˆ¶ç«™ Lok Ma Chau Spur Line, ç¦<8f>田区, 深圳市, 元朗å<8d>€ Yuen Long District, æ–°ç•Œ New Territories, 广东çœ<81>, 香港 Hong Kong, 518048, ä¸å›½ building train_station 0.402513658204824 ä¸å›½ cn Asia Eastern Asia
+jiuquan satellite launch center 2021-02-03 146193628 way 酒泉å<8d>«æ˜Ÿå<8f>‘å°„ä¸å¿ƒ, S315, 东风镇, é¢<9d>济纳旗, 阿拉善盟, 内蒙å<8f>¤è‡ªæ²»åŒº, ä¸å›½ aeroway spaceport 0.46012624965149 ä¸å›½ cn Asia Eastern Asia
+shenzhen university 2021-02-03 73604974 node 深大, 科技å<8d>—一路, 粤海街é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518000, ä¸å›½ railway station 0.001 ä¸å›½ cn Asia Eastern Asia
+chinese academy of engineering 2021-02-03 218888890 way ä¸å›½ç§‘å¦é™¢è¿‡ç¨‹å·¥ç¨‹ç ”究所(东区), ä¸å…³æ<9d>‘北二æ<9d>¡, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100190, ä¸å›½ amenity research_institute 0.119931111449547 ä¸å›½ cn Asia Eastern Asia
+genome biology 2021-02-03 177252901 way å®¶èš•åŸºå› ç»„å›½å®¶é‡<8d>点实验室, 乡建路, 北碚区, é‡<8d>庆ä¸å¿ƒåŸŽåŒº, é‡<8d>庆市, 400715, ä¸å›½ building university 0.001 ä¸å›½ cn Asia Eastern Asia
+center for disease control and prevention 2021-02-03 41562327 node 疾控ä¸å¿ƒ, 工农å<8d>—è·¯, 文峰街é<81>“, å´‡å·<9d>区, å<8d>—通市, 226000, ä¸å›½ highway bus_stop 0.001 ä¸å›½ cn Asia Eastern Asia
+people's liberation army 2021-02-03 113303197 way ä¸åœ‹äººæ°‘解放è»<8d>é§<90>香港部隊大廈 Chinese People's Liberation Army Forces Hong Kong Building, æ·»è<8f>¯é<81>“ Tim Wa Avenue, 金é<90>˜ Admiralty, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ building yes 0.655351334110971 ä¸å›½ cn Asia Eastern Asia
+hupo 2021-02-03 259081826 relation ç<90>¥ç<8f>€é•‡, 麦积区, 天水市, 甘肃çœ<81>, ä¸å›½ boundary administrative 0.228876356713622 ä¸å›½ cn Asia Eastern Asia
+southern university of china 2021-02-03 193573154 way å<8d>—方科技大å¦, 1088, å¦è‹‘大é<81>“, 深圳大å¦åŸŽ, 桃å›è¡—é<81>“, å<8d>—山区, 深圳市, 广东çœ<81>, 518055, ä¸å›½ amenity university 0.310439474412231 ä¸å›½ cn Asia Eastern Asia
+lanzhou university 2021-02-03 71262039 node 兰州大å¦, 天水ä¸è·¯, 团结新æ<9d>‘è¡—é<81>“, 兰州市, 城关区, 兰州市, 甘肃çœ<81>, 730001, ä¸å›½ railway station 0.042720323856182 ä¸å›½ cn Asia Eastern Asia
+peking union medical college 2021-02-03 190689755 way 北京å<8d><8f>和医院, 1, 帅府å›èƒ¡å<90>Œ, 东城区, 北京市, 100010, ä¸å›½ amenity hospital 0.312408728172101 ä¸å›½ cn Asia Eastern Asia
+hebei university of science and technology 2021-02-03 127875964 way 河北科技大å¦, 科技大å¦ä¸œé—¨å<8f>£, 裕翔街é<81>“, 裕å<8d>ŽåŒº, 石家庄市, 桥西区, 河北çœ<81>, 050024, ä¸å›½ amenity university 0.34859234613195 ä¸å›½ cn Asia Eastern Asia
+ihcc 2021-02-03 96538994 way ç’°ç<90>ƒè²¿æ˜“å»£å ´ International Commerce Centre, 1, 柯士甸é<81>“西 Austin Road West, 西ä¹<9d>é¾<8d> West Kowloon, 油麻地 Yau Ma Tei, 油尖旺å<8d>€ Yau Tsim Mong District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ building tower 0.466329902238883 ä¸å›½ cn Asia Eastern Asia
+yanbian university 2021-02-03 149934887 way å»¶è¾¹å¤§å¦ ì—°ë³€ëŒ€í•™, å›å·<9d>è¡— ì›<90>천거리, 延å<90>‰å¸‚ 연길시, å…¬å›è¡—é<81>“, 延å<90>‰å¸‚, 延边æœ<9d>鲜æ—<8f>自治州, å<90>‰æž—çœ<81>, 133000, ä¸å›½ amenity university 0.400690081410952 ä¸å›½ cn Asia Eastern Asia
+china national offshore oil corporation 2021-02-03 52352480 node ä¸å›½æµ·æ²¹ CNOOC, 花城æœ<8d>务区, 花都区, 广州市, 广东çœ<81>, ä¸å›½ amenity fuel 0.001 ä¸å›½ cn Asia Eastern Asia
+ocean university of china 2021-02-03 203984036 way ä¸å›½æµ·æ´‹å¤§å¦, 5, 鱼山路, 市å<8d>—区, é<9d>’岛市, 山东çœ<81>, 266001, ä¸å›½ amenity university 0.403405604298285 ä¸å›½ cn Asia Eastern Asia
+china west normal university 2021-02-03 258825506 relation å<8d>Žä¸œå¸ˆèŒƒå¤§å¦, 3663, ä¸å±±åŒ—è·¯, é•¿å®<81>区, 200062, ä¸å›½ amenity university 0.470582098448222 ä¸å›½ cn Asia Eastern Asia
+university of nottingham ningbo china 2021-02-03 148245237 way å®<81>波诺ä¸<81>汉大å¦, 199, 康泰ä¸è·¯, 首å<8d>—è¡—é<81>“, 鄞州区, å®<81>波市, 浙江çœ<81>, 315100, ä¸å›½ amenity university 0.368648909480289 ä¸å›½ cn Asia Eastern Asia
+tsinghua 2021-02-03 259261903 relation 清å<8d>Žå¤§å¦, 30, å<8f>Œæ¸…è·¯, 五é<81>“å<8f>£, 东å<8d>‡åœ°åŒº, 海淀区, 北京市, 100084, ä¸å›½ amenity university 0.540801021048672 ä¸å›½ cn Asia Eastern Asia
+instagram 2021-02-03 174127886 way Instagram Pier, 石塘咀 Shek Tong Tsui, ä¸è¥¿å<8d>€ Central and Western District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ highway service 0.357277503353622 ä¸å›½ cn Asia Eastern Asia
+anhui 2021-02-03 296043921 relation 安徽çœ<81>, ä¸å›½ boundary administrative 0.659871277196784 ä¸å›½ cn Asia Eastern Asia
+dalian university of technology 2021-02-03 190857010 way 大连ç<90>†å·¥å¤§å¦, 2å<8f>·, 红凌路, 甘井å<90>区, 凌水街é<81>“, 甘井å<90>区, 大连市, è¾½å®<81>çœ<81>, 116024, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+institute of higher education 2021-02-03 134120775 way 浙江ç»<8f>è´¸è<81>Œä¸šæŠ€æœ¯å¦é™¢, å¦æž—è¡—, 白æ<9d>¨è¡—é<81>“, 钱塘新区, æ<9d>州市, 浙江çœ<81>, 310018, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+political consultative conference 2021-02-03 183739682 way 胶澳总ç<9d>£åºœæ—§å<9d>€ï¼ˆçŽ°é<9d>’岛市人大ã€<81>政å<8d><8f>办公楼), 沂水路, 市å<8d>—区, é<9d>’岛市, 山东çœ<81>, 266001, ä¸å›½ office government 0.001 ä¸å›½ cn Asia Eastern Asia
+institute of atmospheric physics 2021-02-03 228833038 way ä¸å›½ç§‘å¦é™¢å¤§æ°”物ç<90>†ç ”究所, æœ<9d>阳区, 北京市, ä¸å›½ landuse commercial 0.2 ä¸å›½ cn Asia Eastern Asia
+liaocheng university 2021-02-03 169515004 way è<81>ŠåŸŽå¤§å¦è¥¿æ ¡åŒº, 花å›å<8d>—路辅路, 东昌府区, è<81>ŠåŸŽå¸‚, 山东çœ<81>, 252000, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+wenchang satellite launch center 2021-02-03 166967645 way 文昌å<8d>«æ˜Ÿå<8f>‘射场, S206, 东郊镇, 文昌市, æµ·å<8d>—çœ<81>, ä¸å›½ aeroway spaceport 0.428336328616045 ä¸å›½ cn Asia Eastern Asia
+xinhua news agency 2021-02-03 199853292 way æ–°è<8f>¯é€šè¨Šç¤¾ Xinhua News Agency, 379-381, 皇å<90>Žå¤§é<81>“æ<9d>± Queen's Road East, 摩利臣山 Morrison Hill, ç<81>£ä»” Wan Chai, ç<81>£ä»”å<8d>€ Wan Chai District, 香港島 Hong Kong Island, 香港 Hong Kong, 000000, ä¸å›½ office newspaper 0.301 ä¸å›½ cn Asia Eastern Asia
+china agricultural university 2021-02-03 104756267 way ä¸å›½å†œä¸šå¤§å¦è¥¿æ ¡åŒº, 2å<8f>·, 圆明å›è¥¿è·¯, 马连洼æ<9d>‘, 海淀区, 北京市, 100093, ä¸å›½ amenity university 0.001 ä¸å›½ cn Asia Eastern Asia
+hei 2021-02-03 258184662 relation 黑龙江çœ<81>, ä¸å›½ boundary administrative 0.646855260728525 ä¸å›½ cn Asia Eastern Asia
+school of pharmacy 2021-02-03 204162763 way School of Pharmacy, å<8d>—å¦é™¢è¡—, 江å<8d>—大å¦èµ¤é©¬å˜´é<81>—å<9d>€, 滨湖区, æ— é”¡å¸‚, 江è‹<8f>çœ<81>, 214000, ä¸å›½ building yes 0.301 ä¸å›½ cn Asia Eastern Asia
+china food and drug administration 2021-02-03 60378418 node 柳州市食å“<81>è<8d>¯å“<81>监ç<9d>£ç®¡ç<90>†å±€, 海关路西一巷, æ¡‚ä¸ç¤¾åŒº, 城ä¸åŒº, 柳州市, 广西壮æ—<8f>自治区, 545006, ä¸å›½ office government 0.001 ä¸å›½ cn Asia Eastern Asia
+ihec 2021-02-03 150867020 way 宜春明月山机场, 锦绣大é<81>“, 湖田镇, è¢<81>州区, 宜春市, 江西çœ<81>, ä¸å›½ aeroway aerodrome 0.443317794581981 ä¸å›½ cn Asia Eastern Asia
+fujian 2021-02-03 258464335 relation ç¦<8f>建çœ<81>, ä¸å›½ boundary administrative 0.661825005937183 ä¸å›½ cn Asia Eastern Asia
+jianghan university 2021-02-03 78769329 node 江汉大å¦é™„属医院, 香港路, 西马街é<81>“, 江岸区, 湖北çœ<81>, 430021, ä¸å›½ amenity hospital 0.001 ä¸å›½ cn Asia Eastern Asia
+communist party of china 2021-02-03 204074725 way ä¸å…±æ±•å¤´å¸‚委员会, 8å<8f>·, 海滨路, 海安街é<81>“, 金平区, 汕头市, 广东çœ<81>, 515031, ä¸å›½ office political_party 0.001 ä¸å›½ cn Asia Eastern Asia
+institute of high energy physics 2021-02-03 160099538 way ä¸å›½ç§‘å¦é™¢é«˜èƒ½ç‰©ç<90>†ç ”究所, 19å<8f>·ä¹™, 玉泉路, ç”°æ<9d>‘, 海淀区, 北京市, 100049, ä¸å›½ amenity research_institute 0.001 ä¸å›½ cn Asia Eastern Asia
+autodesk research 2021-02-03 156971777 way 欧特克软件ä¸å›½ç ”å<8f>‘ä¸å¿ƒ, 峨山路 91 弄, 花木镇, 浦东新区, 200122, ä¸å›½ building commercial 0.001 ä¸å›½ cn Asia Eastern Asia
+zhejiang university school of medicine 2021-02-03 149415240 way 浙江大å¦åŒ»å¦é™¢, é<81>µä¹‰è·¯, 三墩镇, 西湖区, æ<9d>州市, 浙江çœ<81>, 310058, ä¸å›½ building university 0.001 ä¸å›½ cn Asia Eastern Asia
+tiangong 2021-02-03 83432983 node ç”°å…±, å<8d>—å®<81>市, 广西壮æ—<8f>自治区, ä¸å›½ place village 0.275 ä¸å›½ cn Asia Eastern Asia
+china university of geosciences 2021-02-03 259360085 relation ä¸å›½åœ°è´¨å¤§å¦ï¼ˆæ¦æ±‰ï¼‰, 388å<8f>·, é²<81>磨路, 关山街é<81>“, 洪山区, 湖北çœ<81>, 430074, ä¸å›½ amenity university 0.382526166251558 ä¸å›½ cn Asia Eastern Asia
+tibet autonomous region 2021-02-03 296714732 relation 西è—<8f>自治区, ä¸å›½ boundary administrative 0.627670964975274 ä¸å›½ cn Asia Eastern Asia
+wikipedia 2021-02-03 258072903 relation Amazonas, Amazonia, Colombia boundary administrative 0.478217339016076 Colombia co Americas South America
+university of antioquia 2021-02-03 129472917 way Universidad Católica del Norte, Calle 34, Alto de la Mina, Vereda Las Cruces, Santa Rosa de Osos, Norte, Antioquia, Región Andina, Colombia amenity university 0.101 Colombia co Americas South America
+interfax 2021-02-03 26601120 node Interfax, Carrera 3, San Pedro, Casco urbano ChÃa, ChÃa, Sabana Centro, Cundinamarca, Región Andina, 25001, Colombia shop computer 0.101 Colombia co Americas South America
+nebula genomics 2021-02-03 12402461 node GENOMICS, Carrera 42, Tequendama, Comuna 19, PerÃmetro Urbano Santiago de Cali, Cali, Sur, Valle del Cauca, PacÃfica, 76000, Colombia amenity hospital 0.101 Colombia co Americas South America
+university of quindío 2021-02-03 191022266 way Universidad la Gran Colombia - Ciudadela del Saber La Santa MarÃa, Armenia - Aeropuerto, Armenia, Capital, QuindÃo, Región Andina, 630008, Colombia amenity university 0.101 Colombia co Americas South America
+co 2021-02-03 258355394 relation Colombia boundary administrative 0.879708646936571 Colombia co Americas South America
+national university of colombia 2021-02-03 259285997 relation Universidad Nacional de Colombia, 26-85, Carrera 45, Rafael Nuñez, UPZ La Esmeralda, Localidad Teusaquillo, Bogotá, Bogotá Distrito Capital, Región Andina, 111321, Colombia amenity university 0.381311730611622 Colombia co Americas South America
+natural products branch 2021-02-03 77766964 node Madre Sierra productos naturales, Carrera 5, Palomino, Dibulla, La Guajira, Caribe, 446009, Colombia amenity pharmacy 0.101 Colombia co Americas South America
+dc 2021-02-03 258397765 relation Bogotá Distrito Capital, Región Andina, 11001, Colombia boundary administrative 0.683174342915783 Colombia co Americas South America
+calipso 2021-02-03 259165216 relation Calipso, Comuna 13, PerÃmetro Urbano Santiago de Cali, Cali, Sur, Valle del Cauca, PacÃfica, Colombia boundary administrative 0.4 Colombia co Americas South America
+antonio nariño university 2021-02-03 11561601 node Antonio Nariño, VÃa A Chinchina, Estambul, Comuna La Macarena, Manizales, Centrosur, Caldas, Región Andina, 176002, Colombia amenity university 0.201 Colombia co Americas South America
+columbia 2021-02-03 258355394 relation Colombia boundary administrative 0.779708646936571 Colombia co Americas South America
+cas 2021-02-03 1280004 node Casanare, Orinoquia, Colombia place state 0.65 Colombia co Americas South America
+pva 2021-02-03 101597975 way Aeropuerto El Embrujo, VÃa Circunvalar de Providencia, Bailey, Rocky Point, Archipiélago de San Andrés, Providencia y Santa Catalina, Colombia aeroway aerodrome 0.345950553181826 Colombia co Americas South America
+colombia 2021-02-03 258355394 relation Colombia boundary administrative 0.879708646936571 Colombia co Americas South America
+galileo 2021-02-03 228694972 way Galileo, Localidad Usaquén, Bogotá, Bogotá Distrito Capital, Región Andina, 110131, Colombia landuse residential 0.3 Colombia co Americas South America
+centre of genomics 2021-02-03 12402461 node GENOMICS, Carrera 42, Tequendama, Comuna 19, PerÃmetro Urbano Santiago de Cali, Cali, Sur, Valle del Cauca, PacÃfica, 76000, Colombia amenity hospital 0.101 Colombia co Americas South America
+concordia 2021-02-03 258583302 relation Concordia, Suroeste, Antioquia, Región Andina, Colombia boundary administrative 0.55 Colombia co Americas South America
+gpi 2021-02-03 250290459 way Guapi Airport, Carrera 9B, OlÃmpico, Olimpico, Guapi, PacÃfico, Cauca, PacÃfica, Colombia aeroway aerodrome 0.305003945962319 Colombia co Americas South America
+costa rica 2021-02-03 258402817 relation Costa Rica boundary administrative 0.916454807244672 Costa Rica cr Americas Central America
+coca cola 2021-02-03 258704001 relation Coca Cola, Merced, Cantón San José, Provincia San José, 10102, Costa Rica boundary administrative 0.45 Costa Rica cr Americas Central America
+yugoslavia 2021-02-03 297426759 way Yugoslavia, Reynold GarcÃa (Pastorita), Peñas Altas, Ciudad de Matanzas, Matanzas, Cuba natural beach 0.3 Cuba cu Americas Caribbean
+university of havana 2021-02-03 135439351 way Universidad de las Ciencias Informáticas (UCI), Km. 2 ½, Autopista Novia del MediodÃa, La Lisa, La Habana, La Lisa, Cuba amenity university 0.260958143076972 Cuba cu Americas Caribbean
+cu 2021-02-03 258428385 relation Cuba boundary administrative 0.844839051690795 Cuba cu Americas Caribbean
+lisa 2021-02-03 46086136 node La Lisa, 13500, Cuba place county 0.55 Cuba cu Americas Caribbean
+cuba 2021-02-03 258428385 relation Cuba boundary administrative 0.844839051690795 Cuba cu Americas Caribbean
+precioso 2021-02-03 74151205 node Precioso, Varadero, Cárdenas, Matanzas, 42211, Cuba place hamlet 0.35 Cuba cu Americas Caribbean
+cape verde 2021-02-03 258324792 relation Cabo Verde boundary administrative 0.757468696317777 Cabo Verde cv Africa Western Africa
+cyprus institute 2021-02-03 236429001 way The Cyprus Institute, F119, Governor's Beach, Λεμεσός, ΚÏ<8d>Ï€Ï<81>ος, 4524, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs building yes 0.201 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs cy Asia Western Asia
+icmr 2021-02-03 59592822 node ICMR, 100, Leoforos Amathountos, Κοινότητα Αγίου ΤÏ<8d>χωνα, Λεμεσός, ΚÏ<8d>Ï€Ï<81>ος, 4532, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs amenity clinic 0.101 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs cy Asia Western Asia
+olivo labs 2021-02-03 145941969 way Labs, Thessalias Street, Lykavitos, Λευκωσία, Δήμος Λευκωσίας, Λευκωσία - LefkoÅŸa, Λευκωσία, ΚÏ<8d>Ï€Ï<81>ος, 1048, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs amenity university 0.101 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs cy Asia Western Asia
+cyprus 2021-02-03 257947846 relation ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs boundary administrative 0.720547249770618 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs cy Asia Western Asia
+international business times 2021-02-03 172052208 way Διεθνής ΑεÏ<81>ολιμÎνας Πάφου, E603, Κοινότητα Τίμης, Πάφος, ΚÏ<8d>Ï€Ï<81>ος, 8507, ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs aeroway aerodrome 0.402062797383891 ΚÏ<8d>Ï€Ï<81>ος - Kıbrıs cy Asia Western Asia
+wine institute 2021-02-03 296282907 node Wine Institute, 797, Kodaňská, Vršovice, Hlavnà město Praha, Praha, 10100, Česko shop wine 0.201 Česko cz Europe Eastern Europe
+cas institute of microbiology 2021-02-03 208449178 way Mikrobiologický ústav AV ČR, v.v.i. (laboratoř gnotobiologie), Doly, Nový Hrádek, okres Náchod, Královéhradecký kraj, Severovýchod, 54922, Česko amenity research_institute 0.001 Česko cz Europe Eastern Europe
+unicode 2021-02-03 101090349 way UNICODE Systems, StÅ™Ãtež u TÅ™ebÃÄ<8d>e, StÅ™Ãtež, okres TÅ™ebÃÄ<8d>, Kraj VysoÄ<8d>ina, Jihovýchod, ÄŒesko landuse industrial 0.3 ÄŒesko cz Europe Eastern Europe
+czech republic 2021-02-03 257259323 relation ÄŒesko boundary administrative 0.810148442865958 ÄŒesko cz Europe Eastern Europe
+icos 2021-02-03 75655700 node ICOS, 251, 5. kvÄ›tna, PleÅ¡ivec, ÄŒeský Krumlov, okres ÄŒeský Krumlov, JihoÄ<8d>eský kraj, Jihozápad, 381 01, ÄŒesko amenity social_facility 0.101 ÄŒesko cz Europe Eastern Europe
+institute of anatomy 2021-02-03 258199235 relation Institute of Anatomy, U Nemocnice, Nové Město, Hlavnà město Praha, Praha, 11121, Česko building civic 0.301 Česko cz Europe Eastern Europe
+wikimedia 2021-02-03 53573639 node Wikimedia ČR, 1705/21, Slovenská, Vinohrady, Hlavnà město Praha, Praha, 12000, Česko office ngo 0.101 Česko cz Europe Eastern Europe
+vivus 2021-02-03 142158070 way Vivus, Kurta Konráda, Libeň, Hlavnà město Praha, Praha, 19093, Česko building residential 0.101 Česko cz Europe Eastern Europe
+charles university 2021-02-03 11772836 node Farmaceutická fakulta UK, Akademika Heyrovského, U Orlice, Hradec Králové, okres Hradec Králové, Královéhradecký kraj, Severovýchod, 50012, Česko amenity university 0.001 Česko cz Europe Eastern Europe
+more aqua 2021-02-03 102824192 way Moře, Rašovy, Turkovice, okres Pardubice, Pardubický kraj, Severovýchod, Česko natural water 0.2 Česko cz Europe Eastern Europe
+pr 2021-02-03 257910432 relation Hlavnà město Praha, Praha, Česko boundary administrative 0.843491463278747 Česko cz Europe Eastern Europe
+brontosaurus 2021-02-03 44738526 node Brontosaurus, JetÅ™ichovice, okres DÄ›Ä<8d>Ãn, Ústecký kraj, Severozápad, 40716, ÄŒesko natural peak 0.4 ÄŒesko cz Europe Eastern Europe
+lyra 2021-02-03 49441191 node Lyra, LudvÃkov, okres Bruntál, Moravskoslezský kraj, Moravskoslezsko, 79324, ÄŒesko natural peak 0.4 ÄŒesko cz Europe Eastern Europe
+public interest 2021-02-03 13912826 node Public interest, U Milosrdných, Staré Město, Hlavnà město Praha, Praha, 110000, Česko amenity bar 0.201 Česko cz Europe Eastern Europe
+lipi 2021-02-03 258043507 relation LipÃ, okres ÄŒeské BudÄ›jovice, JihoÄ<8d>eský kraj, Jihozápad, ÄŒesko boundary administrative 0.445458181651172 ÄŒesko cz Europe Eastern Europe
+czech technical university 2021-02-03 96182197 way ÄŒeské vysoké uÄ<8d>enà technické v Praze, Na Zderaze, Nové MÄ›sto, Hlavnà mÄ›sto Praha, Praha, 11121, ÄŒesko amenity university 0.001 ÄŒesko cz Europe Eastern Europe
+gsa 2021-02-03 179764032 way Agentura pro evropský GNSS, Strossmayerovo námÄ›stÃ, HoleÅ¡ovice, Hlavnà mÄ›sto Praha, Praha, 170 00, ÄŒesko office government 0.372568181723457 ÄŒesko cz Europe Eastern Europe
+cibus 2021-02-03 1243731 node ÄŒÃbuz, Skalice, okres Hradec Králové, Královéhradecký kraj, Severovýchod, 50303, ÄŒesko place village 0.275 ÄŒesko cz Europe Eastern Europe
+czech academy of sciences 2021-02-03 97095811 way Akademie vÄ›d ÄŒeské republiky, DivadelnÃ, Staré MÄ›sto, Hlavnà mÄ›sto Praha, Praha, 11665, ÄŒesko building yes 0.455436556781574 ÄŒesko cz Europe Eastern Europe
+vertex 2021-02-03 99141481 way Vertex, NedoÅ¡Ãn, LitomyÅ¡l, okres Svitavy, Pardubický kraj, Severovýchod, ÄŒesko landuse industrial 0.3 ÄŒesko cz Europe Eastern Europe
+sprint 2021-02-03 119878029 way Sprint, Jimramov, SedliÅ¡tÄ›, Jimramov, okres ŽÄ<8f>ár nad Sázavou, Kraj VysoÄ<8d>ina, Jihovýchod, ÄŒesko landuse industrial 0.3 ÄŒesko cz Europe Eastern Europe
+troja 2021-02-03 258008039 relation Troja, Hlavnà město Praha, Praha, 17100, Česko boundary administrative 0.521401226677294 Česko cz Europe Eastern Europe
+spiegel 2021-02-03 44819975 node Zrcadlo, Tisá, okres Ústà nad Labem, Ústecký kraj, Severozápad, 40336, Česko natural peak 0.3 Česko cz Europe Eastern Europe
+ctvt 2021-02-03 108596514 way Lesnà ČtvÅ¥, Vápenná, okres JesenÃk, Olomoucký kraj, StÅ™ednà Morava, ÄŒesko landuse residential 0.2 ÄŒesko cz Europe Eastern Europe
+rcp 2021-02-03 238495840 way RCP, Florenc, KarlÃn, Hlavnà mÄ›sto Praha, Praha, ÄŒesko landuse construction 0.3 ÄŒesko cz Europe Eastern Europe
+sec 2021-02-03 16251886 node SeÄ<8d>, nám. Prof. ÄŒ. Strouhala, SeÄ<8d>, okres Chrudim, Pardubický kraj, Severovýchod, 53807, ÄŒesko tourism camp_site;caravan_site;attraction 0.463856464536119 ÄŒesko cz Europe Eastern Europe
+der spiegel 2021-02-03 44819975 node Zrcadlo, Tisá, okres Ústà nad Labem, Ústecký kraj, Severozápad, 40336, Česko natural peak 0.3 Česko cz Europe Eastern Europe
+proton 2021-02-03 44452898 node Proton, HÅ™ensko, okres DÄ›Ä<8d>Ãn, Ústecký kraj, Severozápad, 407 14, ÄŒesko natural peak 0.4 ÄŒesko cz Europe Eastern Europe
+dusel 2021-02-03 21160565 node Dusel, Eppenbrunn, Pirmasens-Land, Südwestpfalz, Rheinland-Pfalz, Deutschland natural peak 0.4 Deutschland de Europe Western Europe
+leibniz university of hanover 2021-02-03 97020033 way Leibniz Universität Hannover, "Parkhaus", Appelstraße, Nordstadt, Nord, Hannover, Region Hannover, Niedersachsen, 30167, Deutschland amenity university 0.594591508955585 Deutschland de Europe Western Europe
+machine intelligence 2021-02-03 99945955 way Munich School of Robotics and Machine Intelligence (MSRM), Technische Universität München, 134, Heßstraße, Bezirksteil Schwere-Reiter-Straße, Schwabing-West, München, Bayern, 80797, Deutschland building yes 0.201 Deutschland de Europe Western Europe
+fdp 2021-02-03 79106534 node FDP, Kirschgartenstraße, Hofheim am Taunus, Main-Taunus-Kreis, Hessen, 65719, Deutschland office political_party 0.101 Deutschland de Europe Western Europe
+germany 2021-02-03 257692299 relation Deutschland boundary administrative 0.889681489172255 Deutschland de Europe Western Europe
+danone 2021-02-03 116486470 way Danone, Kastenau, Rosenheim, Bayern, 83022, Deutschland landuse industrial 0.3 Deutschland de Europe Western Europe
+ahl 2021-02-03 259336777 relation Ahl, Bad Soden-Salmünster, Main-Kinzig-Kreis, Hessen, Deutschland boundary administrative 0.4 Deutschland de Europe Western Europe
+pricewaterhousecoopers 2021-02-03 135320867 way PricewaterhouseCoopers, 5, Fuhrberger Straße, Kleefeld, Buchholz-Kleefeld, Hannover, Region Hannover, Niedersachsen, 30625, Deutschland building yes 0.450501936383412 Deutschland de Europe Western Europe
+us army 2021-02-03 104158774 way US Army, Finthen, Layenhof, Mainz, Rheinland-Pfalz, 55126, Deutschland landuse military 0.4 Deutschland de Europe Western Europe
+bayer schering pharma 2021-02-03 258846355 relation 178, Bayer Pharma AG, Wedding, Mitte, Berlin, 13353, Deutschland landuse industrial 0.464431309768303 Deutschland de Europe Western Europe
+rwth aachen university 2021-02-03 302467785 relation RWTH Aachen, Sandkaulstraße, Kaiserplatz, Frankenberger Viertel, Aachen-Mitte, Aachen, Städteregion Aachen, Nordrhein-Westfalen, 52062, Deutschland amenity university 0.776424465208321 Deutschland de Europe Western Europe
+hamburg 2021-02-03 116376 node Hamburg, 20095, Deutschland place city 0.825525646308822 Deutschland de Europe Western Europe
+mpa 2021-02-03 100723451 way MPA, Wiesenau, Brieskow-Finkenheerd, Oder-Spree, Brandenburg, 15295, Deutschland landuse farmyard 0.3 Deutschland de Europe Western Europe
+university of leipzig 2021-02-03 134933365 way Hochschule für Technik, Wirtschaft und Kultur Leipzig, Richard-Lehmann-Straße, Connewitz, Süd, Leipzig, Sachsen, Deutschland amenity university 0.426239076957718 Deutschland de Europe Western Europe
+max planck institute for astrophysics 2021-02-03 65732258 node Max-Planck-Institut für Astrophysik, 1, Karl-Schwarzschild-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland office research 0.664296579375046 Deutschland de Europe Western Europe
+bayer 2021-02-03 54102872 node Bayer, Dippoldiswalde, Sächsische Schweiz-Osterzgebirge, Sachsen, 01734, Deutschland natural peak 0.4 Deutschland de Europe Western Europe
+johnson & johnson 2021-02-03 120701063 way Johnson & Johnson, Gemarkung Barmen, Wuppertal, Nordrhein-Westfalen, 42289, Deutschland landuse industrial 0.4 Deutschland de Europe Western Europe
+milinski 2021-02-03 67441170 node Milinski, 5, Am Germanenring, Bruchköbel, Main-Kinzig-Kreis, Hessen, 63486, Deutschland shop car 0.101 Deutschland de Europe Western Europe
+planck institute 2021-02-03 6750725 node Max-Planck-Institut für Festkörperforschung, 1, Heisenbergstraße, Max-Planck-Institute, Büsnau, Vaihingen, Stuttgart, Baden-Württemberg, 70569, Deutschland office research 0.201 Deutschland de Europe Western Europe
+idf 2021-02-03 155620333 way Institut der Feuerwehr, 237, Wolbecker Straße, Mauritz-Ost, Münster-Ost, Münster, Nordrhein-Westfalen, 48155, Deutschland amenity college 0.228876356713622 Deutschland de Europe Western Europe
+thales alenia space 2021-02-03 121548045 way Thales Alenia Space, Ditzingen, Landkreis Ludwigsburg, Baden-Württemberg, 71254, Deutschland landuse commercial 0.747092386151836 Deutschland de Europe Western Europe
+max planck institute for chemistry 2021-02-03 258507046 relation Max-Planck-Institut für Chemie, 1, Hahn-Meitner-Weg, Oberstadt, Mainz, Rheinland-Pfalz, 55128, Deutschland building university 0.201 Deutschland de Europe Western Europe
+huawei 2021-02-03 301442980 node Huawei Customer Service Center, 92a, Königsallee, Stadtmitte, Stadtbezirk 1, Düsseldorf, Nordrhein-Westfalen, 40212, Deutschland office company 0.637513180260927 Deutschland de Europe Western Europe
+university of ulm 2021-02-03 136528376 way Hochschule Neu-Ulm, John-F.-Kennedy-Straße, Wiley-Mitte, Neu-Ulm, Landkreis Neu-Ulm, Bayern, 89231, Deutschland amenity university 0.36691348680426 Deutschland de Europe Western Europe
+christian-albrechts university 2021-02-03 258412488 relation Christian-Albrechts-Universität zu Kiel, Hasseldieksdammer Weg, Schreventeich, Kiel, Schleswig-Holstein, 24116, Deutschland amenity university 0.739675942498043 Deutschland de Europe Western Europe
+goethe university 2021-02-03 682490 node Goethe-Denkmal, Edsger-W.-Dijkstra-Gedächtnisweg, Universitätsviertel, Martinsviertel-West, Darmstadt-Nord, Darmstadt, Hessen, 64289, Deutschland historic memorial 0.219931111449547 Deutschland de Europe Western Europe
+embl 2021-02-03 123328960 way EMBL, 85 Gebäude 25a, Notkestraße, Bahrenfeld, Altona, Hamburg, 22607, Deutschland office research 0.101 Deutschland de Europe Western Europe
+friedrich miescher laboratory 2021-02-03 104029631 way Friedrich-Miescher-Laboratorium, 9, Max-Planck-Ring, Max-Planck-Institut, Schönblick / Winkelwiese, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland building yes 0.487997652924817 Deutschland de Europe Western Europe
+university of frankfurt 2021-02-03 84474458 way Frankfurt University of Applied Sciences, Nibelungenallee, Nordend West, Innenstadt 3, Frankfurt am Main, Hessen, 60318, Deutschland amenity university 0.612019878936673 Deutschland de Europe Western Europe
+ess 2021-02-03 93094803 way Flughafen Essen-Mülheim, Zeppelinstraße, Raadt, Menden-Holthausen, Rechtsruhr-Süd, Mülheim an der Ruhr, Nordrhein-Westfalen, 45470, Deutschland aeroway aerodrome 0.451332014915526 Deutschland de Europe Western Europe
+schering 2021-02-03 2932912 node Schering, Rimsting, Landkreis Rosenheim, Bayern, 83253, Deutschland place isolated_dwelling 0.3 Deutschland de Europe Western Europe
+dfg 2021-02-03 99534807 way DFG Eingang Metzer Straße, Metzer Straße, Bellevue, Alt-Saarbrücken, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66117, Deutschland amenity parking 0.101 Deutschland de Europe Western Europe
+university of giessen 2021-02-03 6864299 node Oberer Hardthof, Gießen, Landkreis Gießen, Hessen, 35398, Deutschland amenity university 0.101 Deutschland de Europe Western Europe
+ims 2021-02-03 258521052 relation Ems, 48291, Deutschland waterway river 0.450731319596144 Deutschland de Europe Western Europe
+ludwig maximilian university 2021-02-03 108346027 way Ludwig-Maximilians-Universität, 1, Geschwister-Scholl-Platz, Bezirksteil Universität, Maxvorstadt, München, Bayern, 80539, Deutschland amenity university 0.812089678594562 Deutschland de Europe Western Europe
+molecular genetics center 2021-02-03 95773291 way Max-Planck-Institut für molekulare Zellbiologie und Genetik, 108, Pfotenhauerstraße, Johannstadt-Nord, Johannstadt, Altstadt, Dresden, Sachsen, 01307, Deutschland office research 0.324670737896991 Deutschland de Europe Western Europe
+university of kiel 2021-02-03 95613087 way Fachhochschule Kiel, Grenzstraße, Neumühlen-Dietrichsdorf, Kiel, Schleswig-Holstein, 24149, Deutschland amenity university 0.414691670621569 Deutschland de Europe Western Europe
+environment and energy 2021-02-03 5585166 node Wuppertal Institut für Klima, Umwelt, Energie, 19, Döppersberg, Südstadt, Gemarkung Elberfeld, Wuppertal, Nordrhein-Westfalen, 42103, Deutschland office research 0.418669334531229 Deutschland de Europe Western Europe
+leibniz institute 2021-02-03 103261509 way Leibniz-Institut für Astrophysik Potsdam, Rosa-Luxemburg-Straße, Neubabelsberg, Babelsberg Nord, Babelsberg, Potsdam, Brandenburg, 14482, Deutschland amenity research_institute 0.383208261767925 Deutschland de Europe Western Europe
+aachen university 2021-02-03 56863988 node Burschenschaft Markomannia Aachen Greifswald, 12, Karl-Marx-Platz, Innenstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland amenity fraternity 0.101 Deutschland de Europe Western Europe
+university of bremen 2021-02-03 258700328 relation Universität Bremen, 1, Bibliothekstraße, Lehe, Horn-Lehe, Stadtbezirk Bremen-Ost, Bremen, 28359, Deutschland amenity university 0.587526066641517 Deutschland de Europe Western Europe
+university of bonn in germany 2021-02-03 20122302 node Rheinische Friedrich-Wilhelms-Universität Bonn, Arkadenhof, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland amenity university 0.890223294922313 Deutschland de Europe Western Europe
+max planck institute for chemical ecology 2021-02-03 258183717 relation Max-Planck-Institut für Chemische Ökologie, 8, Hans-Knöll-Straße, Süd, Jena-Süd, Jena, Thüringen, 07745, Deutschland office research 0.517609725634953 Deutschland de Europe Western Europe
+nature network 2021-02-03 47672659 node EarthLink e.V. – The People & Nature Network, 14, Frohschammerstraße, Bezirksteil Am Riesenfeld, Milbertshofen-Am Hart, München, Bayern, 80807, Deutschland club yes 0.201 Deutschland de Europe Western Europe
+gebrüder meier 2021-02-03 97290833 way Gebrüder-Meier-Weg, Edmundsthal-Siemerswalde, Geesthacht, Herzogtum Lauenburg, Schleswig-Holstein, 21502, Deutschland highway living_street 0.3 Deutschland de Europe Western Europe
+saturn 2021-02-03 113007948 way Saturn, 13, Berliner Straße, Senden, Landkreis Neu-Ulm, Bayern, 89250, Deutschland shop electronics 0.496378365738396 Deutschland de Europe Western Europe
+max planck institute for biological cybernetics 2021-02-03 258094329 relation Max-Planck-Institut für Biologische Kybernetik, 8, Max-Planck-Ring, Max-Planck-Institut, Schönblick / Winkelwiese, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland building office 0.515802194348806 Deutschland de Europe Western Europe
+max planck institute of neurobiology 2021-02-03 6221673 node Max-Planck-Institut für Neurobiologie, 18, Am Klopferspitz, Martinsried, Planegg, Landkreis München, Bayern, 82152, Deutschland amenity university 0.517252435362624 Deutschland de Europe Western Europe
+ifom 2021-02-03 106305867 way Institut für Forschung in der Operativen Medizin, Ostmerheimer Straße, Merheim, Kalk, Köln, Nordrhein-Westfalen, 51109, Deutschland amenity university 0.001 Deutschland de Europe Western Europe
+modis 2021-02-03 301357766 node Modis, Parsevalstraße, Bindersleben, Erfurt, Thüringen, 99092, Deutschland office company 0.101 Deutschland de Europe Western Europe
+foreign office 2021-02-03 100405265 way Auswärtiges Amt, 1, Werderscher Markt, Mitte, Berlin, 10117, Deutschland office government 0.533666708979672 Deutschland de Europe Western Europe
+dzne 2021-02-03 259082916 relation Deutsches Zentrum für Neurodegenerative Erkrankungen, 1, Venusberg-Campus, Venusberg, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53127, Deutschland office research 0.001 Deutschland de Europe Western Europe
+naturwissenschaften 2021-02-03 297176250 way Naturwissenschaften, Am Schwanhof, Südviertel, Marburg, Landkreis Marburg-Biedenkopf, Hessen, 35037, Deutschland building school 0.101 Deutschland de Europe Western Europe
+university of dusseldorf 2021-02-03 23771253 node Wohnanlage Gurlittstraße - Studierendenwerk Düsseldorf, 14 - 18, Gurlittstraße, Bilk, Stadtbezirk 3, Düsseldorf, Nordrhein-Westfalen, 40223, Deutschland amenity university 0.001 Deutschland de Europe Western Europe
+karlsruhe university 2021-02-03 127366738 way Karlshochschule International University, 36-38, Karlstraße, Innenstadt-West Westlicher Teil, Innenstadt-West, Karlsruhe, Baden-Württemberg, 76133, Deutschland amenity university 0.508817475555606 Deutschland de Europe Western Europe
+ministry of research 2021-02-03 259033442 relation Bundesministerium für Bildung und Forschung, 1, Kapelle-Ufer, Mitte, Berlin, 10117, Deutschland office government 0.468523457581497 Deutschland de Europe Western Europe
+university of wuppertal 2021-02-03 96382279 way Bergische Universität Wuppertal - Campus Grifflenberg, Gaußstraße, Grifflenberg, Gemarkung Elberfeld, Wuppertal, Nordrhein-Westfalen, 42119, Deutschland amenity university 0.538650451987068 Deutschland de Europe Western Europe
+european research organisation 2021-02-03 229063373 way Europäische Südsternwarte, 2, Karl-Schwarzschild-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland amenity research_institute 0.001 Deutschland de Europe Western Europe
+ems 2021-02-03 258521052 relation Ems, 48291, Deutschland waterway river 0.550731319596144 Deutschland de Europe Western Europe
+masai mara national reserve 2021-02-03 74900850 node Masai Mara, Hodenhagen, Samtgemeinde Ahlden, Heidekreis, Niedersachsen, 29693, Deutschland place locality 0.325 Deutschland de Europe Western Europe
+national biodiversity institute 2021-02-03 118088771 way Institut für Evolution und Biodiversität, 1, Hüfferstraße, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland building university 0.001 Deutschland de Europe Western Europe
+heinrich-böll foundation 2021-02-03 97689731 way Heinrich-Böll-Stiftung, 8, Schumannstraße, Mitte, Berlin, 10117, Deutschland building civic 0.201 Deutschland de Europe Western Europe
+sanger institute 2021-02-03 106208569 way Professor-Sänger-Straße, DLR Lampoldshausen, Hardthausen am Kocher, Verwaltungsgemeinschaft Neuenstadt am Kocher, Landkreis Heilbronn, Baden-Württemberg, 74239, Deutschland highway unclassified 0.1 Deutschland de Europe Western Europe
+max planck institute for mathematics 2021-02-03 4330352 node Max-Planck-Institut für Mathematik, 7, Vivatsgasse, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53111, Deutschland amenity university 0.582526166251558 Deutschland de Europe Western Europe
+awg 2021-02-03 94962156 way AWG, Zeile, Beiersdorf, Oppach-Beiersdorf, Görlitz, Sachsen, 02736, Deutschland highway residential 0.2 Deutschland de Europe Western Europe
+east germany 2021-02-03 258412985 relation E, Elstertrebnitz, Pegau, Landkreis Leipzig, Sachsen, Deutschland landuse residential 0.386379445861941 Deutschland de Europe Western Europe
+heidelberg university in germany 2021-02-03 6159717 node SRH Hochschule, 6, Ludwig-Guttmann-Straße, Wieblingen, Heidelberg, Baden-Württemberg, 69123, Deutschland amenity university 0.514317004425986 Deutschland de Europe Western Europe
+technical university of munich 2021-02-03 161377183 way Technische Universität München, Am Coulombwall, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland amenity university 0.544238542262786 Deutschland de Europe Western Europe
+guest 2021-02-03 863347 node Guest, Diedrichshagen, Weitenhagen, Landhagen, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17491, Deutschland place hamlet 0.35 Deutschland de Europe Western Europe
+university of stuttgart 2021-02-03 123666613 way Universität Hohenheim, Mühlweg, Hohenheim, Plieningen, Stuttgart, Aichtal, Baden-Württemberg, 70599, Deutschland amenity university 0.54210101824834 Deutschland de Europe Western Europe
+rankl 2021-02-03 300250708 node Rankl, 8, Südliche Münchner Straße, Grünwald, Landkreis München, Bayern, 82031, Deutschland shop window_blind 0.101 Deutschland de Europe Western Europe
+humboldt university of berlin 2021-02-03 257729496 relation Humboldt-Universität zu Berlin, 6, Unter den Linden, Mitte, Berlin, 10117, Deutschland building university 0.827161448874237 Deutschland de Europe Western Europe
+alphago 2021-02-03 81074242 node alphago, 18, Hauptstraße, Kenten, Bergheim, Rhein-Erft-Kreis, Nordrhein-Westfalen, 50126, Deutschland shop security 0.111 Deutschland de Europe Western Europe
+ge free 2021-02-03 98138672 way Freiwillige Feuerwehr Gelting, 45, Geltinger Straße, Gelting, Pliening, Landkreis Ebersberg, Bayern, 85652, Deutschland amenity fire_station 0.101 Deutschland de Europe Western Europe
+european space operations centre 2021-02-03 112384523 way European Space Operations Centre, Waldkolonie, Darmstadt-Nord, Darmstadt, Hessen, 64293, Deutschland landuse institutional 0.6 Deutschland de Europe Western Europe
+european research universities 2021-02-03 232582752 way Zentrum für Entwicklungsforschung / Zentrum für europäische Integrationsforschung, Genscherallee, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland amenity university 0.222549534893346 Deutschland de Europe Western Europe
+max planck institute for infection biology 2021-02-03 53762784 node Max-Planck-Institut für Infektionsbiologie, 12, Virchowweg, Mitte, Berlin, 10117, Deutschland office research 0.505872022275768 Deutschland de Europe Western Europe
+university of duisburg-essen 2021-02-03 127148044 way Universität Duisburg-Essen, L+M-Bereich, Gneisenaustraße, Einschornsteinsiedlung, Neudorf-Nord, Duisburg-Mitte, Duisburg, Nordrhein-Westfalen, 47057, Deutschland amenity university 0.201 Deutschland de Europe Western Europe
+merck kgaa 2021-02-03 258400816 relation Merck KGaA, Darmstadt-Nord, Darmstadt, Hessen, 64293, Deutschland landuse industrial 0.4 Deutschland de Europe Western Europe
+center of applied space technology and microgravity 2021-02-03 258848507 relation Zentrum für angewandte Raumfahrttechnologie und Mikrogravitation, 2, Am Fallturm, Lehe, Horn-Lehe, Stadtbezirk Bremen-Ost, Bremen, 28359, Deutschland office research 0.101 Deutschland de Europe Western Europe
+climate and energy 2021-02-03 5585166 node Wuppertal Institut für Klima, Umwelt, Energie, 19, Döppersberg, Südstadt, Gemarkung Elberfeld, Wuppertal, Nordrhein-Westfalen, 42103, Deutschland office research 0.418669334531229 Deutschland de Europe Western Europe
+max planck institute for solar system research 2021-02-03 153463565 way Max-Planck-Institut für Sonnensystemforschung, 3, Justus-von-Liebig-Weg, Weende, Weende / Deppoldshausen, Göttingen, Landkreis Göttingen, Niedersachsen, 37077, Deutschland amenity university 0.401 Deutschland de Europe Western Europe
+heinrich heine university 2021-02-03 95164755 way Heinrich-Heine-Straße, Stadtrandsiedlung, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland highway residential 0.3 Deutschland de Europe Western Europe
+max planck institute for developmental biology 2021-02-03 103844203 way Max-Planck-Institut für Entwicklungsbiologie, 5, Max-Planck-Ring, Max-Planck-Institut, Schönblick / Winkelwiese, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland building yes 0.201 Deutschland de Europe Western Europe
+university of hohenheim 2021-02-03 123666613 way Universität Hohenheim, Mühlweg, Hohenheim, Plieningen, Stuttgart, Aichtal, Baden-Württemberg, 70599, Deutschland amenity university 0.54210101824834 Deutschland de Europe Western Europe
+pris 2021-02-03 259252002 relation Pries, Kiel, Schleswig-Holstein, 24159, Deutschland boundary administrative 0.306301518086152 Deutschland de Europe Western Europe
+max planck institute of plasma physics 2021-02-03 62003775 node Max-Planck-Institut für Plasmaphysik, 1, Wendelsteinstraße, Koitenhagen, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17491, Deutschland office research 0.646843791996006 Deutschland de Europe Western Europe
+university of lübeck 2021-02-03 10423017 node Musikhochschule Lübeck, Große Petersgrube, Innenstadt, Lübeck, Schleswig-Holstein, 23552, Deutschland amenity university 0.450710506461892 Deutschland de Europe Western Europe
+university of augsburg 2021-02-03 130471545 way Universität, Universitätsstraße, Universitätsviertel, Augsburg, Bayern, 86159, Deutschland railway platform 0.101 Deutschland de Europe Western Europe
+dlr german aerospace center 2021-02-03 258165325 relation Deutsches Zentrum für Luft- und Raumfahrt, Grengel, Porz, Köln, Nordrhein-Westfalen, 51147, Deutschland landuse industrial 0.419657429852984 Deutschland de Europe Western Europe
+federal office for radiation protection 2021-02-03 100961001 way Bundesamt für Strahlenschutz, 120-130, Köpenicker Allee, Karlshorst, Lichtenberg, Berlin, 10318, Deutschland amenity research_institute 0.348159836291227 Deutschland de Europe Western Europe
+neg 2021-02-03 64853201 node NEG, 118, Hansastraße, Günnigfeld, Bochum-Wattenscheid, Nordrhein-Westfalen, 44866, Deutschland shop electronics 0.101 Deutschland de Europe Western Europe
+leibniz institute for zoo and wildlife research 2021-02-03 169300978 way Leibniz-Institut für Zoo- und Wildtierforschung (IZW), Alfred-Kowalke-Straße, Reihenhäuser Kalinka, Friedrichsfelde, Lichtenberg, Berlin, 10315, Deutschland office research 0.401 Deutschland de Europe Western Europe
+ucs 2021-02-03 225927055 way UCS, Veddel, Hamburg-Mitte, Hamburg, 20539, Deutschland landuse commercial 0.3 Deutschland de Europe Western Europe
+university of hamburg 2021-02-03 101158067 way Universität Hamburg, 177, Mittelweg, Rotherbaum, Eimsbüttel, Hamburg, 20148, Deutschland building yes 0.101 Deutschland de Europe Western Europe
+max planck institute for the study of religious and ethnic diversity 2021-02-03 259291204 relation Max-Planck-Institut zur Erforschung multireligiöser und multiethnischer Gesellschaften, Hermann-Föge-Weg, Oststadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland amenity university 0.59324803174626 Deutschland de Europe Western Europe
+rbm 2021-02-03 106627798 way Flugplatz Straubing-Wallmühle, SRs 20, Öberau, Straubing, Bayern, 94315, Deutschland aeroway aerodrome 0.33674906391142 Deutschland de Europe Western Europe
+isf 2021-02-03 189869599 way International School Frankfurt Rhein-Main, 33, Straße zur Internationalen Schule, Sindlingen, West, Frankfurt am Main, Hessen, 65931, Deutschland amenity school 0.272343749103071 Deutschland de Europe Western Europe
+milan kováč 2021-02-03 3165617 node Hazienda, 3, Moosdorfstraße, Oberalting, Seefeld, Wörthsee, Landkreis Starnberg, Bayern, 82229, Deutschland amenity restaurant 0.001 Deutschland de Europe Western Europe
+fraunhofer institute 2021-02-03 124413328 way Fraunhofer-Institute, Heidenhofstraße, Mooswald-Ost, Mooswald, Freiburg im Breisgau, Baden-Württemberg, 79110, Deutschland amenity parking 0.201 Deutschland de Europe Western Europe
+leibniz university 2021-02-03 108957038 way Leibniz-Institut für Plasmaforschung und Technologie (INP), 2, Felix-Hausdorff-Straße, Nördliche Mühlenvorstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland building yes 0.295871082899258 Deutschland de Europe Western Europe
+german primate center 2021-02-03 101999477 way Deutsches Primatenzentrum GmbH, 7, Hans-Adolf-Krebs-Weg, Weende, Weende / Deppoldshausen, Göttingen, Landkreis Göttingen, Niedersachsen, 37077, Deutschland building yes 0.101 Deutschland de Europe Western Europe
+helmholtz center munich 2021-02-03 106041248 way Helmholtzstraße, Bezirksteil Marsfeld, Maxvorstadt, München, Bayern, 80636, Deutschland highway residential 0.2 Deutschland de Europe Western Europe
+max planck institute for extraterrestrial physics 2021-02-03 14838537 node Max-Planck-Institut für extraterrestrische Physik, 1, Gießenbachstraße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland office research 0.668804350670811 Deutschland de Europe Western Europe
+university of tübingen 2021-02-03 155721520 way Klimagarten der Universität Tübingen, Sand, Lustnau, Tübingen, Landkreis Tübingen, Baden-Württemberg, 72076, Deutschland leisure park 0.25 Deutschland de Europe Western Europe
+university of bonn 2021-02-03 20122302 node Rheinische Friedrich-Wilhelms-Universität Bonn, Arkadenhof, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland amenity university 0.790223294922313 Deutschland de Europe Western Europe
+esoc 2021-02-03 112384523 way European Space Operations Centre, Waldkolonie, Darmstadt-Nord, Darmstadt, Hessen, 64293, Deutschland landuse institutional 0.2 Deutschland de Europe Western Europe
+applied space technology and microgravity 2021-02-03 258848507 relation Zentrum für angewandte Raumfahrttechnologie und Mikrogravitation, 2, Am Fallturm, Lehe, Horn-Lehe, Stadtbezirk Bremen-Ost, Bremen, 28359, Deutschland office research 0.101 Deutschland de Europe Western Europe
+deutsche bank 2021-02-03 101028871 way Deutsche Bank, 29-41, Lindenallee, Stadtkern, Stadtbezirk I, Essen, Nordrhein-Westfalen, 45127, Deutschland historic heritage 0.417338060184506 Deutschland de Europe Western Europe
+giss 2021-02-03 106040825 way Giss, Wölfershausen, Heringen, Landkreis Hersfeld-Rotenburg, Hessen, 36266, Deutschland waterway stream 0.3 Deutschland de Europe Western Europe
+proxima centauri 2021-02-03 58951540 node Proxima Centauri, Milchweg, Haingebiet, Inselstadt, Bamberg, Bayern, 96049, Deutschland tourism information 0.201 Deutschland de Europe Western Europe
+nims 2021-02-03 258826114 relation Nims, Eifelkreis Bitburg-Prüm, Rheinland-Pfalz, 54597, Deutschland waterway river 0.372343749103071 Deutschland de Europe Western Europe
+bielefeld university 2021-02-03 213139009 way Universität Bielefeld, 25, Universitätsstraße, Schildesche, Bielefeld, Nordrhein-Westfalen, 33615, Deutschland amenity university 0.579570236211385 Deutschland de Europe Western Europe
+forest degradation 2021-02-03 48683621 node Entwürdigung, L 3170, Rasdorf, Landkreis Fulda, Hessen, 36169, Deutschland tourism artwork 0.001 Deutschland de Europe Western Europe
+nru 2021-02-03 119195573 way NRU, 18, Werner-von-Siemens-Straße, Industriepark Saarwellingen, Saarwellingen, Landkreis Saarlouis, Saarland, 66793, Deutschland building yes 0.101 Deutschland de Europe Western Europe
+stic 2021-02-03 104228249 way STIC, Strausberg, Märkisch-Oderland, Brandenburg, 15344, Deutschland landuse commercial 0.3 Deutschland de Europe Western Europe
+institute for futures studies 2021-02-03 98779886 way Institut für Zukunftsstudien und Technologiebewertung (IZT), 26, Schopenhauerstraße, Schlachtensee, Steglitz-Zehlendorf, Berlin, 14129, Deutschland office research 0.001 Deutschland de Europe Western Europe
+max planck institute 2021-02-03 95363379 way Max-Planck-Institute, Büsnau, Vaihingen, Stuttgart, Baden-Württemberg, 70569, Deutschland landuse commercial 0.5 Deutschland de Europe Western Europe
+göttingen university 2021-02-03 101743013 way Mathematische Fakultät, 3-5, Bunsenstraße, Südstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland building university 0.101 Deutschland de Europe Western Europe
+university of bonn medical centre 2021-02-03 20122302 node Rheinische Friedrich-Wilhelms-Universität Bonn, Arkadenhof, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland amenity university 0.790223294922313 Deutschland de Europe Western Europe
+icp 2021-02-03 67708109 node ICP, 11, Auf der Breit, Gewerbegebiet Breit, Durlach, Karlsruhe, Baden-Württemberg, 76227, Deutschland office company 0.101 Deutschland de Europe Western Europe
+begemann 2021-02-03 243706481 way Begemann, Stoddartstraße, Pivitsheide V.H., Pivitsheide V. L. Kussel, Detmold, Kreis Lippe, Nordrhein-Westfalen, 32758, Deutschland amenity shelter 0.101 Deutschland de Europe Western Europe
+university of veterinary medicine hanover 2021-02-03 97041389 way Tierärztliche Hochschule Hannover, 15, Schwesternhausstraße, Bult, Südstadt-Bult, Hannover, Region Hannover, Niedersachsen, 30173, Deutschland amenity university 0.340053860433783 Deutschland de Europe Western Europe
+max planck institute of molecular cell biology and genetics 2021-02-03 95773291 way Max-Planck-Institut für molekulare Zellbiologie und Genetik, 108, Pfotenhauerstraße, Johannstadt-Nord, Johannstadt, Altstadt, Dresden, Sachsen, 01307, Deutschland office research 0.624670737896991 Deutschland de Europe Western Europe
+jma 2021-02-03 236857200 way JMA, Jocksdorf, Neiße-Malxetal, Döbern-Land, Spree-Neiße, Brandenburg, 03159, Deutschland landuse farmyard 0.3 Deutschland de Europe Western Europe
+antiproton 2021-02-03 258877064 relation FAIR, Wixhausen, Darmstadt, Hessen, 64291, Deutschland landuse construction 0.256321943137092 Deutschland de Europe Western Europe
+polarstern 2021-02-03 3976082 node Polarstern, 8, Herzog-Georg-Straße, Bad Liebenstein, Wartburgkreis, Thüringen, 36448, Deutschland amenity cafe 0.101 Deutschland de Europe Western Europe
+johannes gutenberg university 2021-02-03 185604791 way Johannes-Bobrowski-Straße, Stadtrandsiedlung, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland highway living_street 0.2 Deutschland de Europe Western Europe
+bristol-myers squibb 2021-02-03 69556244 node Bristol-Myers Squibb, 29, Arnulfstraße, Finanzamt München, Maxvorstadt, München, Bayern, 80636, Deutschland office pharmacy 0.759130436192281 Deutschland de Europe Western Europe
+bausch 2021-02-03 15525429 node Bausch, Schützenstraße, Sankt Lorenz Süd, Lübeck, Schleswig-Holstein, 23558, Deutschland shop car_repair 0.101 Deutschland de Europe Western Europe
+german aerospace centre 2021-02-03 258165325 relation Deutsches Zentrum für Luft- und Raumfahrt, Grengel, Porz, Köln, Nordrhein-Westfalen, 51147, Deutschland landuse industrial 0.419657429852984 Deutschland de Europe Western Europe
+university of münster 2021-02-03 258955070 relation Westfälische Wilhelms-Universität, 2, Schlossplatz, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland amenity university 0.65844573834098 Deutschland de Europe Western Europe
+goethe university of frankfurt 2021-02-03 60505320 node Goethe Welcome Centre, Theodor-W.-Adorno-Platz, Westend Nord, Innenstadt 2, Frankfurt am Main, Hessen, 60323, Deutschland amenity university 0.201 Deutschland de Europe Western Europe
+university of aachen 2021-02-03 302467785 relation RWTH Aachen, Sandkaulstraße, Kaiserplatz, Frankenberger Viertel, Aachen-Mitte, Aachen, Städteregion Aachen, Nordrhein-Westfalen, 52062, Deutschland amenity university 0.67642446520832 Deutschland de Europe Western Europe
+sfi 2021-02-03 174161539 way Laserzentrum, Fröhden, Jüterbog, Teltow-Fläming, Brandenburg, 14913, Deutschland landuse commercial 0.2 Deutschland de Europe Western Europe
+reuters 2021-02-03 16075920 node Reuters, Lauterbach, Vogelsbergkreis, Hessen, 36318, Deutschland place village 0.305371759161912 Deutschland de Europe Western Europe
+university of cologne 2021-02-03 259569292 relation Universität zu Köln, Albertus-Magnus-Platz, Lindenthal, Köln, Nordrhein-Westfalen, 50931, Deutschland amenity university 0.559121890158648 Deutschland de Europe Western Europe
+university of mainz 2021-02-03 79998910 node Praxis Dipl.-Psych. Univ. Thilo Rommel, 13, Emmeransstraße, Altstadt, Mainz, Rheinland-Pfalz, 55116, Deutschland amenity doctors 0.101 Deutschland de Europe Western Europe
+university of oldenburg 2021-02-03 94259203 way Carl von Ossietzky Universität Oldenburg, 99, Uhlhornsweg, Haarenfeld, Haarentor, Oldenburg, Niedersachsen, 26129, Deutschland amenity university 0.537234715266229 Deutschland de Europe Western Europe
+max planck institute for informatics 2021-02-03 102150427 way Max-Planck-Institut für Informatik, E1 4, Campus, Universität, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66123, Deutschland building university 0.638041195081873 Deutschland de Europe Western Europe
+biontech 2021-02-03 126159487 way 12, BioNTech, Oberstadt, Mainz, Rheinland-Pfalz, 55131, Deutschland landuse commercial 0.3 Deutschland de Europe Western Europe
+institute of optics 2021-02-03 150324329 way Max-Planck-Institut für Quantenoptik, 1, Hans-Kopfermann-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland amenity research_institute 0.333532730730458 Deutschland de Europe Western Europe
+medigene 2021-02-03 80346809 node Medigene AG, 11, Lochhamer Straße, Martinsried, Planegg, Landkreis München, Bayern, 82152, Deutschland office company 0.101 Deutschland de Europe Western Europe
+fws 2021-02-03 14490517 node FWS, 5, Stephanstraße, St. Johanner Markt, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66111, Deutschland amenity language_school 0.101 Deutschland de Europe Western Europe
+treves 2021-02-03 258446038 relation Trier, Rheinland-Pfalz, Deutschland boundary administrative 0.610664693690996 Deutschland de Europe Western Europe
+lbc 2021-02-03 84509711 way Flughafen Lübeck-Blankensee, Blankenseer Straße, Blankensee, Sankt Jürgen, Lübeck, Schleswig-Holstein, 23562, Deutschland aeroway aerodrome 0.412065652038613 Deutschland de Europe Western Europe
+university of göttingen 2021-02-03 101743013 way Mathematische Fakultät, 3-5, Bunsenstraße, Südstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland building university 0.101 Deutschland de Europe Western Europe
+max-planck institute for mathematics 2021-02-03 4330352 node Max-Planck-Institut für Mathematik, 7, Vivatsgasse, Viktoriaviertel, Bonn-Zentrum, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53111, Deutschland amenity university 0.582526166251558 Deutschland de Europe Western Europe
+hannover medical school 2021-02-03 65488332 node Nikolai-Fuchs-Str. 34, 30625 Hannover, Nikolai-Fuchs-Straße, Medical Park, Groß-Buchholz, Buchholz-Kleefeld, Hannover, Region Hannover, Niedersachsen, 30625, Deutschland amenity post_box 0.201 Deutschland de Europe Western Europe
+cfi 2021-02-03 40272800 node Christliche Fachkräfte International e.V., 3B, Wächterstraße, Dobel, Stuttgart-Mitte, Stuttgart, Baden-Württemberg, Deutschland office ngo 0.181472839091896 Deutschland de Europe Western Europe
+international mathematical union 2021-02-03 66091109 node International Mathematical Union, 11A, Hausvogteiplatz, Mitte, Berlin, 10117, Deutschland office association 0.667391061753173 Deutschland de Europe Western Europe
+westfälische wilhelms university 2021-02-03 258955070 relation Westfälische Wilhelms-Universität, 2, Schlossplatz, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland amenity university 0.75844573834098 Deutschland de Europe Western Europe
+university of heidelberg 2021-02-03 6159717 node SRH Hochschule, 6, Ludwig-Guttmann-Straße, Wieblingen, Heidelberg, Baden-Württemberg, 69123, Deutschland amenity university 0.414317004425986 Deutschland de Europe Western Europe
+university of passau 2021-02-03 125831895 way Universität Passau, Rektor-Karl-Heinz-Pollok-Straße, Hacklberg, Passau, Bayern, 94032, Deutschland amenity university 0.53059885426854 Deutschland de Europe Western Europe
+german aerospace center 2021-02-03 258165325 relation Deutsches Zentrum für Luft- und Raumfahrt, Grengel, Porz, Köln, Nordrhein-Westfalen, 51147, Deutschland landuse industrial 0.419657429852984 Deutschland de Europe Western Europe
+university of munich 2021-02-03 100982165 way TU München Institut für Pharmakologie, Dietlindenstraße, Bezirksteil Münchener Freiheit, Schwabing-Freimann, München, Bayern, 80802, Deutschland amenity university 0.001 Deutschland de Europe Western Europe
+karlsruhe institute of technology 2021-02-03 258575634 relation Karlsruher Institut für Technologie, Ehingen (Donau), Gemeindeverwaltungsverband Ehingen (Donau), Alb-Donau-Kreis, Baden-Württemberg, 89584, Deutschland amenity university 0.611397516611859 Deutschland de Europe Western Europe
+university of konstanz 2021-02-03 96173591 way Universität Konstanz, 10, Universitätsstraße, Konstanz-Egg, Konstanz, Verwaltungsgemeinschaft Konstanz, Landkreis Konstanz, Baden-Württemberg, 78464, Deutschland amenity university 0.577529588367216 Deutschland de Europe Western Europe
+geomar helmholtz center for ocean research kiel 2021-02-03 92382691 way GEOMAR Helmholtz Zentrum für Ozeanforschung Kiel, 20, Düsternbrooker Weg, Düsternbrook, Kiel, Schleswig-Holstein, 24105, Deutschland amenity university 0.401 Deutschland de Europe Western Europe
+warf 2021-02-03 81212375 node Warf, Neuharlingersiel, Samtgemeinde Esens, Landkreis Wittmund, Niedersachsen, 26427, Deutschland place farm 0.3 Deutschland de Europe Western Europe
+researchgate 2021-02-03 72908266 node Research Gate, 20, Chausseestraße, Mitte, Berlin, 10115, Deutschland office company 0.001 Deutschland de Europe Western Europe
+kiel university 2021-02-03 95613087 way Fachhochschule Kiel, Grenzstraße, Neumühlen-Dietrichsdorf, Kiel, Schleswig-Holstein, 24149, Deutschland amenity university 0.414691670621569 Deutschland de Europe Western Europe
+alcon 2021-02-03 172470569 way Alcon, Hochdorf, Freiburg im Breisgau, Baden-Württemberg, 79108, Deutschland landuse industrial 0.3 Deutschland de Europe Western Europe
+unfccc 2021-02-03 259281371 relation Klimarahmenkonvention der Vereinten Nationen, Platz der Vereinten Nationen, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland office international_organization 0.312019878936673 Deutschland de Europe Western Europe
+telegraph 2021-02-03 1217959 node Telegraph, Döschnitz, Schwarzatal, Landkreis Saalfeld-Rudolstadt, Thüringen, 07429, Deutschland natural peak 0.4 Deutschland de Europe Western Europe
+ion research 2021-02-03 258877064 relation FAIR, Wixhausen, Darmstadt, Hessen, 64291, Deutschland landuse construction 0.256321943137092 Deutschland de Europe Western Europe
+hertie school of governance 2021-02-03 7730086 node Hertie School of Governance, 180, Friedrichstraße, Mitte, Berlin, 10117, Deutschland amenity college 0.76173885138595 Deutschland de Europe Western Europe
+national centre for biotechnology 2021-02-03 96724133 way Centrum für Biotechnologie (CeBiTec), 27, Universitätsstraße, Schildesche, Bielefeld, Nordrhein-Westfalen, 33615, Deutschland amenity university 0.001 Deutschland de Europe Western Europe
+saarland university 2021-02-03 96695261 way Universität des Saarlandes, Echohüttenweg, Universität, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66123, Deutschland amenity university 0.587909367964507 Deutschland de Europe Western Europe
+molecular sciences institute 2021-02-03 258455101 relation Buchmann Institute for Molecular Life Sciences (BMLS), 15, Max-von-Laue-Straße, Niederursel, Nord-West, Frankfurt am Main, Hessen, 60438, Deutschland building university 0.301 Deutschland de Europe Western Europe
+bernstein center for computational neuroscience 2021-02-03 36991996 node Bernstein Center for Computational Neuroscience, 6, Von-Siebold-Straße, Humboldtallee, Nordstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37075, Deutschland place house 0.501 Deutschland de Europe Western Europe
+msm 2021-02-03 114779520 way Marineschule Mürwik, Sonwik, Flensburg, Schleswig-Holstein, 24944, Deutschland landuse military 0.403405604298285 Deutschland de Europe Western Europe
+evolution institute 2021-02-03 118088771 way Institut für Evolution und Biodiversität, 1, Hüfferstraße, Schloss, Innenstadtring, Münster-Mitte, Münster, Nordrhein-Westfalen, 48149, Deutschland building university 0.101 Deutschland de Europe Western Europe
+ludwig-maximilians university 2021-02-03 63038249 node Ludwig-Maximilians-Universität, 1, Geschwister-Scholl-Platz, Bezirksteil Universität, Maxvorstadt, München, Bayern, 80539, Deutschland amenity university 0.201 Deutschland de Europe Western Europe
+federal research institute for animal health 2021-02-03 199023224 way Friedrich-Loeffler-Institut Riems, Südufer, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17493, Deutschland office research 0.001 Deutschland de Europe Western Europe
+global climate change 2021-02-03 34620690 node Mercator Research Institute on Global Commons and Climate Change, Torgauer Straße, Rote Insel, Schöneberg, Tempelhof-Schöneberg, Berlin, 10829, Deutschland amenity research_institute 0.301 Deutschland de Europe Western Europe
+ernst 2021-02-03 258503577 relation Ernst, Cochem, Landkreis Cochem-Zell, Rheinland-Pfalz, Deutschland boundary administrative 0.402323854176492 Deutschland de Europe Western Europe
+saarland university medical center 2021-02-03 96695261 way Universität des Saarlandes, Echohüttenweg, Universität, Sankt Johann, Bezirk Mitte, Saarbrücken, Regionalverband Saarbrücken, Saarland, 66123, Deutschland amenity university 0.587909367964507 Deutschland de Europe Western Europe
+united nations university 2021-02-03 211684840 way Universität der Vereinten Nationen, Hermann-Ehlers-Straße, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland amenity university 0.465720786441952 Deutschland de Europe Western Europe
+max planck institute of biochemistry 2021-02-03 22667364 node Max-Planck-Institut für Biochemie, 18, Am Klopferspitz, Martinsried, Planegg, Landkreis München, Bayern, 82152, Deutschland amenity university 0.565781769297865 Deutschland de Europe Western Europe
+dpg 2021-02-03 61019793 node Deutsche Parlamentarische Gesellschaft, 2, Friedrich-Ebert-Platz, Mitte, Berlin, 10117, Deutschland office association 0.271596680569804 Deutschland de Europe Western Europe
+geomar helmholtz centre for ocean research kiel 2021-02-03 92382691 way GEOMAR Helmholtz Zentrum für Ozeanforschung Kiel, 20, Düsternbrooker Weg, Düsternbrook, Kiel, Schleswig-Holstein, 24105, Deutschland amenity university 0.401 Deutschland de Europe Western Europe
+max planck institute for molecular biomedicine 2021-02-03 154889269 way Max-Planck-Institut für molekulare Biomedizin (Eastwing), 54, Von-Esmarch-Straße, Sentruper Höhe, Münster-West, Münster, Nordrhein-Westfalen, 48149, Deutschland building hospital 0.201 Deutschland de Europe Western Europe
+iss 2021-02-03 127962809 way ISS, Priorei, Eilpe/Dahl, Hagen, Nordrhein-Westfalen, 58091, Deutschland landuse industrial 0.3 Deutschland de Europe Western Europe
+max planck unit 2021-02-03 1288676 node Max Planck, Platanenallee, Stadtfriedhof, Weststadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37081, Deutschland historic memorial 0.62815879877835 Deutschland de Europe Western Europe
+german electron synchrotron 2021-02-03 96698255 way Deutsches Elektronen-Synchrotron DESY, 6, Platanenallee, Hankelsablage, Zeuthen, Dahme-Spreewald, Brandenburg, 15738, Deutschland amenity research_institute 0.101 Deutschland de Europe Western Europe
+rwe 2021-02-03 94139651 way 92, RWE, Benzelrath, Frechen, Rhein-Erft-Kreis, Nordrhein-Westfalen, 50226, Deutschland landuse industrial 0.3 Deutschland de Europe Western Europe
+max planck institute for the physics of complex systems 2021-02-03 93934599 way Max-Planck-Institut für Physik komplexer Systeme, 38, Nöthnitzer Straße, Plauen, Dresden, Sachsen, 01187, Deutschland amenity research_institute 0.201 Deutschland de Europe Western Europe
+kiost 2021-02-03 17130552 node Kiost, 59, Ostendstraße, Stuttgart-Ost, Ostheim, Stuttgart-Ost, Stuttgart, Baden-Württemberg, 70188, Deutschland shop kiosk 0.101 Deutschland de Europe Western Europe
+heinrich böll foundation 2021-02-03 97689731 way Heinrich-Böll-Stiftung, 8, Schumannstraße, Mitte, Berlin, 10117, Deutschland building civic 0.201 Deutschland de Europe Western Europe
+eshg 2021-02-03 114126662 way Evangelisches Studienhaus Göttingen, 30, Obere Karspüle, Theaterstraße, Innenstadt, Göttingen, Landkreis Göttingen, Niedersachsen, 37073, Deutschland building residential 0.001 Deutschland de Europe Western Europe
+max planck institute for demographic research 2021-02-03 82958469 node Max Planck-Institut für demografische Forschung, 1, Konrad-Zuse-Straße, Hafen City Rostock, Kröpeliner-Tor-Vorstadt, Ortsbeirat 11 : Kröpeliner-Tor-Vorstadt, Rostock, Mecklenburg-Vorpommern, 18057, Deutschland office research 0.630717976780999 Deutschland de Europe Western Europe
+max planck institute for molecular genetics 2021-02-03 96978816 way Max-Planck-Institut für Molekulare Genetik, 63-73, Ihnestraße, Dahlem, Steglitz-Zehlendorf, Berlin, 14195, Deutschland amenity research_institute 0.451308416199056 Deutschland de Europe Western Europe
+helmholtz centre for infection research 2021-02-03 161865420 way Helmholtz-Zentrum für Infektionsforschung Bibliothek, 7, Inhoffenstraße, Stöckheim, Stöckheim- Leiferde, Braunschweig, Niedersachsen, 38124, Deutschland amenity library 0.201 Deutschland de Europe Western Europe
+max planck institute for quantum optics 2021-02-03 150324329 way Max-Planck-Institut für Quantenoptik, 1, Hans-Kopfermann-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland amenity research_institute 0.633532730730458 Deutschland de Europe Western Europe
+nsfc 2021-02-03 42904305 node NSFC, 1, Kaiserstraße, Gewerbegebiet Haderwald, Kaiserslautern, Rheinland-Pfalz, 67661, Deutschland amenity fast_food 0.101 Deutschland de Europe Western Europe
+european molecular biology laboratory 2021-02-03 97458858 way Europäisches Laboratorium für Molekularbiologie, 1, Meyerhofstraße, Rohrbach, Heidelberg, Baden-Württemberg, 69117, Deutschland amenity research_institute 0.353558714867367 Deutschland de Europe Western Europe
+human brain project 2021-02-03 152018298 way The Human Brain Project, 227b, Im Neuenheimer Feld, Neuenheimer Feld, Neuenheim, Heidelberg, Baden-Württemberg, 69120, Deutschland building yes 0.301 Deutschland de Europe Western Europe
+laboratory of molecular biology 2021-02-03 97458858 way Europäisches Laboratorium für Molekularbiologie, 1, Meyerhofstraße, Rohrbach, Heidelberg, Baden-Württemberg, 69117, Deutschland amenity research_institute 0.453558714867367 Deutschland de Europe Western Europe
+university of rostock 2021-02-03 2247559 node Agrar- und Umweltwissenschaftliche Fakultät, Justus-von-Liebig-Weg, Südstadt, Ortsbeirat 12 : Südstadt, Rostock, Mecklenburg-Vorpommern, 18059, Deutschland amenity university 0.101 Deutschland de Europe Western Europe
+german institute for economic research 2021-02-03 2653124 node Deutsches Institut für Wirtschaftsforschung, 58, Mohrenstraße, Mitte, Berlin, 10117, Deutschland office research 0.473725631690798 Deutschland de Europe Western Europe
+drever 2021-02-03 192099725 way Drever Siepen, Peddensiepen, Lüdenscheid, Märkischer Kreis, Nordrhein-Westfalen, 58513, Deutschland waterway stream 0.3 Deutschland de Europe Western Europe
+oie 2021-02-03 84439830 way Oie, Zingst, Vorpommern-Rügen, Mecklenburg-Vorpommern, Deutschland place islet 0.410838391011185 Deutschland de Europe Western Europe
+dresden university of technology 2021-02-03 258652719 relation Technische Universität Dresden, Kleinpestitz/Mockritz, Plauen, Dresden, Sachsen, Deutschland amenity university 0.622496087225507 Deutschland de Europe Western Europe
+friedrich loeffler institute 2021-02-03 652533 node Institut für Nutztiergenetik, Friedrich Loeffler Institut, 10, Höltystraße, Mariensee, Neustadt am Rübenberge, Region Hannover, Niedersachsen, 31535, Deutschland tourism attraction 0.201 Deutschland de Europe Western Europe
+thales alenia 2021-02-03 121548045 way Thales Alenia Space, Ditzingen, Landkreis Ludwigsburg, Baden-Württemberg, 71254, Deutschland landuse commercial 0.647092386151836 Deutschland de Europe Western Europe
+university of trier 2021-02-03 204737708 way Hochschule Trier, Schneidershof, Pallien, West-Pallien, Trier, Rheinland-Pfalz, 54293, Deutschland amenity university 0.517252435362624 Deutschland de Europe Western Europe
+german research foundation 2021-02-03 58931236 node Deutsche Stiftung Friedensforschung, 3-5, Am Ledenhof, Altstadt, Innenstadt, Osnabrück, Niedersachsen, 49074, Deutschland office foundation 0.230361546636441 Deutschland de Europe Western Europe
+airbus defence 2021-02-03 109486291 way Werkfeuerwehr Airbus, Claude-Dornier-Straße, Airbus Defence & Space, Immenstaad am Bodensee, Verwaltungsgemeinschaft Friedrichshafen, Bodenseekreis, Baden-Württemberg, 88090, Deutschland amenity fire_station 0.201 Deutschland de Europe Western Europe
+hong kong university 2021-02-03 1222442 node Hong-Kong, Feldstraße, Südliche Mühlenvorstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland amenity fast_food 0.201 Deutschland de Europe Western Europe
+european central bank 2021-02-03 44670175 node Europäische Zentralbank, 20, Sonnemannstraße, Ostend, Bornheim/Ostend, Frankfurt am Main, Hessen, 60314, Deutschland office government 0.667340246660332 Deutschland de Europe Western Europe
+ute university 2021-02-03 52416287 node Physiotherapie Ute Westebbe, 28, Marienstraße, Nördliche Mühlenvorstadt, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17489, Deutschland amenity doctors 0.101 Deutschland de Europe Western Europe
+leda 2021-02-03 257850836 relation Leda, Landkreis Leer, Niedersachsen, 26789, Deutschland waterway river 0.401403950541444 Deutschland de Europe Western Europe
+icecube 2021-02-03 111332551 way IceCube, Wasserstraße, Wiemelhausen, Bochum, Nordrhein-Westfalen, 44789, Deutschland man_made water_works 0.101 Deutschland de Europe Western Europe
+venus express 2021-02-03 16140825 node Syrisches Pizza, 53, Bahnhofstraße, Breddeviertel, Witten-Mitte, Witten, Ennepe-Ruhr-Kreis, Nordrhein-Westfalen, 58452, Deutschland amenity fast_food 0.001 Deutschland de Europe Western Europe
+angewandte chemie 2021-02-03 131574943 way Angewandte Chemie und Elektrotechnik (Gebäude 14), Schillerstraße, Thamm, Senftenberg, Oberspreewald-Lausitz, Brandenburg, 01968, Deutschland building school 0.201 Deutschland de Europe Western Europe
+max delbrück center for molecular medicine 2021-02-03 204659384 way Max-Delbrück-Centrum für Molekulare Medizin, 28, Hannoversche Straße, Mitte, Berlin, 10115, Deutschland office research 0.201 Deutschland de Europe Western Europe
+mpq 2021-02-03 150324329 way Max-Planck-Institut für Quantenoptik, 1, Hans-Kopfermann-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland amenity research_institute 0.333532730730458 Deutschland de Europe Western Europe
+max planck institute for gravitational physics 2021-02-03 96116691 way Max-Planck-Institut für Gravitationsphysik, 1, Am Mühlenberg, Golm, Potsdam Nord, Potsdam, Brandenburg, 14476, Deutschland office research 0.46851441835616 Deutschland de Europe Western Europe
+european network 2021-02-03 112610344 way European Network Services, Gewerbestraße, Bergfelde, Hohen Neuendorf, Oberhavel, Brandenburg, 16540, Deutschland building yes 0.201 Deutschland de Europe Western Europe
+university library 2021-02-03 96667358 way Universitätsbibliothek der Freien Universität Berlin, 39, Garystraße, Dahlem, Steglitz-Zehlendorf, Berlin, 14195, Deutschland amenity library 0.280014158487789 Deutschland de Europe Western Europe
+max planck institute for nuclear physics 2021-02-03 100288338 way Max-Planck-Institut für Kernphysik, 1, Saupfercheckweg, Speyererhof, Altstadt, Heidelberg, Baden-Württemberg, 69117, Deutschland amenity research_institute 0.566268984478359 Deutschland de Europe Western Europe
+palermo university 2021-02-03 16882978 node Restaurant Palermo, 11 - 13, Ernst-Thälmann-Ring, Schönwalde II, Greifswald, Vorpommern-Greifswald, Mecklenburg-Vorpommern, 17491, Deutschland amenity restaurant 0.101 Deutschland de Europe Western Europe
+ihme 2021-02-03 257378365 relation Ihme, Hannover, Region Hannover, Niedersachsen, 30449, Deutschland waterway river 0.405003945962319 Deutschland de Europe Western Europe
+physics preparatory group 2021-02-03 102405708 way Fachbereich 11, Physikalisches Institut, 10;10a, Wilhelm-Klemm-Straße, Sentruper Höhe, Münster-West, Münster, Nordrhein-Westfalen, 48149, Deutschland building university 0.001 Deutschland de Europe Western Europe
+ifr 2021-02-03 73912341 node Institut für Flugmechanik und Flugregelung, 27, Pfaffenwaldring, Pfaffenwald, Vaihingen, Stuttgart, Baden-Württemberg, 70569, Deutschland office yes 0.001 Deutschland de Europe Western Europe
+gran sasso 2021-02-03 4210065 node Gran Sasso, Ebenauer Straße, Bezirksteil Dom Pedro, Neuhausen-Nymphenburg, München, Bayern, 80637, Deutschland amenity restaurant 0.201 Deutschland de Europe Western Europe
+german primate centre 2021-02-03 101999477 way Deutsches Primatenzentrum GmbH, 7, Hans-Adolf-Krebs-Weg, Weende, Weende / Deppoldshausen, Göttingen, Landkreis Göttingen, Niedersachsen, 37077, Deutschland building yes 0.101 Deutschland de Europe Western Europe
+forest stewardship council 2021-02-03 78115705 node Forest Stewardship Council (FSC), 134, Adenauerallee, Gronau, Stadtbezirk Bonn, Bonn, Nordrhein-Westfalen, 53113, Deutschland office association 0.301 Deutschland de Europe Western Europe
+göttingen state 2021-02-03 258366673 relation Göttingen, Landkreis Göttingen, Niedersachsen, Deutschland boundary administrative 0.719432791454798 Deutschland de Europe Western Europe
+flexible solutions 2021-02-03 39749983 node Randstad, Kuhstraße, Altstadt, Lüneburg, Niedersachsen, 21335, Deutschland office employment_agency 0.001 Deutschland de Europe Western Europe
+european southern observatory 2021-02-03 229063373 way Europäische Südsternwarte, 2, Karl-Schwarzschild-Straße, Hochschul- und Forschungszentrum, Garching bei München, Landkreis München, Bayern, 85748, Deutschland amenity research_institute 0.001 Deutschland de Europe Western Europe
+nwo 2021-02-03 248010374 way NWO, Emsbüren, Landkreis Emsland, Niedersachsen, 48488, Deutschland man_made pipeline 0.303130333992136 Deutschland de Europe Western Europe
+bmas 2021-02-03 258375961 relation Bundesministerium für Arbeit und Soziales, Mauerstraße, Mitte, Berlin, 10117, Deutschland building public 0.001 Deutschland de Europe Western Europe
+unep 2021-02-03 60420076 node UNEP, Marmorvej, Marmormolen, Østerbro, København, Københavns Kommune, Region Hovedstaden, 2150, Danmark office international_organization 0.101 Danmark dk Europe Northern Europe
+bioscience 2021-02-03 147018786 way Bioscience, Ny Munkegade, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8000, Danmark building college 0.101 Danmark dk Europe Northern Europe
+mit media lab 2021-02-03 73788074 node Dit og Mit Randers, Ribevej, Randers SV, Randers, Randers Kommune, 8940, Danmark amenity fast_food 0.101 Danmark dk Europe Northern Europe
+odense 2021-02-03 135778 node Odense, Odense Kommune, Region Syddanmark, 5000, Danmark place city 0.677626182871731 Danmark dk Europe Northern Europe
+turing 2021-02-03 108351430 way Turing, Helsingforsgade, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8200, Danmark building college 0.101 Danmark dk Europe Northern Europe
+orion nebula 2021-02-03 118205711 way Orion, Holstebro, Holstebro Kommune, 7500, Danmark highway residential 0.2 Danmark dk Europe Northern Europe
+roskilde university 2021-02-03 99948291 way Roskilde Universitet, Trekroner Parkvej, Trekroner, Roskilde, Roskilde Kommune, Region Sjælland, Danmark amenity university 0.504892902573089 Danmark dk Europe Northern Europe
+aau 2021-02-03 103460471 way Aalborg Universitet, Fredrik Bajers Vej, Sønder Tranders, Aalborg, Aalborg Kommune, Region Nordjylland, 9220, Danmark amenity university 0.439098689594578 Danmark dk Europe Northern Europe
+niels bohr institute 2021-02-03 143629556 way University of Copenhagen, Niels Bohr Institute, Blegdamsvej, Østerbro, København, Københavns Kommune, Region Hovedstaden, 1357, Danmark office educational_institution 0.707266933591874 Danmark dk Europe Northern Europe
+aalborg university 2021-02-03 103460471 way Aalborg Universitet, Fredrik Bajers Vej, Sønder Tranders, Aalborg, Aalborg Kommune, Region Nordjylland, 9220, Danmark amenity university 0.539098689594578 Danmark dk Europe Northern Europe
+university of southern denmark 2021-02-03 95058307 way Syddansk Universitet, Fioniavej, Cortex Park, Odense, Odense Kommune, Region Syddanmark, 5230, Danmark amenity university 0.349660525371521 Danmark dk Europe Northern Europe
+aarhus 2021-02-03 131516 node Aarhus, Aarhus Kommune, Region Midtjylland, 8000, Danmark place city 0.695326566736205 Danmark dk Europe Northern Europe
+aarhus university hospital 2021-02-03 258651824 relation Aarhus Universitet, Paludan-Müllers Vej, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8200, Danmark amenity university 0.616309477187943 Danmark dk Europe Northern Europe
+ted 2021-02-03 101596912 way Thisted Lufthavn, Hjardemålvej, Thisted Kommune, Region Nordjylland, Danmark aeroway aerodrome 0.412795139465266 Danmark dk Europe Northern Europe
+trademark office 2021-02-03 40802206 node Trædemark, Vesthimmerlands Kommune, Region Nordjylland, Danmark place hamlet 0.25 Danmark dk Europe Northern Europe
+aarhus university 2021-02-03 258651824 relation Aarhus Universitet, Paludan-Müllers Vej, Christiansbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8200, Danmark amenity university 0.616309477187943 Danmark dk Europe Northern Europe
+university of aarhus 2021-02-03 116534449 way Aarhus Universitet, N.J. Fjords Gade, Frederiksbjerg, Aarhus, Aarhus Kommune, Region Midtjylland, 8000, Danmark amenity university 0.101 Danmark dk Europe Northern Europe
+denmark 2021-02-03 257253228 relation Danmark boundary administrative 0.806805864691751 Danmark dk Europe Northern Europe
+danisco 2021-02-03 101179015 way Danisco, Hammershøis Kaj, Christianshavn, København, Københavns Kommune, Region Hovedstaden, 1402, Danmark office company 0.101 Danmark dk Europe Northern Europe
+guinness world records 2021-02-03 45101701 node Guinness World Records, Østergade, Frederiksstaden, København, Københavns Kommune, Region Hovedstaden, 1100, Danmark tourism museum 0.301 Danmark dk Europe Northern Europe
+university of copenhagen 2021-02-03 97069646 way Københavns Universitet, Nørregade, Vesterbro, København, Københavns Kommune, Region Hovedstaden, 1167, Danmark amenity university 0.587152318095233 Danmark dk Europe Northern Europe
+kongens lyngby 2021-02-03 112538 node Kongens Lyngby, Lyngby-Taarbæk Kommune, Region Hovedstaden, 2800, Danmark place suburb 0.647005149903199 Danmark dk Europe Northern Europe
+wais 2021-02-03 113043336 way Wais, Stubbæk, Aabenraa Kommune, Region Syddanmark, 6200, Danmark highway residential 0.2 Danmark dk Europe Northern Europe
+european environment agency 2021-02-03 10371743 node EEA, 6, Kongens Nytorv, Frederiksstaden, København, Københavns Kommune, Region Hovedstaden, 1050, Danmark office government 0.48741287579359 Danmark dk Europe Northern Europe
+technical university of denmark 2021-02-03 94920613 way Danmarks Tekniske Universitet, Asmussens Allé, Lundtofte, Lyngby-Taarbæk Kommune, Region Hovedstaden, 2800, Danmark amenity university 0.570433047832959 Danmark dk Europe Northern Europe
+ross university school of medicine 2021-02-03 258789693 relation Ross University School of Medicine, Michael Douglas Boulevard, Picard, Saint John Parish, Dominica building university 0.501 Dominica dm Americas Caribbean
+barrick gold 2021-02-03 176507195 way Barrick Gold, CotuÃ, Sánchez RamÃrez, República Dominicana landuse industrial 0.4 República Dominicana do Americas Caribbean
+doe 2021-02-03 257680231 relation República Dominicana boundary administrative 0.708236599440443 República Dominicana do Americas Caribbean
+dominican republic 2021-02-03 257680231 relation República Dominicana boundary administrative 0.808236599440443 República Dominicana do Americas Caribbean
+aditec 2021-02-03 184873253 way Aditec, Calle Ludovino Fernandez, Urbanización Fernández, Los Jardines, Santo Domingo de Guzmán, 10130, República Dominicana office company 0.101 República Dominicana do Americas Caribbean
+democratic 2021-02-03 258028956 relation Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر boundary administrative 0.758319025069823 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر dz Africa Northern Africa
+esr 2021-02-03 180843078 way escadron de sécurité routière, Øـي الامــل, Biskra ⵜⵉⴱⴻⵙⴽⴻⵔⵜ بسكرة, Daïra Biskra, Biskra ⴱⴻⵙⴽⵔⴰ بسكرة, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر landuse military 0.2 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر dz Africa Northern Africa
+al-quds 2021-02-03 57263858 node ØÙŠ القدس, Metlili ⵎⴻⵜâµ<8d>ⵉâµ<8d>ⵉ متليلي, Daïra Metlili Châamba, Ghardaïa ⵜⴰⵖⴻⵔⴷⴰⵢⵜ غرداية, 47200, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر place suburb 0.375 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر dz Africa Northern Africa
+ministry of commerce 2021-02-03 107081067 way Ministère du Commerce, Rue Salem Abdelhamid, Cité Zerhouni Mokhtar (Les Bananiers), Lotissement les Mandariniers, Pins Maritimes الصنوبر البØري, Mohammadia ⵎⵓⵃⴻⵎⵎⴰⴷⵢⴰ المØمدية, Dar El Beïda, Alger, 16312, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر office government 0.101 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر dz Africa Northern Africa
+ivpp 2021-02-03 161838236 way IVPP, Route de Bouchaoui, Ouled Fayet ⵓâµ<8d>ⴻⴷ ⴼⴰⵢⴻⵜ أولاد Ù<81>ايت, Cheraga, Alger, 16094, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر man_made works 0.101 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر dz Africa Northern Africa
+hippo 2021-02-03 258539007 relation Annaba ⵄⴻâµ<8d>âµ<8d>ⴰⴲⴰ عنابة, Daïra Annaba, Annaba ⵄⴻâµ<8f>âµ<8f>ⴰⴱⴰ عنابة, 23000, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر boundary administrative 0.516124885138461 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر dz Africa Northern Africa
+algeria 2021-02-03 258028956 relation Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر boundary administrative 0.758319025069823 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر dz Africa Northern Africa
+cihr 2021-02-03 258722348 relation Chir ⵛⵉⵔ شير, Daïra Teniet El Abed, Batna ⵜⴱⴰⵜⴻâµ<8f>ⵜ باتنة, 05108, Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر boundary administrative 0.394871386033001 Algérie / âµ<8d>ⵣⵣⴰⵢⴻⵔ / الجزائر dz Africa Northern Africa
+pinta 2021-02-03 258646339 relation Isla Pinta, Parroquia Santa Rosa, Cantón Santa Cruz, Galápagos, Ecuador place island 0.483021208265432 Ecuador ec Americas South America
+ec 2021-02-03 258316020 relation Ecuador boundary administrative 0.839288603689881 Ecuador ec Americas South America
+ecuador 2021-02-03 258316020 relation Ecuador boundary administrative 0.839288603689881 Ecuador ec Americas South America
+ecj 2021-02-03 188019987 way ECJ, Avenida El Inca, El Carmen, Kennedy, Quito, Pichincha, EC170138, Ecuador shop car_repair 0.101 Ecuador ec Americas South America
+atla 2021-02-03 258103109 relation Atla küla, Saaremaa vald, Saare maakond, 93322, Eesti boundary administrative 0.530084056292374 Eesti ee Europe Northern Europe
+university of tartu 2021-02-03 255255542 way Tartu Ãœlikool, 18, Ãœlikooli, Kesklinn, Tartu linn, Tartu maakond, 50090, Eesti amenity university 0.63960797450445 Eesti ee Europe Northern Europe
+estonia 2021-02-03 257915995 relation Eesti boundary administrative 0.751423093770254 Eesti ee Europe Northern Europe
+aru co 2021-02-03 258517952 relation Aru küla, Saaremaa vald, Saare maakond, 94245, Eesti boundary administrative 0.523032671836241 Eesti ee Europe Northern Europe
+irta 2021-02-03 258424418 relation Irta küla, Lääneranna vald, Pärnu maakond, 88407, Eesti boundary administrative 0.422734482343971 Eesti ee Europe Northern Europe
+ain shams university 2021-02-03 97753625 way جامعة عين شمس, شارع لطÙ<81>ÙŠ السيد, الدمرداش, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11657, مصر amenity university 0.001 مصر eg Africa Northern Africa
+us national cancer institute 2021-02-03 15618390 node National Cancer Institute, شارع القصر العيني, Ù<81>م الخليج ودير النØاس, المنيل, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11241, مصر amenity hospital 0.301 مصر eg Africa Northern Africa
+aswan high dam 2021-02-03 85332921 way السد العالى, أسوان, مصر waterway dam 0.489725473759381 مصر eg Africa Northern Africa
+nile university 2021-02-03 103600394 way Nile University, طريق القاهرة, الاسكندرية الصØراوي الجانبي, مدينة السادات وعدنان مدني, مدينة السادات, Ù…ØاÙ<81>ظة المنوÙ<81>ية, 12577, مصر amenity university 0.201 مصر eg Africa Northern Africa
+egypt 2021-02-03 258188085 relation مصر boundary administrative 0.785163958233235 مصر eg Africa Northern Africa
+g77 2021-02-03 71106617 node G77, كمبوند ليان صبور, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11865, مصر place house 0.101 مصر eg Africa Northern Africa
+state council 2021-02-03 197019864 way مجلس الدولة, شارع شارل ديجول, شارع الدقى, الجيزة, 11551, مصر amenity courthouse 0.001 مصر eg Africa Northern Africa
+arab league 2021-02-03 96831895 way جامعة الدول العربية, شارع التØرير, الاسماعيليه, باب اللوق, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11111, مصر building public 0.001 مصر eg Africa Northern Africa
+mdrb 2021-02-03 245704793 way مساكن مضرب الأرز, دمنهور, البØيرة, مصر place neighbourhood 0.25 مصر eg Africa Northern Africa
+quess 2021-02-03 6642686 node سهل القس أبو سعيد, الوادي الجديد, مصر place locality 0.125 مصر eg Africa Northern Africa
+rosetta 2021-02-03 6645175 node رشيد, البØيرة, 22745, مصر place town 0.433708896343545 مصر eg Africa Northern Africa
+imc 2021-02-03 34517193 node IMC مركز تØديث الصناعة Industrial Modernization Center, شارع 276, المعادي الجديدة, القاهرة, Ù…ØاÙ<81>ظة القاهرة, NONE, مصر office government 0.101 مصر eg Africa Northern Africa
+nile delta 2021-02-03 258313988 relation النيل, ÙƒÙ<81>ر البدارنة, القليوبية, مصر natural water 0.2 مصر eg Africa Northern Africa
+zewail city 2021-02-03 127163265 way ميدان اØمد زويل, ØÙŠ شمال, دسوق, مصر highway primary 0.1 مصر eg Africa Northern Africa
+national cancer institute 2021-02-03 15618390 node National Cancer Institute, شارع القصر العيني, Ù<81>م الخليج ودير النØاس, المنيل, القاهرة, Ù…ØاÙ<81>ظة القاهرة, 11241, مصر amenity hospital 0.301 مصر eg Africa Northern Africa
+innovation center 2021-02-03 300924038 node Innovation Center, 5B, القرية الذكية, 12677, مصر place house 0.201 مصر eg Africa Northern Africa
+eritrea 2021-02-03 258214833 relation ኤáˆá‰µáˆ« Eritrea إرتريا boundary administrative 0.761582471804884 ኤáˆá‰µáˆ« Eritrea إرتريا er Africa Eastern Africa
+asm 2021-02-03 187428690 way ኣህጉራዊ መዓáˆá<8d>Ž áŠ<90>á<8d>ˆáˆá‰² ኣስመራ مطار أسمرة الدولي, ጎደና ሕዳá‹, ኣስመራ Asmara أسمرة, ዞባ ማእከáˆ<8d> Maekel zone المنطقة المركزية, 00291, ኤáˆá‰µáˆ« Eritrea إرتريا aeroway aerodrome 0.470033965507204 ኤáˆá‰µáˆ« Eritrea إرتريا er Africa Eastern Africa
+polytechnic university of madrid 2021-02-03 90835017 way E.T.S. Arquitectura de Madrid, Avenida Juan de Herrera, Moncloa-Aravaca, Madrid, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28001, España amenity university 0.46926833579344 España es Europe Southern Europe
+zas 2021-02-03 15543479 node Zas, Terra de Soneira, A Coruña, Galicia, 15850, España place village 0.566457373637731 España es Europe Southern Europe
+cabells 2021-02-03 15572882 node Cabells, Carrer d'Adoberies, Castelló de la Plana, la Plana Alta, Castelló / Castellón, Comunitat Valenciana, 12003, España shop hairdresser 0.101 España es Europe Southern Europe
+cirva 2021-02-03 258417283 relation La Cierva, Cuenca, Castilla-La Mancha, España boundary administrative 0.504190064709064 España es Europe Southern Europe
+canfranc underground laboratory 2021-02-03 233408959 way Laboratorio Subterráneo de Canfranc, Camino de Secras, Canfranc-Estación, Canfranc, La Jacetania, Huesca, Aragón, 22880, España amenity research_institute 0.346981559290857 España es Europe Southern Europe
+esa 2021-02-03 258416750 relation Yesa, Navarra - Nafarroa, España boundary administrative 0.608906504927631 España es Europe Southern Europe
+gmv of tres cantos 2021-02-03 258419857 relation GMV, 11, Calle de Isaac Newton, Parque Tecnológico de Madrid, Tres Cantos, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28760, España building office 0.301 España es Europe Southern Europe
+cea 2021-02-03 257723188 relation Cea, León, Castilla y León, España boundary administrative 0.577556182714715 España es Europe Southern Europe
+university of lleida 2021-02-03 5028721 node Institut Nacional d'Educació FÃsica de Catalunya, Carrer de Duke Ellington, la Caparrella, Lleida, Segrià , Lleida, Catalunya, 25192, España amenity university 0.101 España es Europe Southern Europe
+observatorio del roque de los muchachos 2021-02-03 101274983 way Observatorio del Roque de los Muchachos, Carretera a Fuente Nueva, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España man_made observatory 1.0016086140509 España es Europe Southern Europe
+roque de los muchachos 2021-02-03 144787 node Roque de los Muchachos, GarafÃa, Santa Cruz de Tenerife, Canarias, España natural volcano 0.755515463321448 España es Europe Southern Europe
+el niños 2021-02-03 56090016 node Ninos, Carrer de Garcilaso, els Indians, el Congrés i els Indians, Sant Andreu, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España amenity kindergarten 0.101 España es Europe Southern Europe
+nasdaq 2021-02-03 39263438 node Nasdaq, 8, Calle el Trust, Barrio Quebrantada, Torrelavega, Campuzano, Torrelavega, Besaya, Cantabria, 39300, España amenity pub 0.101 España es Europe Southern Europe
+university of castilla-la mancha 2021-02-03 162719450 way Caseta del Estudiante, Plaza de la Libertad de Expresión, Barrio de San Antón, Cuenca, Castilla-La Mancha, 16002, España amenity university 0.301 España es Europe Southern Europe
+dit 2021-02-03 70175876 node el Dit, Cocentaina, el Comtat, Alacant / Alicante, Comunitat Valenciana, 03837, España natural peak 0.4 España es Europe Southern Europe
+universitat oberta de catalunya 2021-02-03 107594771 way Universitat Oberta de Catalunya, 156, Rambla del Poblenou, Provençals del Poblenou, Sant MartÃ, Barcelona, Barcelonès, Barcelona, Catalunya, 08018, España amenity university 0.829969070439296 España es Europe Southern Europe
+edar 2021-02-03 136344246 way EDAR, Lagareiros, Carnota, Muros, A Coruña, Galicia, 15293, España landuse industrial 0.3 España es Europe Southern Europe
+ucar 2021-02-03 258478044 relation Ucar, Navarra - Nafarroa, 31154, España boundary administrative 0.606410528784134 España es Europe Southern Europe
+virgili university 2021-02-03 119324675 way Universitat Rovira i Virgili - Campus Catalunya, 33,35, Avinguda de Catalunya, Tarragona, Tarragonès, Tarragona, Catalunya, 43002, España amenity university 0.500597470725799 España es Europe Southern Europe
+valero 2021-02-03 258259086 relation Valero, Salamanca, Castilla y León, España boundary administrative 0.608874521325786 España es Europe Southern Europe
+el pais 2021-02-03 13235441 node El PaÃs, Alfarp, la Ribera Alta, València / Valencia, Comunitat Valenciana, 46197, España place locality 0.225 España es Europe Southern Europe
+la palma 2021-02-03 258611106 relation Palma, Illes Balears, España boundary administrative 0.688150363287611 España es Europe Southern Europe
+napster 2021-02-03 54168575 node Napster, Plaza de la Libertad, La Charca, Allende, Miranda de Ebro, Burgos, Castilla y León, 09200, España amenity cafe 0.101 España es Europe Southern Europe
+pompeu fabra university in barcelona 2021-02-03 258659729 relation Campus UManresa, Avinguda de les Bases de Manresa, Manresa (Trama Urbana Consolidada), Mion - Puigberenguer - Miralpeix, Manresa, Bages, Barcelona, Catalunya, 08240, España amenity university 0.201 España es Europe Southern Europe
+barcelona supercomputing centre 2021-02-03 221612695 way Barcelona Supercomputing Center, Plaça d'Eusebi Güell, Pedralbes, les Corts, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España building university 0.502323854176492 España es Europe Southern Europe
+anu 2021-02-03 257798719 relation Anue, Navarra - Nafarroa, España boundary administrative 0.606726039533275 España es Europe Southern Europe
+iberia 2021-02-03 258848049 relation Iberia, España place peninsula 0.73620614637597 España es Europe Southern Europe
+las hoyas 2021-02-03 296339662 node Las Hoyas, Castro de Filabres, AlmerÃa, AndalucÃa, España natural peak 0.5 España es Europe Southern Europe
+intellectual property 2021-02-03 259401275 relation EUIPO, 4, Avenida de Europa, Alacant / Alicante, l'AlacantÃ, Alacant / Alicante, Comunitat Valenciana, 03008, España office government 0.383512305679517 España es Europe Southern Europe
+university of valladolid 2021-02-03 97754226 way Facultad de Medicina, Avenida de Ramón y Cajal, Hospital, Valladolid, Castilla y León, 47005, España amenity university 0.278140546517606 España es Europe Southern Europe
+gtc 2021-02-03 159943083 way Gran Telescopio Canarias, Carretera Acceso Observatorios, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España man_made telescope 0.413959851504786 España es Europe Southern Europe
+csic 2021-02-03 258925679 relation Museo Nacional de Ciencias Naturales, 2, Calle de José Gutiérrez Abascal, El Viso, ChamartÃn, Madrid, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28006, España tourism museum 0.348159836291227 España es Europe Southern Europe
+bp oil 2021-02-03 824247 node BP OIL, Avenida de Bruselas, Algeciras, Campo de Gibraltar, Cádiz, AndalucÃa, 11204, España amenity fuel 0.201 España es Europe Southern Europe
+el país 2021-02-03 13235441 node El PaÃs, Alfarp, la Ribera Alta, València / Valencia, Comunitat Valenciana, 46197, España place locality 0.325 España es Europe Southern Europe
+beis 2021-02-03 46711873 node Beis, Cis, Oza-Cesuras, Betanzos, A Coruña, Galicia, 15388, España place hamlet 0.35 España es Europe Southern Europe
+vespa 2021-02-03 30945621 node la Vespa, el Bruc, Anoia, Barcelona, Catalunya, 08294, España natural peak 0.4 España es Europe Southern Europe
+aacr 2021-02-03 49737503 node Aacr Museo, Calle Pedro del Toro, Museo, Casco Antiguo, Sevilla, AndalucÃa, 41001, España tourism hotel 0.101 España es Europe Southern Europe
+caesar 2021-02-03 258240062 relation El Casar, Guadalajara, Castilla-La Mancha, 19170, España boundary administrative 0.513983450221256 España es Europe Southern Europe
+university of zaragoza 2021-02-03 65211540 node The University of Beer, 8, Calle Arzobispo Apaolaza, Romareda, Universidad, Zaragoza, Aragón, 50005, España amenity cafe 0.301 España es Europe Southern Europe
+cerro pachón 2021-02-03 13167339 node Cerro Pachón, Montán, l'Alt Millars, Castelló / Castellón, Comunitat Valenciana, 12447, España place locality 0.325 España es Europe Southern Europe
+la niña 2021-02-03 131047530 way La Niña, Muelle de la reina, Palos de la Frontera, Comarca Metropolitana de Huelva, Huelva, AndalucÃa, 21819, España tourism attraction 0.545044178032674 España es Europe Southern Europe
+roque de los muchachos observatory 2021-02-03 101274983 way Observatorio del Roque de los Muchachos, Carretera a Fuente Nueva, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España man_made observatory 0.801608614050897 España es Europe Southern Europe
+university of alicante 2021-02-03 108586240 way Golf Practice Ground Miguel Hernández University of Elche, Acceso Aparcamiento, les Cases de Ferrà ndez, Elx / Elche, el Baix Vinalopó, Alacant / Alicante, Comunitat Valenciana, 03207, España leisure pitch 0.301 España es Europe Southern Europe
+court 2021-02-03 258422517 relation Catalunya, España boundary administrative 0.720173737746207 España es Europe Southern Europe
+cellex 2021-02-03 217797958 way Centre Cellex (Institut d'Oncologia), 115-117, Carrer de Natzaret, Montbau, Horta-Guinardó, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España office research 0.101 España es Europe Southern Europe
+un 2021-02-03 258337461 relation Universidad de Navarra, Carretera de la Universidad, Pamplona/Iruña, Navarra - Nafarroa, 31007, España amenity university 0.58086888056666 España es Europe Southern Europe
+fusion for energy 2021-02-03 81668426 node F4E, 2, Carrer de Josep Pla, Diagonal Mar i el Front MarÃtim del Poblenou, Sant MartÃ, Barcelona, Barcelonès, Barcelona, Catalunya, 08019, España office government 0.001 España es Europe Southern Europe
+institute for integrative biology 2021-02-03 184476776 way I2SysBio (Institute for Integrative Systems Biology), Carretera de LlÃria, Lloma Llarga, Paterna, l'Horta Oest, València / Valencia, Comunitat Valenciana, 46100, España building university 0.401 España es Europe Southern Europe
+barañao 2021-02-03 45025401 node Barañao, Zeberio, Bizkaia, Euskadi, 48148, España place hamlet 0.35 España es Europe Southern Europe
+iac 2021-02-03 136488779 way Instituto de Astrofisica de Canarias, TF-180, Curva de Gracia, Gracia, La Cuesta, San Cristóbal de La Laguna, Santa Cruz de Tenerife, Canarias, 38207, España amenity university 0.283827688081076 España es Europe Southern Europe
+maryland 2021-02-03 33897926 node Maryl, Rúa Enrique Mariñas Romero, San Vicenzo de Elviña, Matogrande, Elviña, A Coruña, Galicia, 15071, España shop hairdresser 0.201 España es Europe Southern Europe
+pmi 2021-02-03 259549987 relation Aeroport de Palma - Son Sant Joan, Camà de Can Pastilla, Can Pastilla, Palma, Illes Balears, 07610, España aeroway aerodrome 0.487548679886816 España es Europe Southern Europe
+spain 2021-02-03 258583824 relation España boundary administrative 0.865552504518026 España es Europe Southern Europe
+rockefellers 2021-02-03 74533251 node Rockefeller's, Carrer de Cala Major, Cala Major, Palma, Illes Balears, 07015, España amenity bar 0.001 España es Europe Southern Europe
+european space astronomy centre 2021-02-03 98365761 way European Space Astronomy Centre, Camino Bajo del Castillo, Villanueva de la Cañada, Cuenca del Guadarrama, Comunidad de Madrid, 28691, España office research 0.787306266325387 España es Europe Southern Europe
+vitae 2021-02-03 257978618 relation Vita, Ã<81>vila, Castilla y León, España boundary administrative 0.510062690742063 España es Europe Southern Europe
+sabre 2021-02-03 30412035 node el Sabre, el Bruc, Anoia, Barcelona, Catalunya, 08294, España natural peak 0.4 España es Europe Southern Europe
+gran telescopio canarias 2021-02-03 159943083 way Gran Telescopio Canarias, Carretera Acceso Observatorios, GarafÃa, Santa Cruz de Tenerife, Canarias, 38728, España man_made telescope 0.713959851504786 España es Europe Southern Europe
+institute of photonic sciences 2021-02-03 108665081 way Institute of Photonic Sciences, 3, Avinguda de Carl Friedrich Gauss, Mar-i-sol, Castelldefels, Baix Llobregat, Barcelona, Catalunya, 08860, España office research 0.401 España es Europe Southern Europe
+cajal 2021-02-03 12607846 node El Cajal, Villanueva de Sigena, Los Monegros, Huesca, Aragón, España place locality 0.225 España es Europe Southern Europe
+tres cantos 2021-02-03 257968513 relation Tres Cantos, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28760, España boundary administrative 0.689287430697433 España es Europe Southern Europe
+saint louis university — madrid campus 2021-02-03 211810109 way Saint Louis University - Madrid Campus, Calle Amapola, Vallehermoso, ChamberÃ, Madrid, Ã<81>rea metropolitana de Madrid y Corredor del Henares, Comunidad de Madrid, 28003, España amenity university 0.501 España es Europe Southern Europe
+university of santiago de compostela 2021-02-03 21708159 node Instituto da Lingua Galega, Praza da Universidade, As Fontiñas, Santiago de Compostela, Santiago, A Coruña, Galicia, ES-15705, España amenity university 0.301 España es Europe Southern Europe
+mar-a-lago 2021-02-03 99521484 way El Mar, Real Sitio de San Ildefonso, NavafrÃa, Castilla y León, España natural water 0.4 España es Europe Southern Europe
+casp 2021-02-03 258252256 relation Caspe, Bajo Aragón-Caspe / Baix Aragó-Casp, Zaragoza, Aragón, 50700, España boundary administrative 0.610219396647417 España es Europe Southern Europe
+university of barcelona 2021-02-03 87708249 way Universitat de Barcelona, Gran Via de les Corts Catalanes, l'Antiga Esquerra de l'Eixample, Eixample, Barcelona, Barcelonès, Barcelona, Catalunya, 08001, España amenity university 0.420054390558144 España es Europe Southern Europe
+zemen bank 2021-02-03 74362165 node Zemen Bank, 4, ደብረ ዘá‹á‰µ, Bishoftu, East Shewa, ኦሮሚያ áŠáˆ<8d>áˆ<8d> / Oromia, 1034, ኢትዮጵያ amenity bank 0.201 ኢትዮጵያ et Africa Eastern Africa
+blue nile 2021-02-03 241758218 way ዓባዠወንá‹<9d>, South Gonder, አማራ áŠáˆ<8d>áˆ<8d> / Amhara, ኢትዮጵያ waterway river 0.322734482343971 ኢትዮጵያ et Africa Eastern Africa
+awi 2021-02-03 258756604 relation Awi, አማራ áŠáˆ<8d>áˆ<8d> / Amhara, ኢትዮጵያ boundary administrative 0.6 ኢትዮጵያ et Africa Eastern Africa
+desert locust control organization for eastern africa 2021-02-03 201488286 way Desert Locust Control Organization for Eastern Africa, Mann St, Yeka, አዲስ አበባ / Addis Ababa, 12994, ኢትዮጵያ office ngo 0.701 ኢትዮጵያ et Africa Eastern Africa
+ministry of water resources 2021-02-03 137652527 way Ministry of Water Resources, Mike Leyland Street, ኡራኤáˆ<8d> Urael, Addis Ababa / አዲስ አበባ, Bole, አዲስ አበባ / Addis Ababa, 17293, ኢትዮጵያ office government 0.401 ኢትዮጵያ et Africa Eastern Africa
+nbcs 2021-02-03 63661472 node ሰሜን ደረቅ áŒáŠ<90>ት, GL_08_1609 St., አባዲና አካባቢ, Gulale, አዲስ አበባ / Addis Ababa, 9837, ኢትዮጵያ office company 0.001 ኢትዮጵያ et Africa Eastern Africa
+orcid 2021-02-03 54414796 node Orcid, Ring Road, ለቡ, Nefas Silk, አዲስ አበባ / Addis Ababa, 17979, ኢትዮጵያ amenity drinking_water 0.101 ኢትዮጵያ et Africa Eastern Africa
+hesa 2021-02-03 11634819 node Hesa, Illubabor, ኦሮሚያ áŠáˆ<8d>áˆ<8d> / Oromia, ኢትዮጵያ place locality 0.225 ኢትዮጵያ et Africa Eastern Africa
+african union 2021-02-03 75704898 node African Union, Roosevelt Street, ሜáŠáˆ²áŠ®, Addis Ababa / አዲስ አበባ, Kirkos, አዲስ አበባ / Addis Ababa, 7777, ኢትዮጵያ highway bus_stop 0.201 ኢትዮጵያ et Africa Eastern Africa
+ethiopia 2021-02-03 258197652 relation ኢትዮጵያ boundary administrative 0.719313654189281 ኢትዮጵያ et Africa Eastern Africa
+addis ababa university 2021-02-03 76411915 node Addis Ababa University, Botswana Street, Sidist Kilo, Gulale, አዲስ አበባ / Addis Ababa, 1176, ኢትዮጵያ amenity university 0.301 ኢትዮጵያ et Africa Eastern Africa
+sanyo 2021-02-03 24120991 node Sanyo, South Wollo, አማራ áŠáˆ<8d>áˆ<8d> / Amhara, ኢትዮጵያ place village 0.375 ኢትዮጵያ et Africa Eastern Africa
+aalto university 2021-02-03 203146197 way Aalto-yliopisto, 24, Otakaari, Teekkarikylä, Otaniemi, Suur-Tapiola, Espoo, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 02150, Suomi / Finland amenity university 0.547526724801917 Suomi / Finland fi Europe Northern Europe
+wwf 2021-02-03 187819953 way WWF, Juupajoki, Ylä-Pirkanmaan seutukunta, Pirkanmaa, Länsi- ja Sisä-Suomen aluehallintovirasto, Manner-Suomi, FIN-35500, Suomi / Finland highway path 0.175 Suomi / Finland fi Europe Northern Europe
+european chemicals agency 2021-02-03 228733010 way ECHA, 6, Telakkakatu, Viiskulma, Punavuori, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00150, Suomi / Finland office government 0.58713884113187 Suomi / Finland fi Europe Northern Europe
+suomi 2021-02-03 257282877 relation Suomi / Finland boundary administrative 0.907327503568528 Suomi / Finland fi Europe Northern Europe
+state research agency 2021-02-03 54517775 node The Finnish Brain Research and Rehabilitation Center Neuron, Kortesalmi, Kuopio, Kuopion seutukunta, Pohjois-Savo, Itä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland amenity hospital 0.101 Suomi / Finland fi Europe Northern Europe
+helsinki 2021-02-03 256826686 relation Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland boundary administrative 0.838500451911677 Suomi / Finland fi Europe Northern Europe
+auriga 2021-02-03 225561228 way Auriga, Keskusta, Turku, Turun seutukunta, Varsinais-Suomi, Lounais-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland landuse commercial 0.3 Suomi / Finland fi Europe Northern Europe
+meteorological institute 2021-02-03 84585571 node Ilmatieteen laitos, 1, Erik Palménin aukio, Kumpula, Keskinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00560, Suomi / Finland amenity research_institute 0.397069208513039 Suomi / Finland fi Europe Northern Europe
+university of helsinki 2021-02-03 192168896 way Helsingin yliopisto, Fabianinkatu, Kaisaniemi, Kluuvi, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00130, Suomi / Finland amenity university 0.685481368803326 Suomi / Finland fi Europe Northern Europe
+academy of finland 2021-02-03 103783048 way Sibelius-Akatemia, 9, Pohjoinen Rautatiekatu, Etu-Töölö, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00100, Suomi / Finland amenity university 0.556866432376015 Suomi / Finland fi Europe Northern Europe
+nato 2021-02-03 142732534 way Nåtö, Lemland, Ålands landsbygd, Landskapet Åland, Suomi / Finland place island 0.325 Suomi / Finland fi Europe Northern Europe
+aaaa 2021-02-03 298635624 relation aaaa, Inari, Pohjois-Lapin seutukunta, Lappi, Lapin aluehallintovirasto, Manner-Suomi, Suomi / Finland natural water 0.31 Suomi / Finland fi Europe Northern Europe
+nokia 2021-02-03 258022880 relation Nokia, Tampereen seutukunta, Pirkanmaa, Länsi- ja Sisä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland boundary administrative 0.568523457581497 Suomi / Finland fi Europe Northern Europe
+university of oulu 2021-02-03 259419685 relation Oulun yliopisto, Biologintie, Linnanmaa, Oulu, Oulun seutukunta, Pohjois-Pohjanmaa, Pohjois-Suomen aluehallintovirasto, Manner-Suomi, 90575, Suomi / Finland amenity university 0.563054296170656 Suomi / Finland fi Europe Northern Europe
+vtt 2021-02-03 127038522 way VTT, Halssila, Jyväskylä, Jyväskylän seutukunta, Keski-Suomi, Länsi- ja Sisä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland landuse industrial 0.3 Suomi / Finland fi Europe Northern Europe
+university of eastern finland 2021-02-03 94568596 way Itä-Suomen yliopisto, Siltakatu, Otsola, Joensuu, Joensuun seutukunta, Pohjois-Karjala, Itä-Suomen aluehallintovirasto, Manner-Suomi, 80101, Suomi / Finland amenity university 0.462945678183792 Suomi / Finland fi Europe Northern Europe
+echa 2021-02-03 228733010 way ECHA, 6, Telakkakatu, Viiskulma, Punavuori, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00150, Suomi / Finland office government 0.68713884113187 Suomi / Finland fi Europe Northern Europe
+finland 2021-02-03 257282877 relation Suomi / Finland boundary administrative 0.907327503568528 Suomi / Finland fi Europe Northern Europe
+national research agency 2021-02-03 54517775 node The Finnish Brain Research and Rehabilitation Center Neuron, Kortesalmi, Kuopio, Kuopion seutukunta, Pohjois-Savo, Itä-Suomen aluehallintovirasto, Manner-Suomi, Suomi / Finland amenity hospital 0.101 Suomi / Finland fi Europe Northern Europe
+hanken school of economics 2021-02-03 119630076 way Svenska Handelshögskolan, Runeberginkatu, Etu-Töölö, Eteläinen suurpiiri, Helsinki, Helsingin seutukunta, Uusimaa, Etelä-Suomen aluehallintovirasto, Manner-Suomi, 00100, Suomi / Finland amenity university 0.389895770819526 Suomi / Finland fi Europe Northern Europe
+ngi 2021-02-03 150974640 way Ngau Airport, Lovo, Eastern, Viti aeroway aerodrome 0.233228686818865 Viti fj Oceania Melanesia
+fiji 2021-02-03 258486203 relation Viti boundary administrative 0.681878300158849 Viti fj Oceania Melanesia
+ictv 2021-02-03 43642085 node ICTV, Kaselehlia, Kolonia, Sapwohn kousapw, Pohnpei, 96941, Micronesia amenity studio 0.101 Micronesia fm Oceania Micronesia
+micronesia 2021-02-03 258075744 relation Micronesia boundary administrative 0.707162448380302 Micronesia fm Oceania Micronesia
+cgg 2021-02-03 125620979 way Galileo - CGG, 27, Avenue Carnot, Atlantis, Massy, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91300, France office company 0.101 France fr Europe Western Europe
+élysée palace 2021-02-03 258481424 relation Palais de l'Élysée, Avenue de Marigny, Quartier de la Madeleine, Paris 8e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75008, France tourism attraction 0.509937038508179 France fr Europe Western Europe
+european banking authority 2021-02-03 76900435 node EBA, 20, Avenue André Prothin, La Défense 4, Quartier Gambetta, Courbevoie, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92927, France office government 0.410978906513343 France fr Europe Western Europe
+insa 2021-02-03 98992110 way INSA, 135, Avenue de Rangueil, Rangueil, Sauzelong, Pech David, Pouvourville, Toulouse Sud-Est, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31400, France amenity college 0.528807256594898 France fr Europe Western Europe
+university paris-saclay 2021-02-03 259420663 relation Université Paris-Saclay à Palaiseau, 10;2, Boulevard Thomas Gobert, Rocher de Lozère, Les Taupiniaux, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91120, France amenity university 0.201 France fr Europe Western Europe
+ge healthcare 2021-02-03 143374856 way GE Healthcare, Buc, Versailles, Yvelines, Île-de-France, France métropolitaine, 78530, France landuse industrial 0.4 France fr Europe Western Europe
+cox 2021-02-03 258439836 relation Cox, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31480, France boundary administrative 0.646520829297697 France fr Europe Western Europe
+university of bourgogne in dijon 2021-02-03 95205346 way Université de Bourgogne, Mazen - Sully, Mirande, Montmuzard, Dijon, Côte-d'Or, Bourgogne-Franche-Comté, France métropolitaine, 21000, France amenity university 0.752513195064787 France fr Europe Western Europe
+cgt 2021-02-03 68123191 node Confédération Générale du Travail, Rue Léon Jouhaux, Centre Ville - La Fayette - Eblé, Angers, Maine-et-Loire, Pays de la Loire, France métropolitaine, 49100, France office union 0.462615389253141 France fr Europe Western Europe
+institute for security studies 2021-02-03 79329921 node EUISS, 100, Avenue de Suffren, Quartier du Gros-Caillou, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France office government 0.408257033589149 France fr Europe Western Europe
+quai branly museum 2021-02-03 93256799 way Musée du quai Branly - Jacques Chirac, 37, Quai Branly, Quartier de Grenelle, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75007, France tourism museum 0.658842937598083 France fr Europe Western Europe
+geac 2021-02-03 48072741 node Géac, Marennes, Marennes-Hiers-Brouage, Rochefort, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17320, France place neighbourhood 0.25 France fr Europe Western Europe
+usap 2021-02-03 58901930 node Boutique USAP, Quai Sébastien Vauban, Saint-Jean, Perpignan, Pyrénées-Orientales, Occitanie, France métropolitaine, 66000, France shop gift 0.101 France fr Europe Western Europe
+organisation for economic co-operation and development 2021-02-03 103637552 way OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France office government 0.669924309656139 France fr Europe Western Europe
+barc 2021-02-03 257946952 relation Barc, Bernay, Eure, Normandie, France métropolitaine, 27170, France boundary administrative 0.648166057069124 France fr Europe Western Europe
+paris descartes university 2021-02-03 222560238 way ESIEE Paris, 2, Rond-Point Centre de la Terre, Bois de Grâce, Cité Descartes, Noisy-le-Grand, Torcy, Seine-et-Marne, Île-de-France, France métropolitaine, 93160, France amenity university 0.568804350670811 France fr Europe Western Europe
+chiron 2021-02-03 72434563 node Chiron, Jalognes, Bourges, Cher, Centre-Val de Loire, France métropolitaine, 18300, France place hamlet 0.35 France fr Europe Western Europe
+le monde 2021-02-03 31554000 node Le Monde, Lamastre, Tournon-sur-Rhône, Ardèche, Auvergne-Rhône-Alpes, France métropolitaine, 07270, France place hamlet 0.45 France fr Europe Western Europe
+irb 2021-02-03 259557803 relation IRB, Rue du Truel, Hôpitaux-Facultés, Montpellier, Hérault, Occitanie, France métropolitaine, 34090, France building yes 0.101 France fr Europe Western Europe
+university of franche-comté 2021-02-03 95205346 way Université de Bourgogne, Mazen - Sully, Mirande, Montmuzard, Dijon, Côte-d'Or, Bourgogne-Franche-Comté, France métropolitaine, 21000, France amenity university 0.652513195064787 France fr Europe Western Europe
+university paris-sud 2021-02-03 125512473 way Université Paris 1 Panthéon-Sorbonne Centre Pierre Mendès-France, 90, Rue de Tolbiac, Cité Florale, Quartier de la Maison-Blanche, Paris 13e Arrondissement, Paris, Île-de-France, France métropolitaine, 75013, France amenity university 0.320860870373788 France fr Europe Western Europe
+morgan sheng 2021-02-03 80011400 node Morgan, Rue Guillaume Apollinaire, ZAC de Châteaufarine, Chateaufarine, Besançon, Doubs, Bourgogne-Franche-Comté, France métropolitaine, 25000, France shop clothes 0.328876356713622 France fr Europe Western Europe
+casac 2021-02-03 258518811 relation Cazac, Saint-Gaudens, Haute-Garonne, Occitanie, France métropolitaine, 31230, France boundary administrative 0.545962513581625 France fr Europe Western Europe
+anais 2021-02-03 257427833 relation Anais, Rochefort, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17540, France boundary administrative 0.635438301112098 France fr Europe Western Europe
+sanofi-aventis 2021-02-03 104705121 way Sanofi-Aventis, Mosson, Montpellier, Hérault, Occitanie, France métropolitaine, France landuse industrial 0.4 France fr Europe Western Europe
+bia 2021-02-03 101203382 way Aéroport international de Bastia-Poretta, Route de l'Aéroport, Poretta, Lucciana, Bastia, Haute-Corse, Corse, France métropolitaine, 20290, France aeroway aerodrome 0.427383538249758 France fr Europe Western Europe
+food research initiative 2021-02-03 61551953 node Khatmandou, 22, Rue des Boulangers, Quartier Saint-Victor, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France amenity restaurant 0.001 France fr Europe Western Europe
+european space agency 2021-02-03 91413915 way European Space Agency, Square Lowendal, Quartier Necker, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France office government 0.899350436637207 France fr Europe Western Europe
+paris-saclay 2021-02-03 115502194 way HEC Paris, Rue Curie, Val d'Albian, Saclay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91400, France amenity college 0.681992451472996 France fr Europe Western Europe
+un convention 2021-02-03 310196 node Convention, Rue de Vaugirard, Quartier Saint-Lambert, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France railway station 0.504979282964766 France fr Europe Western Europe
+university of chiron 2021-02-03 80237376 node IAE Savoie Mont Blanc, Chemin de Jacob, Le Biollay, Jacob-Bellecombette, Chambéry, Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 73000, France amenity university 0.001 France fr Europe Western Europe
+university of paris 2021-02-03 108596882 way Université Paris-Dauphine, 1, Place du Maréchal de Lattre de Tassigny, Quartier de la Porte-Dauphine, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75116, France amenity university 0.577529588367216 France fr Europe Western Europe
+iau 2021-02-03 80025084 node International Astronomical Union, 98 bis, Boulevard Arago, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France office company 0.628915221808463 France fr Europe Western Europe
+paris observatory 2021-02-03 108610831 way Observatoire de Paris, Avenue de l'Observatoire, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France man_made observatory 0.607006976013631 France fr Europe Western Europe
+bmj 2021-02-03 78287453 node BMJ, Avenue Robert Schuman, Croix-Rouge, Reims, Marne, Grand Est, France métropolitaine, 51100, France office company 0.101 France fr Europe Western Europe
+ansa 2021-02-03 258683808 relation Ance, Ance-Féas, Oloron-Sainte-Marie, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64570, France boundary administrative 0.54258541444388 France fr Europe Western Europe
+cavu 2021-02-03 243007804 way Cavu, Morticcio Di Cava, Zonza, Sartène, Corse-du-Sud, Corse, France métropolitaine, 20124, France landuse residential 0.3 France fr Europe Western Europe
+greenpeace france 2021-02-03 66030093 node GreenPeace France, 13, Rue d'Enghien, Quartier de la Porte-Saint-Denis, Paris 10e Arrondissement, Paris, Île-de-France, France métropolitaine, 75010, France office ngo 0.201 France fr Europe Western Europe
+ero 2021-02-03 258249267 relation Hérault, Occitanie, France métropolitaine, France boundary administrative 0.612674328718567 France fr Europe Western Europe
+syngenta 2021-02-03 101933385 way Syngenta, Aigues-Vives, Nîmes, Gard, Occitanie, France métropolitaine, 30670, France landuse industrial 0.3 France fr Europe Western Europe
+continental europe 2021-02-03 18973745 node Europe, Rue de Madrid, Quartier de l'Europe, Paris 8e Arrondissement, Paris, Île-de-France, France métropolitaine, 75008, France railway station 0.508908372801738 France fr Europe Western Europe
+pharma 2021-02-03 65490459 node La Pharma, Rue de l'Armistice, La Capelle, Vervins, Aisne, Hauts-de-France, France métropolitaine, 02260, France amenity pharmacy 0.101 France fr Europe Western Europe
+acmd 2021-02-03 71917036 node ACMD Chaudeyrac, D 500, Le Pont du Mont, Saint-Front, Le Puy-en-Velay, Haute-Loire, Auvergne-Rhône-Alpes, France métropolitaine, 43550, France man_made street_cabinet 0.101 France fr Europe Western Europe
+university of montpellier 2021-02-03 17861839 node Institut Musicothérapie, 11, Rue Saint-Louis, Les Arceaux, Centre, Montpellier, Hérault, Occitanie, France métropolitaine, 34967, France amenity university 0.101 France fr Europe Western Europe
+space agency 2021-02-03 91413915 way European Space Agency, Square Lowendal, Quartier Necker, Paris 15e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France office government 0.799350436637207 France fr Europe Western Europe
+dtt 2021-02-03 25906171 node dtt, Rue des Provenceaux, Les Pleus, Fontainebleau, Seine-et-Marne, Île-de-France, France métropolitaine, 77300, France office architect 0.111 France fr Europe Western Europe
+eurasia 2021-02-03 54313918 node Eurasia, Place Jean-Pierre Pincemin, Plaine de Champbertrand, Sens, Yonne, Bourgogne-Franche-Comté, France métropolitaine, 89100, France amenity restaurant 0.101 France fr Europe Western Europe
+boehringer ingelheim 2021-02-03 236180040 way 12, Boehringer Ingelheim, Reims, Marne, Grand Est, France métropolitaine, 51100, France landuse commercial 0.4 France fr Europe Western Europe
+le quéré 2021-02-03 259354933 relation La Quère, Coustouges, Céret, Pyrénées-Orientales, Occitanie, France métropolitaine, 66260, France waterway river 0.4 France fr Europe Western Europe
+university of paris-sud 2021-02-03 125512473 way Université Paris 1 Panthéon-Sorbonne Centre Pierre Mendès-France, 90, Rue de Tolbiac, Cité Florale, Quartier de la Maison-Blanche, Paris 13e Arrondissement, Paris, Île-de-France, France métropolitaine, 75013, France amenity university 0.320860870373788 France fr Europe Western Europe
+codis 2021-02-03 109262595 way Codis, Avenue du Douard, Zone industrielle des Paluds, Aubagne, Marseille, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13400, France building yes 0.101 France fr Europe Western Europe
+facebook ai research 2021-02-03 45183919 node Facebook Artificial Intelligence Research, 108-112, Avenue de Wagram, Quartier des Ternes, Paris 17e Arrondissement, Paris, Île-de-France, France métropolitaine, 75017, France office company;research 0.301 France fr Europe Western Europe
+le canard enchaîné 2021-02-03 39428962 node Le Canard Enchainé, 173, Rue Saint-Honoré, Quartier de la Madeleine, Paris 8e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75008, France office newspaper 0.657752713427244 France fr Europe Western Europe
+avn 2021-02-03 102000501 way Aéroport Avignon Provence, Chemin des Félons, Quartier Agroparc, Avignon, Vaucluse, Provence-Alpes-Côte d'Azur, France métropolitaine, 84000, France aeroway aerodrome 0.375142530859403 France fr Europe Western Europe
+inra 2021-02-03 107855804 way Institut National de la Recherche Agronomique, Rue Malar, Quartier du Gros-Caillou, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75007, France office government 0.44821536212669 France fr Europe Western Europe
+horizon europe 2021-02-03 236372777 way Horizon Nature, Jeanne d'Arc, Europe, Reims, Marne, Grand Est, France métropolitaine, 51100, France place city_block 0.325 France fr Europe Western Europe
+le tourneau 2021-02-03 17540630 node Tourneau, Martizay, Le Blanc, Indre, Centre-Val de Loire, France métropolitaine, 36220, France place hamlet 0.45 France fr Europe Western Europe
+roche 2021-02-03 258342813 relation Roche, La Tour-du-Pin, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38090, France boundary administrative 0.632815701917223 France fr Europe Western Europe
+ansan 2021-02-03 257452491 relation Ansan, Auch, Gers, Occitanie, France métropolitaine, 32270, France boundary administrative 0.630031149843668 France fr Europe Western Europe
+bmc biol 2021-02-03 257271286 relation Biol, La Tour-du-Pin, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38690, France boundary administrative 0.63837155629697 France fr Europe Western Europe
+rin 2021-02-03 258366255 relation Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, France boundary administrative 0.625111737838686 France fr Europe Western Europe
+gilead sciences 2021-02-03 57632761 node Gilead Sciences, Quai Georges Gorse, Rives de Seine, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France office company 0.201 France fr Europe Western Europe
+biotechniques 2021-02-03 143597040 way S.E.R.P. / Les Complexes Biotechniques, 3, Chemin de Notre-Dame d'Alem, Lotissement des Chênes, Courbieu, Castelsarrasin, Tarn-et-Garonne, Occitanie, France métropolitaine, 82100, France building industrial 0.101 France fr Europe Western Europe
+university of bordeaux 2021-02-03 20434734 node Broca 2, Rue Paul Broca, Victoire, Bordeaux Sud, Bordeaux, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33000, France amenity university 0.101 France fr Europe Western Europe
+aps 2021-02-03 258139810 relation Alba-la-Romaine, Privas, Ardèche, Auvergne-Rhône-Alpes, France métropolitaine, 07400, France boundary administrative 0.504276300065756 France fr Europe Western Europe
+university of savoie 2021-02-03 106618355 way Abbaye de Talloires, Chemin de la Colombière, Les Granges, Talloires, Talloires-Montmin, Annecy, Haute-Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 74290, France historic monastery 0.36358119422997 France fr Europe Western Europe
+dea 2021-02-03 257783355 relation Die, Drôme, Auvergne-Rhône-Alpes, France métropolitaine, 26150, France boundary administrative 0.519081808694247 France fr Europe Western Europe
+iap 2021-02-03 109006815 way Institut d'Astrophysique de Paris, 98bis, Boulevard Arago, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France amenity research_institute 0.346621693019181 France fr Europe Western Europe
+smap 2021-02-03 118272814 way SMAP, 110, Rue des Genêts, Beausoleil, Les Chauveaux, Pons, Jonzac, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17800, France shop car_parts 0.101 France fr Europe Western Europe
+morris minor 2021-02-03 208273363 way Rue Morris, La Bergerie, Liffré, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35340, France highway residential 0.2 France fr Europe Western Europe
+cgc 2021-02-03 258931479 relation Challans-Gois Communauté, Loire-Atlantique, Pays de la Loire, France métropolitaine, France boundary local_authority 0.297580560553068 France fr Europe Western Europe
+isac 2021-02-03 258407194 relation Saint-Pardoux-Isaac, Marmande, Lot-et-Garonne, Nouvelle-Aquitaine, France métropolitaine, 47800, France boundary administrative 0.507842182728223 France fr Europe Western Europe
+montpellier 2021-02-03 257963687 relation Montpellier, Hérault, Occitanie, France métropolitaine, France boundary administrative 0.741204187018582 France fr Europe Western Europe
+arkema 2021-02-03 247250195 way Arkema, Serquigny, Bernay, Eure, Normandie, France métropolitaine, 27470, France landuse industrial 0.3 France fr Europe Western Europe
+defense 2021-02-03 54227491 node La Défense, Quartier Gambetta, Courbevoie, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92400, France place suburb 0.510297600438359 France fr Europe Western Europe
+information justice 2021-02-03 65896782 node Maison du tourisme, 17, Rue de la Justice, Onzain, Veuzain-sur-Loire, Blois, Loir-et-Cher, Centre-Val de Loire, France métropolitaine, 41150, France tourism information 0.101 France fr Europe Western Europe
+cirad 2021-02-03 48847329 node CIRAD, Chemin Grand Canal, La Bretagne, Saint-Denis, La Réunion, 97492, France amenity university 0.101 France fr Europe Western Europe
+orion 2021-02-03 258678145 relation Orion, Oloron-Sainte-Marie, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64390, France boundary administrative 0.652704511977299 France fr Europe Western Europe
+hec paris 2021-02-03 115502194 way HEC Paris, Rue Curie, Val d'Albian, Saclay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91400, France amenity college 0.681992451472996 France fr Europe Western Europe
+edf 2021-02-03 107960916 way Barrage de Bort, D 683, Granges, Lanobre, Mauriac, Cantal, Auvergne-Rhône-Alpes, France métropolitaine, 15270, France tourism attraction 0.323710213530857 France fr Europe Western Europe
+acs 2021-02-03 258273931 relation Ax-les-Thermes, Foix, Ariège, Occitanie, France métropolitaine, 09110, France boundary administrative 0.523865752467132 France fr Europe Western Europe
+la france insoumise 2021-02-03 67479137 node La France Insoumise, 43, Rue de Dunkerque, Quartier Saint-Vincent-de-Paul, Paris 10e Arrondissement, Paris, Île-de-France, France métropolitaine, 75010, France office political_party 0.301 France fr Europe Western Europe
+floc 2021-02-03 13960329 node Floc, Pouillon, Arrondissement de Dax, Landes, Nouvelle-Aquitaine, France métropolitaine, 40350, France place isolated_dwelling 0.3 France fr Europe Western Europe
+afp 2021-02-03 109098482 way Agence France-Presse, 24, Avenue des Français Libres, Petite Californie, Saint-Hélier, Thabor - Saint-Hélier - Alphonse Guérin, Quartiers Centre, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35000, France office company 0.592517658210275 France fr Europe Western Europe
+smrb 2021-02-03 130132163 way Scierie Mobile Romagny Bernardini, D 120, Charmoy la Ville, Charmoy, Autun, Saône-et-Loire, Bourgogne-Franche-Comté, France métropolitaine, 71710, France building yes 0.001 France fr Europe Western Europe
+grandes ecoles 2021-02-03 188423310 way Grandes Écoles, Metz-Technopôle, Grange-aux-Bois, Grigy, Metz, Moselle, Grand Est, France métropolitaine, France highway bus_stop 0.2 France fr Europe Western Europe
+university of strasbourg 2021-02-03 102280471 way International Space University, Rue Mathias Ringmann, Parc d'Innovation Technologique d'Illkirch, Illkirch-Graffenstaden, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67400, France amenity university 0.587650262005596 France fr Europe Western Europe
+paris school of economics 2021-02-03 107920608 way École d'économie de Paris, 48, Boulevard Jourdan, Quartier du Parc-de-Montsouris, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France amenity university 0.422734482343971 France fr Europe Western Europe
+cgiar 2021-02-03 132938773 way Groupe Consultatif pour la Recherche Agronomique Internationale, Rond-Point Professeur Louis Malassis, Aiguelongue, Hôpitaux-Facultés, Montpellier, Hérault, Occitanie, France métropolitaine, France office research 0.001 France fr Europe Western Europe
+council of europe 2021-02-03 68954423 node Conseil de l'Europe, Avenue de l'Europe, Quartier des XV, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67075, France office government 0.707253284652268 France fr Europe Western Europe
+mars 2021-02-03 258293542 relation Mars, Tournon-sur-Rhône, Ardèche, Auvergne-Rhône-Alpes, France métropolitaine, 07320, France boundary administrative 0.612054242729639 France fr Europe Western Europe
+zte corporation 2021-02-03 57728490 node ZTE Corporation, Rue Tony Garnier, Centre Ville, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France office company 0.201 France fr Europe Western Europe
+organisation for economic cooperation and development 2021-02-03 103637552 way OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France office government 0.669924309656139 France fr Europe Western Europe
+ifremer 2021-02-03 258272648 relation Ifremer, Avenue Jean Monnet, Sète, Montpellier, Hérault, Occitanie, France métropolitaine, 34200, France building yes 0.490553774215852 France fr Europe Western Europe
+inserm 2021-02-03 109366785 way Institut national de la santé et de la recherche médicale, 12, Avenue du Professeur Léon Bernard, Kennedy, Villejean, Villejean - Beauregard, Quartiers Nord-Ouest, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35000, France building yes 0.412449177852278 France fr Europe Western Europe
+cru 2021-02-03 49528176 node Le Cru, Lamontélarié, Castres, Tarn, Occitanie, France métropolitaine, 81260, France place isolated_dwelling 0.3 France fr Europe Western Europe
+interpol 2021-02-03 106770347 way Interpol, Quai Charles de Gaulle, Cité Internationale, Lyon 6e Arrondissement, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69006, France amenity police 0.694215113171225 France fr Europe Western Europe
+international astronomical union 2021-02-03 80025084 node International Astronomical Union, 98 bis, Boulevard Arago, Quartier du Montparnasse, Paris 14e Arrondissement, Paris, Île-de-France, France métropolitaine, 75014, France office company 0.928915221808463 France fr Europe Western Europe
+covidien 2021-02-03 38712267 node Covidien, 1, Place de l'Hôpital, La Petite France, Krutenau, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67065, France office company 0.425302870611459 France fr Europe Western Europe
+jax 2021-02-03 258821254 relation Jax, Brioude, Haute-Loire, Auvergne-Rhône-Alpes, France métropolitaine, 43230, France boundary administrative 0.600013023210469 France fr Europe Western Europe
+university of poitiers 2021-02-03 14312417 node École Des Beaux-Arts, Rue Jean Alexandre, Hôtel de Ville, Poitiers, Vienne, Nouvelle-Aquitaine, France métropolitaine, 86000, France amenity university 0.101 France fr Europe Western Europe
+ecw 2021-02-03 46390846 node ECW, 309, Avenue Lavoisier, Parc d'activité des Estuaires - Espace du Mortier, Derval, Châteaubriant-Ancenis, Loire-Atlantique, Pays de la Loire, France métropolitaine, 44590, France office company 0.101 France fr Europe Western Europe
+infn 2021-02-03 145095025 way Institut national des formations notariales site de Nantes, Rue Gaston Turpin, Coulmiers, Saint-Donatien, Malakoff - Saint-Donatien, Nantes, Loire-Atlantique, Pays de la Loire, France métropolitaine, 44000, France amenity college 0.001 France fr Europe Western Europe
+nice 2021-02-03 298761441 relation Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, France boundary administrative 0.762676330560633 France fr Europe Western Europe
+biotropica 2021-02-03 149863985 way Biotropica, D 110, Val-de-Reuil, Les Andelys, Eure, Normandie, France métropolitaine, France tourism zoo 0.101 France fr Europe Western Europe
+chimie paristech 2021-02-03 255063606 way Chimie ParisTech - Université PSL, Rue d'Ulm, Quartier du Val-de-Grâce, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France amenity university 0.609552900499061 France fr Europe Western Europe
+philae 2021-02-03 242087546 way Philae, Sainte-Radegonde, Tours, Indre-et-Loire, Centre-Val de Loire, France métropolitaine, France landuse residential 0.3 France fr Europe Western Europe
+cnes 2021-02-03 3710223 node CNES, Avenue de l'Europe, Rangueil, Sauzelong, Pech David, Pouvourville, Toulouse Sud-Est, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31400, France tourism information 0.101 France fr Europe Western Europe
+university paris descartes 2021-02-03 222560238 way ESIEE Paris, 2, Rond-Point Centre de la Terre, Bois de Grâce, Cité Descartes, Noisy-le-Grand, Torcy, Seine-et-Marne, Île-de-France, France métropolitaine, 93160, France amenity university 0.568804350670811 France fr Europe Western Europe
+cirm 2021-02-03 211615805 way CIRM, Le Redon, 9e Arrondissement, Marseille, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13009, France leisure park 0.25 France fr Europe Western Europe
+ruch 2021-02-03 258043564 relation Ruch, Langon, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33350, France boundary administrative 0.638658334123937 France fr Europe Western Europe
+ciel austral 2021-02-03 226066521 way Route du Ciel (R. 66), Port-aux-Français, Terres australes et antarctiques françaises, France highway tertiary 0.3 France fr Europe Western Europe
+ooi 2021-02-03 258357071 relation Oye-Plage, Calais, Pas-de-Calais, Hauts-de-France, France métropolitaine, 62215, France boundary administrative 0.570855829119973 France fr Europe Western Europe
+hermes 2021-02-03 257935464 relation Hermes, Beauvais, Oise, Hauts-de-France, France métropolitaine, 60370, France boundary administrative 0.656526838838103 France fr Europe Western Europe
+rff 2021-02-03 214475334 way Sous-station RFF de Saint-Marcel, Le Moulin de Saint-Marin, Saint-Marcel, Châteauroux, Indre, Centre-Val de Loire, France métropolitaine, 36200, France landuse industrial 0.3 France fr Europe Western Europe
+center for studies 2021-02-03 79329921 node EUISS, 100, Avenue de Suffren, Quartier du Gros-Caillou, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75015, France office government 0.408257033589149 France fr Europe Western Europe
+université paris-saclay 2021-02-03 126984936 way Université Paris-Saclay, Orsay Gare, Corbeville, Orsay, Palaiseau, Essonne, ÃŽle-de-France, France métropolitaine, 91400, France highway unclassified 0.4 France fr Europe Western Europe
+ansm 2021-02-03 242417770 way Agence nationale de sécurité du médicament et des produits de santé, Boulevard Anatole France, Saint-Denis, Seine-Saint-Denis, Île-de-France, France métropolitaine, 93200, France office government 0.001 France fr Europe Western Europe
+université paris-sud 2021-02-03 125512473 way Université Paris 1 Panthéon-Sorbonne Centre Pierre Mendès-France, 90, Rue de Tolbiac, Cité Florale, Quartier de la Maison-Blanche, Paris 13e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75013, France amenity university 0.420860870373788 France fr Europe Western Europe
+nazis 2021-02-03 298629865 way Ruisseau des Nazis, Le Trillol, Rouffiac-des-Corbières, Narbonne, Aude, Occitanie, France métropolitaine, 11350, France waterway stream 0.3 France fr Europe Western Europe
+soas 2021-02-03 257992695 relation Soues, Tarbes, Hautes-Pyrénées, Occitanie, France métropolitaine, 65430, France boundary administrative 0.528176451195692 France fr Europe Western Europe
+cnr 2021-02-03 108877742 way Barrage de Génissiat, Route du Barrage, Chez Mazza, Franclens, Saint-Julien-en-Genevois, Haute-Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 74910, France tourism attraction 0.348376470606964 France fr Europe Western Europe
+pacific marine 2021-02-03 10446875 node Pacific Marine, Rue Auguste Bénébig, Les Massanes, Vallée des Colons, Secteur Sud, Nouméa, Province Sud, Nouvelle-Calédonie, 98800, France shop boat 0.201 France fr Europe Western Europe
+sorbonne university 2021-02-03 258943206 relation Sorbonne Université - Faculté des Sciences et Ingénierie, Rue Jussieu, Quartier Saint-Victor, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France amenity university 0.450501936383412 France fr Europe Western Europe
+lgbt 2021-02-03 56766164 node LGBT, Rue Bourgneuf, Petit Bayonne, Bayonne, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64100, France tourism artwork 0.101 France fr Europe Western Europe
+lilly 2021-02-03 258366075 relation Lilly, Les Andelys, Eure, Normandie, France métropolitaine, 27480, France boundary administrative 0.646329478200412 France fr Europe Western Europe
+cospar 2021-02-03 80463846 node Committee on Space Research, 2, Place Maurice Quentin, Quartier des Halles, Quartier Les Halles, Paris 1er Arrondissement, Paris, Île-de-France, France métropolitaine, 75001, France office research 0.462953287025885 France fr Europe Western Europe
+mgp 2021-02-03 258784757 relation Métropole du Grand Paris, Paris, Île-de-France, France métropolitaine, France boundary local_authority 0.455626604417121 France fr Europe Western Europe
+culture and sport 2021-02-03 107858191 way Culture Sport, Rue du Château, Ganges, Lodève, Hérault, Occitanie, France métropolitaine, 34190, France shop sports 0.201 France fr Europe Western Europe
+mountain research initiative 2021-02-03 25249463 node Initiative pour la Recherche et l'Innovation sur le Logiciel Libre, 4, Place Jussieu, Quartier Saint-Victor, Paris 5e Arrondissement, Paris, Île-de-France, France métropolitaine, 75005, France office research 0.281472839091896 France fr Europe Western Europe
+ceaa 2021-02-03 258116230 relation Centre d'expertise autisme adulte (C.E.A.A.), Rue François Couhé, Goise, Goise Champommier Champclairot, Niort, Deux-Sèvres, Nouvelle-Aquitaine, France métropolitaine, 79000, France building hospital 0.001 France fr Europe Western Europe
+international bureau of weights and measures 2021-02-03 131402735 way Bureau International des Poids et Mesures, Allée du Mail, Saint-Cloud, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92210, France amenity public_building 0.558338814941197 France fr Europe Western Europe
+hust 2021-02-03 258051090 relation Huest, Évreux, Eure, Normandie, France métropolitaine, 27930, France boundary administrative 0.552302585820702 France fr Europe Western Europe
+mercury 2021-02-03 258144896 relation Mercury, Albertville, Savoie, Auvergne-Rhône-Alpes, France métropolitaine, 73200, France boundary administrative 0.594893283996417 France fr Europe Western Europe
+ugc 2021-02-03 218698221 way UGC Ciné-Cité Les Halles, 7, Allée Baltard, Quartier des Halles, Quartier Les Halles, Paris 1er Arrondissement, Paris, Île-de-France, France métropolitaine, 75001, France amenity cinema 0.359145294756841 France fr Europe Western Europe
+farc 2021-02-03 18479658 node Le Farc, Dommartin, Villefranche-sur-Saône, Rhône, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69380, France place locality 0.225 France fr Europe Western Europe
+raphaël paris 2021-02-03 57440846 node Raphael, Boulevard de Magenta, Quartier Saint-Vincent-de-Paul, Paris 10e Arrondissement, Paris, ÃŽle-de-France, France métropolitaine, 75010, France amenity bureau_de_change 0.101 France fr Europe Western Europe
+front national 2021-02-03 48309027 node Front National, 2, Rue Alexis Mossa, Le Piol, Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, 06000, France office political_party 0.201 France fr Europe Western Europe
+esrf 2021-02-03 257718140 relation European Synchrotron Radiation Facility, A 480, Polygone Scientifique, Secteur 1, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38000, France building office 0.360151663261328 France fr Europe Western Europe
+ori 2021-02-03 258365623 relation Auray, Lorient, Morbihan, Bretagne, France métropolitaine, 56400, France boundary administrative 0.616662915473728 France fr Europe Western Europe
+esf 2021-02-03 64479978 node ESF, D 615, Chastreix-Sancy, Chastreix, Issoire, Puy-de-Dôme, Auvergne-Rhône-Alpes, France métropolitaine, 63680, France amenity ski_school 0.101 France fr Europe Western Europe
+ens 2021-02-03 258700882 relation Ens, Bagnères-de-Bigorre, Hautes-Pyrénées, Occitanie, France métropolitaine, 65170, France boundary administrative 0.63322651402867 France fr Europe Western Europe
+ipfm 2021-02-03 20680313 node IPFM - CFA régional des métiers et de l'artisanat, 68, Allée des Forges, Les Mouissèques, La Seyne-sur-Mer, Toulon, Var, Provence-Alpes-Côte d'Azur, France métropolitaine, 83500, France office educational_institution 0.101 France fr Europe Western Europe
+geron 2021-02-03 11058034 node Geron, Le Tréhou, Brest, Finistère, Bretagne, France métropolitaine, 29450, France place hamlet 0.35 France fr Europe Western Europe
+climatic service 2021-02-03 296453392 node Climatic, 212, Route de La Seyne, Entre les Horts, Ollioules, Toulon, Var, Provence-Alpes-Côte d'Azur, France métropolitaine, 83190, France shop appliance 0.101 France fr Europe Western Europe
+bri 2021-02-03 257987067 relation Brie, Laon, Aisne, Hauts-de-France, France métropolitaine, 02870, France boundary administrative 0.663841846568865 France fr Europe Western Europe
+issi 2021-02-03 258465068 relation Heussé, Le Teilleul, Avranches, Manche, Normandie, France métropolitaine, 50640, France boundary administrative 0.540896235650295 France fr Europe Western Europe
+dpp 2021-02-03 53822962 node DPP, Saint-Leu, Saint-Paul, La Réunion, 97426, France waterway waterfall 0.35 France fr Europe Western Europe
+astrazeneca 2021-02-03 205568985 way AstraZeneca, Petite-Synthe, Dunkerque, Nord, Hauts-de-France, France métropolitaine, 59640, France landuse industrial 0.3 France fr Europe Western Europe
+international agency for research on cancer 2021-02-03 106923016 way Centre international de Recherche sur le Cancer, Cours Albert Thomas, Transvaal, Lyon 8e Arrondissement, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, France office ngo 0.756343487668219 France fr Europe Western Europe
+aix-marseille university 2021-02-03 99572106 way Aix-Marseille Université - Campus de Saint-Charles, Avenue Général Leclerc, Saint-Lazare, 3e Arrondissement, Marseille, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13003, France amenity university 0.669227485691559 France fr Europe Western Europe
+pla 2021-02-03 258567039 relation Le Pla, Foix, Ariège, Occitanie, France métropolitaine, 09460, France boundary administrative 0.613138446783058 France fr Europe Western Europe
+fsc 2021-02-03 102019407 way Figari - Sud Corse, D 22, Poggiale, Figari, Sartène, Corse-du-Sud, Corse, France métropolitaine, 20114, France aeroway aerodrome 0.407681409931154 France fr Europe Western Europe
+psa 2021-02-03 189374806 way PSA, Saint-Ouen-sur-Seine, Saint-Denis, Seine-Saint-Denis, Île-de-France, France métropolitaine, 93400, France landuse industrial 0.606493714650957 France fr Europe Western Europe
+iter 2021-02-03 115946244 way ITER Platform, Saint-Paul-lès-Durance, Aix-en-Provence, Bouches-du-Rhône, Provence-Alpes-Côte d'Azur, France métropolitaine, 13115, France natural sand 0.554322572212639 France fr Europe Western Europe
+ob association 2021-02-03 201036713 way Robinson, Lac de Maine, La Bijouterie, Angers, Maine-et-Loire, Pays de la Loire, France métropolitaine, France place island 0.425 France fr Europe Western Europe
+university of paris seine 2021-02-03 228628229 way Université René Descartes - Centre Henri Pieron, Avenue Édouard Vaillant, Point du Jour, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France amenity university 0.101 France fr Europe Western Europe
+world organisation for animal health 2021-02-03 59448672 node Organisation Mondiale de la Santé Animale, 12, Rue de Prony, Quartier de la Plaine-de-Monceau, Paris 17e Arrondissement, Paris, Île-de-France, France métropolitaine, 75017, France office government 0.201 France fr Europe Western Europe
+1752 group 2021-02-03 26457996 node Le Group, Larnaldesq, Le Vibal, Millau, Aveyron, Occitanie, France métropolitaine, 12290, France place locality 0.225 France fr Europe Western Europe
+pacific community 2021-02-03 6458038 node Communauté du Pacifique, Accès CPS, Anse Vata, Secteur Sud, Nouméa, Province Sud, Nouvelle-Calédonie, 98800, France office quango 0.001 France fr Europe Western Europe
+oecd 2021-02-03 103637552 way OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France office government 0.669924309656139 France fr Europe Western Europe
+eaa 2021-02-03 74755684 node Eaea, Hitiaa, Hitiaa O Te Ra, Îles du Vent, Polynésie Française, 98705, France place neighbourhood 0.25 France fr Europe Western Europe
+insead 2021-02-03 144761314 way Institut Européen d'Administration des Affaires, Route de l'Ermitage, Faisanderie, Fontainebleau, Seine-et-Marne, Île-de-France, France métropolitaine, 77300, France amenity university 0.45279198506882 France fr Europe Western Europe
+organisation for economic co-operation 2021-02-03 103637552 way OECD, 2, Rue André Pascal, Quartier de la Muette, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France office government 0.569924309656139 France fr Europe Western Europe
+barda 2021-02-03 257924811 relation Labarde, Lesparre-Médoc, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33460, France boundary administrative 0.535852707779254 France fr Europe Western Europe
+university grenoble-alpes 2021-02-03 22506396 node Gières Gare Univ, Gières - Gare - Universités, Chamandier, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38610, France amenity bicycle_rental 0.201 France fr Europe Western Europe
+european synchrotron radiation facility 2021-02-03 257718140 relation European Synchrotron Radiation Facility, A 480, Polygone Scientifique, Secteur 1, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38000, France building office 0.760151663261328 France fr Europe Western Europe
+university of grenoble alpes 2021-02-03 22506396 node Gières Gare Univ, Gières - Gare - Universités, Chamandier, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38610, France amenity bicycle_rental 0.201 France fr Europe Western Europe
+committee on space research 2021-02-03 80463846 node Committee on Space Research, 2, Place Maurice Quentin, Quartier des Halles, Quartier Les Halles, Paris 1er Arrondissement, Paris, Île-de-France, France métropolitaine, 75001, France office research 0.862953287025885 France fr Europe Western Europe
+cires 2021-02-03 258395752 relation Cirès, Saint-Gaudens, Haute-Garonne, Occitanie, France métropolitaine, 31110, France boundary administrative 0.539169238495007 France fr Europe Western Europe
+paul sabatier university 2021-02-03 117894361 way IUT Paul Sabatier, Impasse Marguerite Orcival, Auch, Gers, Occitanie, France métropolitaine, 32000, France amenity university 0.501865618613023 France fr Europe Western Europe
+corps 2021-02-03 258086431 relation Corps, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38970, France boundary administrative 0.643147513931235 France fr Europe Western Europe
+plos 2021-02-03 2997221 node Plos, Murat-sur-Vèbre, Castres, Tarn, Occitanie, France métropolitaine, 81320, France place hamlet 0.35 France fr Europe Western Europe
+bipm 2021-02-03 131402735 way Bureau International des Poids et Mesures, Allée du Mail, Saint-Cloud, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92210, France amenity public_building 0.358338814941197 France fr Europe Western Europe
+national prion clinic 2021-02-03 297718104 node Le Prion, Fronville, Saint-Dizier, Haute-Marne, Grand Est, France métropolitaine, 52300, France place locality 0.225 France fr Europe Western Europe
+pppl 2021-02-03 74437071 node PPPL Paris Pontoise Poids Lourds, Rue Lavoisier, Herblay-sur-Seine, Argenteuil, Val-d'Oise, Île-de-France, France métropolitaine, 95220, France shop car_repair 0.101 France fr Europe Western Europe
+lrem 2021-02-03 5716951 node Permanance du député LREM Sylvain Waserman, Route de l'Hôpital, Krutenau, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67076, France office political_party 0.101 France fr Europe Western Europe
+bosc 2021-02-03 257494857 relation Le Bosc, Lodève, Hérault, Occitanie, France métropolitaine, 34700, France boundary administrative 0.613242845306654 France fr Europe Western Europe
+eic 2021-02-03 116223112 way École d'Ingénieurs de Cherbourg (ESIX Normandie), Chemin des Roquettes, Octeville, Cherbourg-Octeville, Cherbourg-en-Cotentin, Cherbourg, Manche, Normandie, France métropolitaine, 50100, France building university 0.225794094499978 France fr Europe Western Europe
+lmu 2021-02-03 258528246 relation Lemuy, Dole, Jura, Bourgogne-Franche-Comté, France métropolitaine, 39110, France boundary administrative 0.531077603671255 France fr Europe Western Europe
+sanofi pasteur 2021-02-03 100174620 way Sanofi-Pasteur, Marcy-l'Étoile, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69280, France landuse industrial 0.4 France fr Europe Western Europe
+eu 2021-02-03 258377753 relation Eu, Dieppe, Seine-Maritime, Normandie, France métropolitaine, 76260, France boundary administrative 0.659192634426485 France fr Europe Western Europe
+bains 2021-02-03 258323998 relation Bains, Le Puy-en-Velay, Haute-Loire, Auvergne-Rhône-Alpes, France métropolitaine, 43370, France boundary administrative 0.598308965599252 France fr Europe Western Europe
+university of reims 2021-02-03 57788284 node Campus Cesi / Exia Reims, Avenue Robert Schuman, Croix-Rouge, Reims, Marne, Grand Est, France métropolitaine, 51100, France amenity university 0.101 France fr Europe Western Europe
+helicos 2021-02-03 187487532 way Club de Modélisme Les Hélicos de Benost, Beynost, Bourg-en-Bresse, Ain, Auvergne-Rhône-Alpes, France métropolitaine, 01700, France highway path 0.075 France fr Europe Western Europe
+naia 2021-02-03 7345492 node Naia, Païta, Province Sud, Nouvelle-Calédonie, France place suburb 0.375 France fr Europe Western Europe
+charles river laboratories 2021-02-03 296730571 way Charles River Laboratories, Rue de Pacy, Miserey, Évreux, Eure, Normandie, France métropolitaine, 27930, France man_made works 0.301 France fr Europe Western Europe
+adc 2021-02-03 259127644 relation Agglomération du Choletais, Maine-et-Loire, Pays de la Loire, France métropolitaine, France boundary local_authority 0.324670737896991 France fr Europe Western Europe
+cepi 2021-02-03 258248385 relation Cépie, Limoux, Aude, Occitanie, France métropolitaine, 11300, France boundary administrative 0.530539717499056 France fr Europe Western Europe
+rgi 2021-02-03 96915278 way RGI, Boulevard Principal, Rangiroa, Tuamotu-Gambier, Polynésie Française, 98775, France aeroway aerodrome 0.101 France fr Europe Western Europe
+grrc 2021-02-03 64554689 node Groupe de Réflexion sur la Recherche Cardiovasculaire, Rue des Colonnes du Trône, Quartier de Picpus, Paris 12e Arrondissement, Paris, Île-de-France, France métropolitaine, 75012, France office foundation 0.001 France fr Europe Western Europe
+macron 2021-02-03 72308788 node Macron, Rue des Pierres du Faing, Sainte-Marguerite, Saint-Dié-des-Vosges, Vosges, Grand Est, France métropolitaine, 88100, France shop sports 0.101 France fr Europe Western Europe
+gsi 2021-02-03 209973060 way Aéroport de Grand-Santi, Avenue Dada René, Grand-Santi, Le Bourg, Grand-Santi, Saint-Laurent-du-Maroni, Guyane, 97340, France aeroway aerodrome 0.245850657848318 France fr Europe Western Europe
+cern 2021-02-03 257664292 relation CERN - Site de Meyrin, Route de Meyrin, Prévessin, Prévessin-Moëns, Gex, Ain, Auvergne-Rhône-Alpes, France métropolitaine, 01280, France office research 0.658916271379286 France fr Europe Western Europe
+islamic state 2021-02-03 49429621 node Islamic, Avenue de Berne, Saint-Maurice, La Rochelle, Charente-Maritime, Nouvelle-Aquitaine, France métropolitaine, 17000, France amenity library 0.101 France fr Europe Western Europe
+university of reims champagne-ardenne 2021-02-03 57788284 node Campus Cesi / Exia Reims, Avenue Robert Schuman, Croix-Rouge, Reims, Marne, Grand Est, France métropolitaine, 51100, France amenity university 0.101 France fr Europe Western Europe
+yök 2021-02-03 68978666 node Yok, Boulevard Jean Jaurès, Les Princes-Marmottan, Boulogne-Billancourt, Hauts-de-Seine, ÃŽle-de-France, France métropolitaine, 92100, France shop variety_store 0.001 France fr Europe Western Europe
+aas 2021-02-03 258712681 relation Aast, Pau, Pyrénées-Atlantiques, Nouvelle-Aquitaine, France métropolitaine, 64460, France boundary administrative 0.654926295858348 France fr Europe Western Europe
+aissa 2021-02-03 258381645 relation Aixe-sur-Vienne, Limoges, Haute-Vienne, Nouvelle-Aquitaine, France métropolitaine, 87700, France boundary administrative 0.492332154360411 France fr Europe Western Europe
+national assembly 2021-02-03 131548816 way Assemblée nationale, Quai d'Orsay, Quartier des Invalides, Paris 7e Arrondissement, Paris, Île-de-France, France métropolitaine, 75007, France tourism attraction 0.709325210617418 France fr Europe Western Europe
+pkp pn 2021-02-03 206141098 way Puka Puka Airport, Pukapuka, Tuamotu-Gambier, Polynésie Française, 98774, France aeroway aerodrome 0.276645429377189 France fr Europe Western Europe
+camarades 2021-02-03 82801014 node Fosse aux Camarades, Saint-Étienne-à -Arnes, Vouziers, Ardennes, Grand Est, France métropolitaine, 08310, France place locality 0.225 France fr Europe Western Europe
+group 2021-02-03 26457996 node Le Group, Larnaldesq, Le Vibal, Millau, Aveyron, Occitanie, France métropolitaine, 12290, France place locality 0.225 France fr Europe Western Europe
+gfp 2021-02-03 112738340 way GFP, 2, Rue Joseph Fourier, Zone d'activités Chartres Est Secteur Le Jardin d’Entreprises, Chartres, Eure-et-Loir, Centre-Val de Loire, France métropolitaine, 28000, France building yes 0.101 France fr Europe Western Europe
+neutron science d 2021-02-03 105884382 way European Photon and Neutron Science Campus, 71, Avenue des Martyrs, Polygone Scientifique, Secteur 1, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38000, France amenity research_institute 0.458083983169266 France fr Europe Western Europe
+science europe 2021-02-03 105173939 way Pôle Science, Chemin du Collège, Parc Europe, Marcq-en-Barœul, Lille, Nord, Hauts-de-France, France métropolitaine, 59700, France building yes 0.201 France fr Europe Western Europe
+labor 2021-02-03 258575224 relation Lavaur, Sarlat-la-Canéda, Dordogne, Nouvelle-Aquitaine, France métropolitaine, 24550, France boundary administrative 0.540322729036538 France fr Europe Western Europe
+cnrs 2021-02-03 109776204 way CNRS, 3, Rue Michel-Ange, Hameau Boileau, Quartier d'Auteuil, Paris 16e Arrondissement, Paris, Île-de-France, France métropolitaine, 75016, France building college 0.651410616675756 France fr Europe Western Europe
+le figaro 2021-02-03 107312918 way Le Figaro, Rue Laffitte, Quartier de la Chaussée-d'Antin, Paris 9e Arrondissement, Paris, Île-de-France, France métropolitaine, 75009, France office newspaper 0.817211661327878 France fr Europe Western Europe
+paris-descartes university 2021-02-03 222560238 way ESIEE Paris, 2, Rond-Point Centre de la Terre, Bois de Grâce, Cité Descartes, Noisy-le-Grand, Torcy, Seine-et-Marne, Île-de-France, France métropolitaine, 93160, France amenity university 0.568804350670811 France fr Europe Western Europe
+france 2021-02-03 258401904 relation France boundary administrative 1.01332644373965 France fr Europe Western Europe
+hec 2021-02-03 115502194 way HEC Paris, Rue Curie, Val d'Albian, Saclay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91400, France amenity college 0.581992451472996 France fr Europe Western Europe
+university paris seine 2021-02-03 228628229 way Université René Descartes - Centre Henri Pieron, Avenue Édouard Vaillant, Point du Jour, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France amenity university 0.101 France fr Europe Western Europe
+paris diderot university 2021-02-03 63739364 node École d'ingénieurs Denis-Diderot, 8, Place Paul Ricœur, Quartier de la Gare, Paris 13e Arrondissement, Paris, Île-de-France, France métropolitaine, 75013, France amenity university 0.285440647712364 France fr Europe Western Europe
+kedge business school 2021-02-03 98027822 way Kedge Business School, Avenue Pey-Berland, Thouars, Talence, Bordeaux, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33400, France amenity college 0.624032054467804 France fr Europe Western Europe
+labour 2021-02-03 50485271 node Le Labour, La Chapelle-du-Lou, La Chapelle du Lou du Lac, Rennes, Ille-et-Vilaine, Bretagne, France métropolitaine, 35360, France place hamlet 0.35 France fr Europe Western Europe
+university of provence 2021-02-03 174797616 way Bibliothèque universitaire, Avenue Valrose, Saint-Maurice, Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, 06108, France amenity library 0.101 France fr Europe Western Europe
+paris-nanterre university 2021-02-03 99926629 way Université Paris Nanterre, 200, Avenue de la République, Quartier de la République, Nanterre, Arrondissement de Nanterre, Hauts-de-Seine, Île-de-France, France métropolitaine, 92000, France amenity university 0.674615563538129 France fr Europe Western Europe
+business gene 2021-02-03 258579003 relation Gené, Erdre-en-Anjou, Segré, Maine-et-Loire, Pays de la Loire, France métropolitaine, 49220, France boundary administrative 0.492852965296036 France fr Europe Western Europe
+university of bordeaux-montaigne 2021-02-03 258587883 relation Université de Bordeaux - Institut d'Administration des Entreprises, Place Pey Berland, Triangle d'Or, Bordeaux Centre, Bordeaux, Gironde, Nouvelle-Aquitaine, France métropolitaine, 33000, France amenity university 0.101 France fr Europe Western Europe
+quintiles 2021-02-03 104302474 way Quintiles, Rue Jean-Dominique Cassini, Parc d'Innovation Technologique d'Illkirch, Illkirch-Graffenstaden, Strasbourg, Bas-Rhin, Grand Est, France métropolitaine, 67400, France building yes 0.101 France fr Europe Western Europe
+hewlett-packard 2021-02-03 100448886 way Hewlett Packard, Eybens, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38320, France landuse industrial 0.4 France fr Europe Western Europe
+le grand k 2021-02-03 214537761 way Le grand K, Rue des Carrières, Kingersheim, Mulhouse, Haut-Rhin, Grand Est, France métropolitaine, 68260, France leisure playground 0.301 France fr Europe Western Europe
+bio 2021-02-03 257951620 relation Bio, Gourdon, Lot, Occitanie, France métropolitaine, 46500, France boundary administrative 0.606009666236864 France fr Europe Western Europe
+ames 2021-02-03 257943096 relation Ames, Béthune, Pas-de-Calais, Hauts-de-France, France métropolitaine, 62190, France boundary administrative 0.670680037787526 France fr Europe Western Europe
+epure 2021-02-03 232595073 way Epure, Allée Léopold Sédar Senghor, Gerland, Lyon 7e Arrondissement, Lyon, Métropole de Lyon, Circonscription départementale du Rhône, Auvergne-Rhône-Alpes, France métropolitaine, 69007, France building office 0.101 France fr Europe Western Europe
+sun 2021-02-03 257932113 relation Île-de-Sein, Quimper, Finistère, Bretagne, France métropolitaine, 29990, France place island 0.460372709160497 France fr Europe Western Europe
+interphone 2021-02-03 71822924 node Interphone, 83, Avenue Albert Petit, Résidence du Port Galand, Bagneux, Antony, Hauts-de-Seine, Île-de-France, France métropolitaine, 92220, France amenity internet_cafe 0.101 France fr Europe Western Europe
+huawei technologies 2021-02-03 57899451 node Huawei Technologies, Quai du Point du Jour, Point du Jour, Boulogne-Billancourt, Hauts-de-Seine, Île-de-France, France métropolitaine, 92100, France office company 0.201 France fr Europe Western Europe
+university of nice 2021-02-03 174797616 way Bibliothèque universitaire, Avenue Valrose, Saint-Maurice, Nice, Alpes-Maritimes, Provence-Alpes-Côte d'Azur, France métropolitaine, 06108, France amenity library 0.101 France fr Europe Western Europe
+asco 2021-02-03 258756793 relation Asco, Corte, Haute-Corse, Corse, France métropolitaine, 20276, France boundary administrative 0.601020559978481 France fr Europe Western Europe
+university of grenoble 2021-02-03 22506396 node Gières Gare Univ, Gières - Gare - Universités, Chamandier, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38610, France amenity bicycle_rental 0.101 France fr Europe Western Europe
+oa 2021-02-03 258047884 relation Aube, Grand Est, France métropolitaine, France boundary administrative 0.608913204678366 France fr Europe Western Europe
+university of paris-saclay 2021-02-03 259420663 relation Université Paris-Saclay à Palaiseau, 10;2, Boulevard Thomas Gobert, Rocher de Lozère, Les Taupiniaux, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91120, France amenity university 0.201 France fr Europe Western Europe
+deme 2021-02-03 258963489 relation La Dême, Indre-et-Loire, Centre-Val de Loire, France métropolitaine, France waterway river 0.3 France fr Europe Western Europe
+université grenoble alpes 2021-02-03 44630717 node Université Grenoble Alpes, Rue de la Piscine, Domaine universitaire de Grenoble, Gières, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, France tourism information 0.301 France fr Europe Western Europe
+csti 2021-02-03 71480460 node CSTI, Rampe de Zuoaves, Porette, Faubourg Scarafaglie, Corte, Haute-Corse, Corse, France métropolitaine, 20250, France office association 0.101 France fr Europe Western Europe
+sanofi 2021-02-03 135101682 way Sanofi, Vitry Sud - Ardoines, Vitry-sur-Seine, Arrondissement de L'Haÿ-les-Roses, Val-de-Marne, Île-de-France, France métropolitaine, 94400, France landuse industrial 0.3 France fr Europe Western Europe
+university of cergy-pontoise 2021-02-03 254258149 way CY Cergy Paris Université - Site de Saint Martin, 2, Avenue François Mitterrand, Saint-Martin, Pontoise, Val-d'Oise, Île-de-France, France métropolitaine, 95302, France building university 0.201 France fr Europe Western Europe
+inria 2021-02-03 258818694 relation INRIA, 655, Avenue de l'Europe, Innovallée Montbonnot, Montbonnot-Saint-Martin, Grenoble, Isère, Auvergne-Rhône-Alpes, France métropolitaine, 38330, France office research 0.49425812326797 France fr Europe Western Europe
+paris-saclay university 2021-02-03 79902045 node Institut Pascal de l'université Paris-Saclay, 530, Rue André Rivière, Campus Urbain de Paris-Saclay, Corbeville, Orsay, Palaiseau, Essonne, Île-de-France, France métropolitaine, 91405, France amenity university 0.608908372801738 France fr Europe Western Europe
+ion 2021-02-03 257669218 relation Yonne, Bourgogne-Franche-Comté, France métropolitaine, France boundary administrative 0.616370240837996 France fr Europe Western Europe
+clia 2021-02-03 148195673 way Rue des Clia-Cliats, La Vieille-Loye, Dole, Jura, Bourgogne-Franche-Comté, France métropolitaine, 39380, France highway unclassified 0.2 France fr Europe Western Europe
+tsca 2021-02-03 79543194 node TSCA, Grande Rue Nazareth, Capitole, Toulouse Centre, Toulouse, Haute-Garonne, Occitanie, France métropolitaine, 31000, France amenity driving_school 0.101 France fr Europe Western Europe
+sers 2021-02-03 258412644 relation Sers, Argelès-Gazost, Hautes-Pyrénées, Occitanie, France métropolitaine, 65120, France boundary administrative 0.627233681006203 France fr Europe Western Europe
+gabon 2021-02-03 257869964 relation Gabon boundary administrative 0.777596981965525 Gabon ga Africa Middle Africa
+st andrews 2021-02-03 114614 node St Andrews, Fife, Scotland, KY16 9PA, United Kingdom place town 0.693656743140345 United Kingdom gb Europe Northern Europe
+university of warwick 2021-02-03 258669080 relation University of Warwick, Evesham Walk, Cannon Park, Coventry, West Midlands Combined Authority, West Midlands, England, CV4 7DT, United Kingdom amenity university 0.301 United Kingdom gb Europe Northern Europe
+university of dundee 2021-02-03 102764772 way University of Dundee, Ure Street, Blackness, Dundee, Dundee City, Scotland, DD1 5JA, United Kingdom amenity university 0.774336051043759 United Kingdom gb Europe Northern Europe
+marine stewardship council 2021-02-03 111557662 way Marine Stewardship Council, Snow Hill Court, Smithfield, City of London, Greater London, England, EC1A 2DQ, United Kingdom office ngo 0.677478932777613 United Kingdom gb Europe Northern Europe
+diabetes center 2021-02-03 84497499 way Diabetes Centre, Heath Road, Rushmere, Ipswich, Suffolk, East of England, England, IP4 5SS, United Kingdom building hospital 0.101 United Kingdom gb Europe Northern Europe
+university of lancaster 2021-02-03 95263873 way Lancaster University, Scotforth Road, Lower Burrow, Hala, Bailrigg, Lancaster, Lancashire, North West England, England, LA2 0PH, United Kingdom amenity university 0.201 United Kingdom gb Europe Northern Europe
+university of aberdeen 2021-02-03 259116297 relation University of Aberdeen, College Bounds, Old Aberdeen, Aberdeen City, Scotland, AB24 3EB, United Kingdom amenity university 0.823940959797236 United Kingdom gb Europe Northern Europe
+wellcome trust centre for human genetics 2021-02-03 24717265 node Wellcome Trust Centre for Human Genetics, Roosevelt Drive, Highfield, Lye Valley, Oxford, Oxfordshire, South East, England, OX3 7BN, United Kingdom place house 0.932422207003221 United Kingdom gb Europe Northern Europe
+association of the british pharmaceutical industry 2021-02-03 122670685 way Association of the British Pharmaceutical Industry, 12, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2DY, United Kingdom building yes 0.601 United Kingdom gb Europe Northern Europe
+u k 2021-02-03 258411454 relation United Kingdom boundary administrative 1.07237801328373 United Kingdom gb Europe Northern Europe
+university of bradford 2021-02-03 107611269 way University of Bradford, Tumbling Hill Street, Great Horton, Bradford, West Yorkshire, Yorkshire and the Humber, England, BD7 1DJ, United Kingdom amenity university 0.7633898027116 United Kingdom gb Europe Northern Europe
+university of birmingham 2021-02-03 70139772 node University of Birmingham, Ring Road North, Bournbrook, Metchley, Birmingham, West Midlands Combined Authority, West Midlands, England, B15 2TN, United Kingdom tourism information 0.301 United Kingdom gb Europe Northern Europe
+nec 2021-02-03 257864413 relation National Exhibition Centre, Station Way, Bickenhill and Marston Green, Birmingham, West Midlands Combined Authority, West Midlands, England, B40 1PA, United Kingdom amenity exhibition_center 0.397362929796699 United Kingdom gb Europe Northern Europe
+london school of hygiene & tropical medicine 2021-02-03 185180502 way London School of Hygiene and Tropical Medicine, Gower Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7HT, United Kingdom amenity university 1.04105233650125 United Kingdom gb Europe Northern Europe
+wellcome trust centre for human genetics in oxford 2021-02-03 24717265 node Wellcome Trust Centre for Human Genetics, Roosevelt Drive, Highfield, Lye Valley, Oxford, Oxfordshire, South East, England, OX3 7BN, United Kingdom place house 1.13242220700322 United Kingdom gb Europe Northern Europe
+imperial college london 2021-02-03 301718758 relation Imperial College London, Exhibition Road, Knightsbridge, City of Westminster, London, Greater London, England, SW7 2AZ, United Kingdom amenity university 0.795213557010066 United Kingdom gb Europe Northern Europe
+department 2021-02-03 88415175 way The Department, Lawton Street, Ropewalks, Liverpool, North West England, England, L1 1FS, United Kingdom building yes 0.101 United Kingdom gb Europe Northern Europe
+research councils uk 2021-02-03 258509732 relation UK Research Councils, North Star Avenue, Gorse Hill, Central Swindon North, Swindon, South West England, England, SN2 1ET, United Kingdom building office 0.301 United Kingdom gb Europe Northern Europe
+whitehall 2021-02-03 146097 node Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2NH, United Kingdom place locality 0.601129483245782 United Kingdom gb Europe Northern Europe
+climatic research unit 2021-02-03 99663934 way Climatic Research Unit (CRU), Chancellors Drive, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom building yes 0.627161274702289 United Kingdom gb Europe Northern Europe
+scotland 2021-02-03 257273413 relation Scotland, United Kingdom boundary administrative 0.878974525409939 United Kingdom gb Europe Northern Europe
+leeds 2021-02-03 258136264 relation Leeds, West Yorkshire, Yorkshire and the Humber, England, United Kingdom boundary administrative 0.728801062334147 United Kingdom gb Europe Northern Europe
+university autonomy 2021-02-03 118976490 way University of Salford, Orange, MediaCityUK, Salford Quays, Eccles, Salford, Greater Manchester, North West England, England, M50 2HF, United Kingdom amenity university 0.101 United Kingdom gb Europe Northern Europe
+charity cancer research uk 2021-02-03 72590969 node Cancer Research UK (charity shop), East Street, Shoreham-by-Sea, Adur, West Sussex, South East, England, BN43 5ZE, United Kingdom shop clothes 0.401 United Kingdom gb Europe Northern Europe
+space research centre 2021-02-03 104827767 way Airbus Defence and Space (DMCii), 60, Priestley Road, Surrey Research Park, Worplesdon, Wood Street, Guildford, Surrey, South East, England, GU2 7AG, United Kingdom office company 0.201 United Kingdom gb Europe Northern Europe
+iwc 2021-02-03 64405196 node IWC, 138, New Bond Street, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1S 2SE, United Kingdom shop watches 0.101 United Kingdom gb Europe Northern Europe
+university college london — 2021-02-03 259450693 relation University College London, Endsleigh Gardens, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0EB, United Kingdom amenity university 0.615434238632773 United Kingdom gb Europe Northern Europe
+defence ministry 2021-02-03 98588582 way Ministry of Defence, Horse Guards Avenue, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2HB, United Kingdom military office 0.731875732226719 United Kingdom gb Europe Northern Europe
+university of strathclyde 2021-02-03 91823946 way University of Strathclyde, High Street, Townhead, Glasgow, Glasgow City, Scotland, G4 0QT, United Kingdom amenity university 0.780337454409521 United Kingdom gb Europe Northern Europe
+information commissioner's office 2021-02-03 19001980 node Information Commissioner's Office, Water Lane, Fulshaw Park, Wilmslow, Cheshire East, North West England, England, SK9 5AF, United Kingdom amenity office 0.401 United Kingdom gb Europe Northern Europe
+cambridge university press 2021-02-03 177748716 way Cambridge University Press, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 8BS, United Kingdom landuse industrial 0.975395195503227 United Kingdom gb Europe Northern Europe
+royal greenwich observatory 2021-02-03 156694701 way Royal Observatory Greenwich, Blackheath Avenue, East Greenwich, Royal Borough of Greenwich, London, Greater London, England, SE10 8XJ, United Kingdom tourism museum 0.796673547671832 United Kingdom gb Europe Northern Europe
+health protection agency 2021-02-03 17913167 node Health Protection Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom office government 0.301 United Kingdom gb Europe Northern Europe
+armagh observatory 2021-02-03 192758084 way Armagh Observatory, College Hill, Armagh, County Armagh, Northern Ireland, BT61 9DG, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+middlesex university 2021-02-03 97180538 way Middlesex University, The Burroughs, Hendon Central, London Borough of Barnet, London, Greater London, England, NW4 4LA, United Kingdom amenity university 0.672198296881392 United Kingdom gb Europe Northern Europe
+university of nottingham 2021-02-03 92101266 way University of Nottingham, University Boulevard, Dunkirk, City of Nottingham, Nottinghamshire, East Midlands, England, NG7 2RD, United Kingdom amenity university 0.828526304922465 United Kingdom gb Europe Northern Europe
+international institute for strategic studies 2021-02-03 112205362 way International Institute for Strategic Studies, 6, Temple Place, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 2PG, United Kingdom office research 0.893742367962228 United Kingdom gb Europe Northern Europe
+university college london 2021-02-03 259450693 relation University College London, Endsleigh Gardens, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0EB, United Kingdom amenity university 0.615434238632773 United Kingdom gb Europe Northern Europe
+uk ministry of defence 2021-02-03 98588582 way Ministry of Defence, Horse Guards Avenue, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2HB, United Kingdom military office 0.831875732226719 United Kingdom gb Europe Northern Europe
+amnesty international 2021-02-03 299249192 way Amnesty International, Magdalen Road, Robin Hood, Oxford, Oxfordshire, South East, England, OX4 1RQ, United Kingdom office association 0.201 United Kingdom gb Europe Northern Europe
+department for education 2021-02-03 97291141 way Department for Education, 20, Great Smith Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3BT, United Kingdom office government 0.301 United Kingdom gb Europe Northern Europe
+wellcome genome campus 2021-02-03 84754756 way Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, United Kingdom landuse commercial 0.56358119422997 United Kingdom gb Europe Northern Europe
+climatic change 2021-02-03 99663934 way Climatic Research Unit (CRU), Chancellors Drive, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom building yes 0.427161274702289 United Kingdom gb Europe Northern Europe
+windsor 2021-02-03 94155375 way Windsor Castle, Thames Street, Clewer New Town, Eton, Windsor and Maidenhead, South East, England, SL4 1PR, United Kingdom tourism attraction 0.649537394811591 United Kingdom gb Europe Northern Europe
+innovate uk 2021-02-03 176517550 way Innovate, Chartermark Way, Colburn Business Park, Colburn, Richmondshire, North Yorkshire, Yorkshire and the Humber, England, DL9 4QJ, United Kingdom building commercial 0.101 United Kingdom gb Europe Northern Europe
+british library 2021-02-03 84833518 way British Library, 96, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2DB, United Kingdom tourism attraction 0.769763707839348 United Kingdom gb Europe Northern Europe
+wellcome sanger 2021-02-03 259312934 relation Wellcome Trust Sanger Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SA, United Kingdom amenity research_institute 0.611524674526993 United Kingdom gb Europe Northern Europe
+energy and industrial strategy 2021-02-03 154731847 way Business, Energy & Industrial Strategy, 1, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1H 0ET, United Kingdom office government 0.814108902120048 United Kingdom gb Europe Northern Europe
+csa 2021-02-03 112088848 way Colonsay Airport, B8086, Lower Kilchattan, Scalasaig, Argyll and Bute, Scotland, PA61 7YR, United Kingdom aeroway aerodrome 0.358888290194715 United Kingdom gb Europe Northern Europe
+isro satellite centre 2021-02-03 54207550 node The Satellite Centre, Westgate Road, Arthur's Hill, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE4 6AR, United Kingdom shop yes 0.201 United Kingdom gb Europe Northern Europe
+institute of cancer research 2021-02-03 175592054 way Institute of Cancer Research, 237, Fulham Road, The Boltons, Brompton, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW3 6HS, United Kingdom building hospital 0.810743518323823 United Kingdom gb Europe Northern Europe
+the nih 2021-02-03 257838544 relation Northern Ireland, United Kingdom boundary administrative 0.810837420058351 United Kingdom gb Europe Northern Europe
+edge hill university 2021-02-03 132503554 way Edge Hill University, St Helens Road, Ormskirk, West Lancashire, Lancashire, North West England, England, L39 4QP, United Kingdom amenity university 0.716230582936297 United Kingdom gb Europe Northern Europe
+oxford brookes university 2021-02-03 87046127 way Oxford Brookes University Gipsy Lane Site, Headington Road, Highfield, Headington, Oxford, Oxfordshire, South East, England, OX3 0BL, United Kingdom amenity university 0.754593314283165 United Kingdom gb Europe Northern Europe
+ucl hospital 2021-02-03 97008546 way Petrie Museum of Egyptian Archeology, Malet Place, St Pancras, London Borough of Camden, London, Greater London, England, WC1E 6BT, United Kingdom tourism museum 0.404546165234516 United Kingdom gb Europe Northern Europe
+lsst 2021-02-03 110398638 way LSST, Arncott, Cherwell, Oxfordshire, South East, England, United Kingdom landuse military 0.3 United Kingdom gb Europe Northern Europe
+graphene engineering innovation centre 2021-02-03 184596819 way Graphene Engineering Innovation Centre, Sackville Street, City Centre, Manchester, Greater Manchester, North West England, England, M1 7DN, United Kingdom building construction 0.401 United Kingdom gb Europe Northern Europe
+coventry uk 2021-02-03 257209281 relation Coventry, West Midlands Combined Authority, West Midlands, England, United Kingdom boundary administrative 0.692751900650216 United Kingdom gb Europe Northern Europe
+royal society a 2021-02-03 3796847 node The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom building yes 0.947225834784319 United Kingdom gb Europe Northern Europe
+nih 2021-02-03 257838544 relation Northern Ireland, United Kingdom boundary administrative 0.710837420058351 United Kingdom gb Europe Northern Europe
+royal observatory 2021-02-03 156694701 way Royal Observatory Greenwich, Blackheath Avenue, East Greenwich, Royal Borough of Greenwich, London, Greater London, England, SE10 8XJ, United Kingdom tourism museum 0.696673547671832 United Kingdom gb Europe Northern Europe
+national physical laboratory 2021-02-03 178419620 way National Physical Laboratory, Hampton Hill, London Borough of Richmond upon Thames, London, Greater London, England, United Kingdom landuse commercial 0.5 United Kingdom gb Europe Northern Europe
+saatchi 2021-02-03 84638610 way Saatchi Gallery, King's Road, Hans Town, Chelsea, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW3 4RY, United Kingdom tourism gallery 0.537540837084501 United Kingdom gb Europe Northern Europe
+swansea university 2021-02-03 4265317 node Swansea University, Mumbles Road, Blackpill, Sketty, Swansea, Cymru / Wales, SA2 0AX, United Kingdom highway bus_stop 0.201 United Kingdom gb Europe Northern Europe
+interior department 2021-02-03 88415175 way The Department, Lawton Street, Ropewalks, Liverpool, North West England, England, L1 1FS, United Kingdom building yes 0.101 United Kingdom gb Europe Northern Europe
+high voltage laboratory 2021-02-03 110289562 way High Voltage Laboratory, University Crescent, Highfield, Southampton, South East, England, SO17 1TR, United Kingdom building yes 0.301 United Kingdom gb Europe Northern Europe
+royal society b 1 2021-02-03 3796847 node The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom building yes 0.947225834784319 United Kingdom gb Europe Northern Europe
+leicester university 2021-02-03 162085793 way University of Leicester, University Road, Highfields, Leicester, City of Leicester, East Midlands, England, LE1 7RH, United Kingdom amenity university 0.695552033321719 United Kingdom gb Europe Northern Europe
+university of manchester 2021-02-03 122339635 way Pendulum Hotel, Sackville Street, City Centre, Manchester, Greater Manchester, North West England, England, M1 3BB, United Kingdom tourism hotel 0.101 United Kingdom gb Europe Northern Europe
+scarborough 2021-02-03 258153305 relation Scarborough, North Yorkshire, Yorkshire and the Humber, England, United Kingdom boundary administrative 0.610764750724671 United Kingdom gb Europe Northern Europe
+bangor university 2021-02-03 116565795 way Bangor University, College Road Site, Garth Road, Garth, Bangor, Gwynedd, Cymru / Wales, LL57 2RP, United Kingdom amenity university 0.201 United Kingdom gb Europe Northern Europe
+washington university genome center 2021-02-03 206300612 way University of East Anglia, Wilberforce Road, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom amenity university 0.604172803149122 United Kingdom gb Europe Northern Europe
+house of lords 2021-02-03 6178647 node House of Lords, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 0AA, United Kingdom tourism attraction 0.915610657194478 United Kingdom gb Europe Northern Europe
+royal dutch shell 2021-02-03 18968246 node Send Shell Petrol Station, Portsmouth Road, Send, Guildford, Surrey, South East, England, GU23 7JY, United Kingdom amenity fuel 0.101 United Kingdom gb Europe Northern Europe
+university college 2021-02-03 115937498 way University College, Logic Lane, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4EX, United Kingdom amenity university 0.683844730994415 United Kingdom gb Europe Northern Europe
+crick institute 2021-02-03 121182065 way The Francis Crick Institute, 1, Midland Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 1AT, United Kingdom amenity research_institute 0.584723197268746 United Kingdom gb Europe Northern Europe
+bedford 2021-02-03 108624 node Bedford, East of England, England, MK40 1SU, United Kingdom place town 0.611289942268227 United Kingdom gb Europe Northern Europe
+bristol university 2021-02-03 170738703 way Bristol City Museum & Art Gallery, University Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS8 1RL, United Kingdom tourism museum 0.547065093488253 United Kingdom gb Europe Northern Europe
+antarctic survey 2021-02-03 258339816 relation British Antarctic Survey, High Cross, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0ET, United Kingdom office research 0.201 United Kingdom gb Europe Northern Europe
+department for international trade 2021-02-03 98032514 way Department for International Trade, 3, Whitehall Place, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2AW, United Kingdom office government 0.401 United Kingdom gb Europe Northern Europe
+slim jims 2021-02-03 11297848 node Slim Jim's, Whitecross Place, Bishopsgate, City of London, Greater London, England, EC2M 2PF, United Kingdom leisure sports_centre 0.101 United Kingdom gb Europe Northern Europe
+russell group 2021-02-03 23799035 node Russell Group Limited, 2a, Commerce Square, Lace Market, St Ann's, City of Nottingham, East Midlands, England, NG1 1HS, United Kingdom office company 0.201 United Kingdom gb Europe Northern Europe
+surrey satellite technology ltd 2021-02-03 42885695 node Surrey Satellite Technology Ltd, Woolmer Way, Woolmer Trading Estate, Whitehill, Bordon, East Hampshire, Hampshire, South East, England, GU35 9QE, United Kingdom building industrial 0.401 United Kingdom gb Europe Northern Europe
+university 2021-02-03 115937498 way University College, Logic Lane, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4EX, United Kingdom amenity university 0.583844730994415 United Kingdom gb Europe Northern Europe
+civil aviation 2021-02-03 109886796 way Civil Aviation, East Fortune Circuit, Crauchie, East Lothian, Scotland, EH39 5LF, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+loughborough 2021-02-03 105872 node Loughborough, Charnwood, Leicestershire, East Midlands, England, LE11 5BJ, United Kingdom place town 0.577635896973777 United Kingdom gb Europe Northern Europe
+university of bristol 2021-02-03 50251699 node University of Bristol, Woodland Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS2, United Kingdom tourism information 0.301 United Kingdom gb Europe Northern Europe
+british academy 2021-02-03 58085213 node British Academy, The Mall, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1, United Kingdom office ngo 0.201 United Kingdom gb Europe Northern Europe
+research uk 2021-02-03 175592054 way Institute of Cancer Research, 237, Fulham Road, The Boltons, Brompton, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW3 6HS, United Kingdom building hospital 0.510743518323823 United Kingdom gb Europe Northern Europe
+4th circuit 2021-02-03 2598024 way 4, The Circuit, Fulshaw Park, Wilmslow, Chorley, Cheshire East, North West England, England, SK9 6DB, United Kingdom place house 0.101 United Kingdom gb Europe Northern Europe
+international whaling commission 2021-02-03 130872832 way International Whaling Commission, Station Road, Impington, South Cambridgeshire, Cambridgeshire, East of England, England, CB24 9LF, United Kingdom building yes 0.301 United Kingdom gb Europe Northern Europe
+polar institute 2021-02-03 86946864 way Scott Polar Research Institute (SPRI), Lensfield Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 1ER, United Kingdom building university 0.609070137722352 United Kingdom gb Europe Northern Europe
+women's hospital 2021-02-03 4341641 node THE WOMEN'S HOSPITAL, Crown Street, Edge Hill, Liverpool, North West England, England, L7, United Kingdom highway bus_stop 0.301 United Kingdom gb Europe Northern Europe
+universities scotland 2021-02-03 187787432 way Universities of Glasgow and Strathclyde Air Squadron, 12, Park Circus Lane, Park District, Glasgow, Glasgow City, Scotland, G3 6AX, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+soa 2021-02-03 103007279 way Soa, Argyll and Bute, Scotland, United Kingdom place island 0.425 United Kingdom gb Europe Northern Europe
+dla piper 2021-02-03 26548047 node DLA Piper, 101, Barbirolli Square, City Centre, Manchester, Greater Manchester, North West England, England, M2 3BG, United Kingdom office lawyer 0.201 United Kingdom gb Europe Northern Europe
+trinity college 2021-02-03 116907164 way Trinity College, Parks Road, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 3PA, United Kingdom amenity university 0.67805930713623 United Kingdom gb Europe Northern Europe
+mrc cognition and brain sciences unit 2021-02-03 100156548 way MRC Cognition and Brain Sciences Unit, 15, Chaucer Road, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 7EF, United Kingdom building university 0.835968355602442 United Kingdom gb Europe Northern Europe
+newcastle 2021-02-03 257800552 relation Newcastle upon Tyne, Tyne and Wear, North East England, England, United Kingdom boundary administrative 0.720469585639904 United Kingdom gb Europe Northern Europe
+ucl 2021-02-03 97008546 way Petrie Museum of Egyptian Archeology, Malet Place, St Pancras, London Borough of Camden, London, Greater London, England, WC1E 6BT, United Kingdom tourism museum 0.404546165234516 United Kingdom gb Europe Northern Europe
+uk department for international development 2021-02-03 98247145 way Department for International Development, 22-24, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2WH, United Kingdom office government 0.401 United Kingdom gb Europe Northern Europe
+aic 2021-02-03 202294384 way aic, East Of England Way, Orton Northgate, Orton Waterville, Peterborough, City of Peterborough, East of England, England, PE2 6HA, United Kingdom building yes 0.111 United Kingdom gb Europe Northern Europe
+uk met office 2021-02-03 259459361 relation The Met Office, Fitzroy Road, Met Office, Monkerton, Exeter, Devon, South West England, England, EX1 3PB, United Kingdom office weather 0.660932371570306 United Kingdom gb Europe Northern Europe
+uk national health service 2021-02-03 136097374 way Boots, 40, Hampstead High Street, Vale of Health, Belsize Park, London Borough of Camden, London, Greater London, England, NW3 1QE, United Kingdom shop chemist 0.101 United Kingdom gb Europe Northern Europe
+king's college london 2021-02-03 258760701 relation King's College London, Strand Campus, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 2LS, United Kingdom amenity university 0.967778517860205 United Kingdom gb Europe Northern Europe
+university of leeds 2021-02-03 107623156 way University of Leeds, Woodhouse Lane, Woodhouse, Leeds, West Yorkshire, Yorkshire and the Humber, England, LS2 3ED, United Kingdom amenity university 0.301 United Kingdom gb Europe Northern Europe
+ministry of defence 2021-02-03 98588582 way Ministry of Defence, Horse Guards Avenue, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2HB, United Kingdom military office 0.831875732226719 United Kingdom gb Europe Northern Europe
+uk national institute of economic and social research 2021-02-03 204474470 way Institute Of Economic and Social Research, Dean Trench Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3HL, United Kingdom building yes 0.601 United Kingdom gb Europe Northern Europe
+royal society for the prevention of cruelty to animals 2021-02-03 162454414 way Scarborough & District RSPCA, Albemarle back Road, The Old Town, Scarborough, North Yorkshire, Yorkshire and the Humber, England, YO11 1YA, United Kingdom building retail 0.201 United Kingdom gb Europe Northern Europe
+elsevier 2021-02-03 258202489 relation Elsevier, The Boulevard, Oxford Spires Business Park, Kidlington, Thrupp, Cherwell, Oxfordshire, South East, England, OX5 1NZ, United Kingdom building yes 0.101 United Kingdom gb Europe Northern Europe
+central institute of mental health 2021-02-03 140482817 way Institute of Mental Health, Triumph Road, Wollaton Park, City of Nottingham, East Midlands, England, NG8 1FD, United Kingdom building yes 0.401 United Kingdom gb Europe Northern Europe
+glasgow university 2021-02-03 96372396 way University of Glasgow, Byres Road, Yorkhill, Dowanhill, Glasgow, Glasgow City, Scotland, G12 8TD, United Kingdom amenity university 0.762549854310082 United Kingdom gb Europe Northern Europe
+surrey 2021-02-03 258959916 relation Surrey, South East, England, United Kingdom boundary ceremonial 0.732622270075043 United Kingdom gb Europe Northern Europe
+wellcome sanger institute 2021-02-03 259312934 relation Wellcome Trust Sanger Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SA, United Kingdom amenity research_institute 0.711524674526993 United Kingdom gb Europe Northern Europe
+london school of economics 2021-02-03 258598818 relation London School of Economics and Political Science, Houghton Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AE, United Kingdom amenity university 0.988176875647945 United Kingdom gb Europe Northern Europe
+diamond light source 2021-02-03 258557940 relation Diamond Light Source Synchrotron, Road Five, Chilton, Vale of White Horse, Oxfordshire, South East, England, OX11 0PW, United Kingdom amenity research_institute 0.301 United Kingdom gb Europe Northern Europe
+institute for fiscal studies 2021-02-03 50576944 node Institute for Fiscal Studies, 7, Store Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7DB, United Kingdom office ngo 0.70799018260571 United Kingdom gb Europe Northern Europe
+astronomical society 2021-02-03 2216386 node Royal Astronomical Society, Burlington Arcade, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1J 0ET, United Kingdom office association 0.694024211333493 United Kingdom gb Europe Northern Europe
+uk wellcome trust 2021-02-03 165545925 way Wellcome Trust, 215, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom building yes 0.630084056292374 United Kingdom gb Europe Northern Europe
+nhs trust 2021-02-03 84981127 way Cambridge Biomedical Campus, Hills Road (cycleway), Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 8QE, United Kingdom amenity hospital 0.283827688081076 United Kingdom gb Europe Northern Europe
+better together 2021-02-03 24364444 node Better Together, Upper Hope Place, Georgian Quarter, Liverpool, North West England, England, L7, United Kingdom tourism artwork 0.201 United Kingdom gb Europe Northern Europe
+international institute for environment and development 2021-02-03 42420083 node International Institute for Environment and Development, 4, Hanover Street, New Town, New Town/Broughton, City of Edinburgh, Scotland, EH2 2EN, United Kingdom office yes 0.601 United Kingdom gb Europe Northern Europe
+st pancras international 2021-02-03 45307830 node London St. Pancras International, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2QS, United Kingdom railway station 0.798004419460758 United Kingdom gb Europe Northern Europe
+national association of head teachers 2021-02-03 64457372 node National Association of Head Teachers, Boltro Road, Lucastes, Haywards Heath, Mid Sussex, West Sussex, South East, England, RH16 1RG, United Kingdom office union 0.501 United Kingdom gb Europe Northern Europe
+dod 2021-02-03 45654910 node The Dod, Dumfries and Galloway, Scotland, DG4 6EZ, United Kingdom natural peak 0.4 United Kingdom gb Europe Northern Europe
+independent living 2021-02-03 48022150 node Independent Living, Heworth Road, Heworth, York, Yorkshire and the Humber, England, YO31 0AD, United Kingdom shop mobility 0.201 United Kingdom gb Europe Northern Europe
+royal free hospital 2021-02-03 249802441 way Royal Free Hospital, Haverstock Hill, Belsize Park, London Borough of Camden, London, Greater London, England, NW3 4PT, United Kingdom amenity hospital 0.683512305679517 United Kingdom gb Europe Northern Europe
+heriot-watt university 2021-02-03 84948594 way Heriot-Watt University, A71, Currie, City of Edinburgh, Scotland, EH14 4AS, United Kingdom amenity university 0.769075118742827 United Kingdom gb Europe Northern Europe
+oxitec 2021-02-03 59520743 node Oxitec, 65 - 71, Jubilee Avenue, Milton Park, Milton, Vale of White Horse, Oxfordshire, South East, England, OX14 4RW, United Kingdom office company 0.101 United Kingdom gb Europe Northern Europe
+wellcome collection 2021-02-03 26295657 node Wellcome Collection, 183, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom tourism museum 0.573149623765757 United Kingdom gb Europe Northern Europe
+rolls-royce 2021-02-03 105617306 way Rolls-Royce, Raynesway, Alvaston, Derby, East Midlands, England, DE21 7BF, United Kingdom man_made works 0.424193162948078 United Kingdom gb Europe Northern Europe
+panasonic avionics corporation 2021-02-03 134628820 way Panasonic Avionics Corporation, Heron Drive, Heathrow West Business Park, Langley, Slough, South East, England, SL3 8XP, United Kingdom building commercial 0.301 United Kingdom gb Europe Northern Europe
+npl 2021-02-03 253462143 way NPL, Pavilion Road, National Physical Laboratory, Hampton Hill, London Borough of Richmond upon Thames, London, Greater London, England, TW11 0NL, United Kingdom leisure pitch 0.101 United Kingdom gb Europe Northern Europe
+medicines and healthcare products regulatory agency 2021-02-03 17808193 node Medicines and Healthcare Products Regulatory Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom office government 0.929555066820797 United Kingdom gb Europe Northern Europe
+grantham research institute 2021-02-03 41936693 node Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom office research 0.572343749103071 United Kingdom gb Europe Northern Europe
+astellas pharma 2021-02-03 147148121 way Astellas Pharma Europe, 2000, Hillswood Drive, Ottershaw, Runnymede, Surrey, South East, England, KT16 0RS, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+university of leicester 2021-02-03 162085793 way University of Leicester, University Road, Highfields, Leicester, City of Leicester, East Midlands, England, LE1 7RH, United Kingdom amenity university 0.795552033321719 United Kingdom gb Europe Northern Europe
+bank of england 2021-02-03 257920631 relation Bank of England, 8AH, Threadneedle Street, Bishopsgate, City of London, Greater London, England, EC2R 8AH, United Kingdom tourism attraction 0.849471203478208 United Kingdom gb Europe Northern Europe
+united kingdom 2021-02-03 258411454 relation United Kingdom boundary administrative 1.07237801328373 United Kingdom gb Europe Northern Europe
+northumbria university 2021-02-03 4155510 node Northumbria University, Sandyford Road, Haymarket, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE1 8JG, United Kingdom highway bus_stop 0.201 United Kingdom gb Europe Northern Europe
+building and housing research center 2021-02-03 155007660 way South Northants Housing Trust, Burcote Road, Towcester Research Park, Towcester, South Northamptonshire, Northamptonshire, East Midlands, England, NN12 6AZ, United Kingdom building commercial 0.301 United Kingdom gb Europe Northern Europe
+university of glasgow 2021-02-03 96372396 way University of Glasgow, Byres Road, Yorkhill, Dowanhill, Glasgow, Glasgow City, Scotland, G12 8TD, United Kingdom amenity university 0.862549854310082 United Kingdom gb Europe Northern Europe
+school of public health 2021-02-03 246254593 way School of Public Health, White City Estate, London Borough of Hammersmith and Fulham, London, Greater London, England, United Kingdom landuse construction 0.6 United Kingdom gb Europe Northern Europe
+university of cambridge 2021-02-03 85738792 way Fitzwilliam Museum, Trumpington Street, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 1RB, United Kingdom tourism museum 0.667686595449203 United Kingdom gb Europe Northern Europe
+malaysia airlines 2021-02-03 82530882 node Malaysia Airlines, 247-249, Cromwell Road, The Boltons, Earl's Court, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW5 9GA, United Kingdom office company 0.201 United Kingdom gb Europe Northern Europe
+loughborough university 2021-02-03 87123611 way Loughborough University, Epinal Way, Loughborough, Charnwood, Leicestershire, East Midlands, England, LE11 3QN, United Kingdom amenity university 0.685315627887998 United Kingdom gb Europe Northern Europe
+imperial college london and university college london 2021-02-03 301718758 relation Imperial College London, Exhibition Road, Knightsbridge, City of Westminster, London, Greater London, England, SW7 2AZ, United Kingdom amenity university 1.09521355701007 United Kingdom gb Europe Northern Europe
+royal academy of engineering 2021-02-03 42032172 node Royal Academy of Engineering, 3, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5DG, United Kingdom building yes 0.401 United Kingdom gb Europe Northern Europe
+tern 2021-02-03 240534072 way Tern, Tenby, Pembrokeshire, Cymru / Wales, United Kingdom place neighbourhood 0.35 United Kingdom gb Europe Northern Europe
+university of hertfordshire 2021-02-03 199549944 way University of Hertfordshire, de Havilland Campus, St. Albans Road West, Nast Hyde, Hatfield, Welwyn Hatfield, Hertfordshire, East of England, England, AL10 9SQ, United Kingdom amenity university 0.301 United Kingdom gb Europe Northern Europe
+giffords 2021-02-03 153526702 way Giffords, Haverhill Road, Stapleford, South Cambridgeshire, Cambridgeshire, East of England, England, CB22 5BX, United Kingdom building house 0.101 United Kingdom gb Europe Northern Europe
+horsham 2021-02-03 257416768 relation Horsham, West Sussex, South East, England, United Kingdom boundary administrative 0.556493353758773 United Kingdom gb Europe Northern Europe
+brain sciences unit 2021-02-03 100156548 way MRC Cognition and Brain Sciences Unit, 15, Chaucer Road, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 7EF, United Kingdom building university 0.535968355602442 United Kingdom gb Europe Northern Europe
+biobank 2021-02-03 77681818 node Biobank, Pincents Kiln Industrial Park, Tilehurst, Theale, West Berkshire, South East, England, RG31 7SD, United Kingdom office company 0.101 United Kingdom gb Europe Northern Europe
+uk university and college union 2021-02-03 146247548 way University and College Union, Carlow Street, Somers Town, London Borough of Camden, London, Greater London, England, NW1 7LL, United Kingdom office trade_union 0.401 United Kingdom gb Europe Northern Europe
+university of east anglia 2021-02-03 206300612 way University of East Anglia, Wilberforce Road, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom amenity university 0.904172803149122 United Kingdom gb Europe Northern Europe
+los alamos study group 2021-02-03 145794537 way Study Centre Group Provision, Cheyne Path, Hanwell, London Borough of Ealing, London, Greater London, England, W7, United Kingdom building school 0.201 United Kingdom gb Europe Northern Europe
+rothamsted research 2021-02-03 134923114 way Rothamsted Research, Rothamsted Avenue, Roundwood, Harpenden, St Albans, Hertfordshire, East of England, England, AL5 2TW, United Kingdom amenity university 0.201 United Kingdom gb Europe Northern Europe
+soho 2021-02-03 164417340 way Soho, City of Westminster, London, Greater London, England, United Kingdom place suburb 0.608698314216003 United Kingdom gb Europe Northern Europe
+warwick 2021-02-03 258180459 relation Warwick, Warwickshire, West Midlands, England, United Kingdom boundary administrative 0.584132173720047 United Kingdom gb Europe Northern Europe
+met office 2021-02-03 259459361 relation The Met Office, Fitzroy Road, Met Office, Monkerton, Exeter, Devon, South West England, England, EX1 3PB, United Kingdom office weather 0.660932371570306 United Kingdom gb Europe Northern Europe
+democrats 2021-02-03 23277141 node Liberal Democrats, 8–10, Great George Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3AE, United Kingdom office political_party 0.497946206068361 United Kingdom gb Europe Northern Europe
+china china 2021-02-03 232368687 way China China, 6, Station Road, Lyminge, Folkestone and Hythe, Kent, South East, England, CT18 8HP, United Kingdom amenity restaurant 0.201 United Kingdom gb Europe Northern Europe
+university of oxford 2021-02-03 96249903 way Oxford University Museum of Natural History, Parks Road, City Centre, Oxford, Oxfordshire, South East, England, OX1 3PW, United Kingdom tourism museum 0.690225650640271 United Kingdom gb Europe Northern Europe
+lofar 2021-02-03 138863067 way LOFAR, Chilbolton, Test Valley, Hampshire, South East, England, United Kingdom landuse observatory 0.47774807032046 United Kingdom gb Europe Northern Europe
+hilton 2021-02-03 6367561 node Hilton, Inverness, Highland, Scotland, IV2 4PX, United Kingdom place suburb 0.511602248356457 United Kingdom gb Europe Northern Europe
+institute of physics 2021-02-03 141162734 way Institute of Physics, 76, Portland Place, Marylebone, City of Westminster, London, Greater London, England, W1B 1NT, United Kingdom office ngo 0.721993534059618 United Kingdom gb Europe Northern Europe
+birdlife international 2021-02-03 14417131 node BirdLife International, Wellbrook Way, Girton, South Cambridgeshire, Cambridgeshire, East of England, England, CB3 0GJ, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+nfu 2021-02-03 119235228 way NFU Mutual, Blackbrook Park Avenue, Blackbrook Business Park, Blackbrook, Ruishton, Somerset West and Taunton, Somerset, South West England, England, TA1 2FU, United Kingdom office insurance 0.402323854176492 United Kingdom gb Europe Northern Europe
+climate institute 2021-02-03 41936693 node Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom office research 0.472343749103071 United Kingdom gb Europe Northern Europe
+public library of science 2021-02-03 117746945 way Science, Victoria Road, London Borough of Hillingdon, London, Greater London, England, HA4 0JE, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+zoological society of london 2021-02-03 252630202 way Zoological Society of London, Regent's Canal Towpath, Chalk Farm, City of Westminster, London, Greater London, England, NW1 4SX, United Kingdom office ngo 0.401 United Kingdom gb Europe Northern Europe
+university of greenwich 2021-02-03 605157 node University of Greenwich, Romney Road, East Greenwich, Royal Borough of Greenwich, London, Greater London, England, SE10 9JW, United Kingdom amenity university 0.749987257448056 United Kingdom gb Europe Northern Europe
+royal courts of justice 2021-02-03 258488410 relation Royal Courts of Justice, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2LL, United Kingdom amenity courthouse 0.821202519145559 United Kingdom gb Europe Northern Europe
+taylor & francis 2021-02-03 120087526 way Taylor and Francis, 4, Park Square, Milton Park, Milton, Vale of White Horse, Oxfordshire, South East, England, OX14 4RN, United Kingdom office company 0.201 United Kingdom gb Europe Northern Europe
+crossrail 2021-02-03 236256742 way Elizabeth Line, Church Manor Way, Abbey Wood, Royal Borough of Greenwich, London, Greater London, England, SE2 9LX, United Kingdom railway construction 0.365618504568294 United Kingdom gb Europe Northern Europe
+oxford martin school 2021-02-03 108491139 way Oxford Martin School, 34, Broad Street, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 3BD, United Kingdom building university 0.646843791996006 United Kingdom gb Europe Northern Europe
+cambridge crystallographic data centre 2021-02-03 119553360 way Cambridge Crystallographic Data Centre, 12, Union Road, Newtown, Cambridge, Cambridgeshire, East of England, England, CB2 1EZ, United Kingdom building yes 0.401 United Kingdom gb Europe Northern Europe
+london school of economics and political science 2021-02-03 258598818 relation London School of Economics and Political Science, Houghton Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AE, United Kingdom amenity university 1.28817687564795 United Kingdom gb Europe Northern Europe
+university of portsmouth 2021-02-03 4318922 node University, Cambridge Road, Old Portsmouth, Portsmouth, South East, England, PO1 2HB, United Kingdom highway bus_stop 0.201 United Kingdom gb Europe Northern Europe
+dcms 2021-02-03 54322395 node Department for Digital, Culture, Media & Sport, 100, Parliament Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 2BQ, United Kingdom office government 0.408175130056335 United Kingdom gb Europe Northern Europe
+royal society of chemistry 2021-02-03 2359906 node Royal Society of Chemistry, Albany Court Yard, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1J 0HE, United Kingdom amenity learned_society;library 0.902029768014478 United Kingdom gb Europe Northern Europe
+usra 2021-02-03 69244558 node USRA, 19, Darin Court, Crownhill, Shenley Church End, Milton Keynes, South East, England, MK8 0AD, United Kingdom amenity fast_food 0.101 United Kingdom gb Europe Northern Europe
+british archaeological trust 2021-02-03 135878352 way Canal & River Trust, Blackwall, London Borough of Tower Hamlets, London, Greater London, England, E14 9ST, United Kingdom landuse industrial 0.3 United Kingdom gb Europe Northern Europe
+reed elsevier 2021-02-03 26271747 node Reed Elsevier, Jamestown Road, Chalk Farm, London Borough of Camden, London, Greater London, England, NW1 7DJ, United Kingdom office company 0.201 United Kingdom gb Europe Northern Europe
+royal entomological society 2021-02-03 99366475 way Royal Entomological Society, Chiswell Green Lane, St Stephen, Chiswell Green, St Albans, Hertfordshire, East of England, England, AL2 3AJ, United Kingdom building yes 0.301 United Kingdom gb Europe Northern Europe
+liberal democrats 2021-02-03 23277141 node Liberal Democrats, 8–10, Great George Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 3AE, United Kingdom office political_party 0.597946206068361 United Kingdom gb Europe Northern Europe
+people's welfare 2021-02-03 173813574 way Old People's Welfare Centre, Nottingham Road, Daybrook, Arnold, City of Nottingham, Nottinghamshire, East Midlands, England, NG5 6JZ, United Kingdom amenity community_centre 0.301 United Kingdom gb Europe Northern Europe
+kings college london 2021-02-03 258760701 relation King's College London, Strand Campus, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 2LS, United Kingdom amenity university 0.767778517860205 United Kingdom gb Europe Northern Europe
+oc robotics 2021-02-03 109463158 way OC Robotics, Unit 5, Emma-Chris Way, Abbey Wood Business Park, Filton, Bristol, South Gloucestershire, South West England, England, BS34 7JU, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+essex 2021-02-03 257296477 relation Essex, England, United Kingdom boundary ceremonial 0.723732857491298 United Kingdom gb Europe Northern Europe
+toshiba research europe 2021-02-03 64980625 node Toshiba Research Europe, 208, Cambridge Science Park, Chesterton, Cambridge, Cambridgeshire, East of England, England, CB4 0GZ, United Kingdom office company 0.301 United Kingdom gb Europe Northern Europe
+research europe 2021-02-03 64980625 node Toshiba Research Europe, 208, Cambridge Science Park, Chesterton, Cambridge, Cambridgeshire, East of England, England, CB4 0GZ, United Kingdom office company 0.201 United Kingdom gb Europe Northern Europe
+uk intellectual property office 2021-02-03 258434943 relation Intellectual Property Office, Cardiff Road, Maesglas, Gaer, Newport, Cymru / Wales, NP10 8QQ, United Kingdom office government 0.301 United Kingdom gb Europe Northern Europe
+university of huddersfield 2021-02-03 258496268 relation Huddersfield University, Queensgate, Springwood, Aspley, Huddersfield, Kirklees, West Yorkshire, Yorkshire and the Humber, England, HD1 3DH, United Kingdom amenity university 0.63609907778808 United Kingdom gb Europe Northern Europe
+royal united hospital 2021-02-03 101624625 way Royal United Hospital, Combe Park, Bath, Bath and North East Somerset, South West England, England, BA1 3NG, United Kingdom amenity hospital 0.56358119422997 United Kingdom gb Europe Northern Europe
+uk 2021-02-03 258411454 relation United Kingdom boundary administrative 0.872378013283733 United Kingdom gb Europe Northern Europe
+strait 2021-02-03 220194897 way The Strait, Windmill Hill, Wartling, Windmill Hill, Wealden, East Sussex, South East, England, BN27 4SB, United Kingdom highway primary 0.2 United Kingdom gb Europe Northern Europe
+eisai 2021-02-03 66344478 node Eisai, Mosquito Way, Comet Square, Hatfield, Welwyn Hatfield, Hertfordshire, East of England, England, AL10 9SN, United Kingdom highway bus_stop 0.101 United Kingdom gb Europe Northern Europe
+microsoft research 2021-02-03 139659987 way Microsoft Research, 21, Station Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB1 2FB, United Kingdom building commercial 0.201 United Kingdom gb Europe Northern Europe
+school of biological sciences 2021-02-03 132715486 way School of Biological Sciences, Tyndall Avenue, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS8 1TH, United Kingdom building university 0.401 United Kingdom gb Europe Northern Europe
+nestle 2021-02-03 152769411 way Nestle, Dalston, Carlisle, Cumbria, North West England, England, CA5 7NH, United Kingdom landuse industrial 0.3 United Kingdom gb Europe Northern Europe
+us national institute of mental health 2021-02-03 140482817 way Institute of Mental Health, Triumph Road, Wollaton Park, City of Nottingham, East Midlands, England, NG8 1FD, United Kingdom building yes 0.401 United Kingdom gb Europe Northern Europe
+lse 2021-02-03 258598818 relation London School of Economics and Political Science, Houghton Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AE, United Kingdom amenity university 0.588176875647945 United Kingdom gb Europe Northern Europe
+goldman sachs 2021-02-03 98808694 way Goldman Sachs, 120, Fleet Street, Blackfriars, City of London, Greater London, England, EC4A 2BE, United Kingdom office company 0.458218474293395 United Kingdom gb Europe Northern Europe
+national institute of agricultural botany 2021-02-03 259467768 relation NIAB (National Institute of Agricultural Botany), Howes Place, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0LD, United Kingdom building yes 0.501 United Kingdom gb Europe Northern Europe
+spacex 2021-02-03 24857819 node Spacex, 45, Preston Street, St Thomas, Exeter, Devon, South West England, England, EX1 1DF, United Kingdom amenity arts_centre 0.258083983169266 United Kingdom gb Europe Northern Europe
+university of buckingham 2021-02-03 190534352 way University of Buckingham, Nelson Street, Buckingham, Buckinghamshire, South East, England, MK18 1DB, United Kingdom amenity university 0.730883005990736 United Kingdom gb Europe Northern Europe
+plymouth 2021-02-03 257865169 relation Plymouth, South West England, England, United Kingdom boundary administrative 0.697098637251215 United Kingdom gb Europe Northern Europe
+cardiff university 2021-02-03 226503456 way Cardiff University, 5, The Parade, Tredegarville, Roath, Cardiff, Cymru / Wales, CF24 3AA, United Kingdom building university 0.201 United Kingdom gb Europe Northern Europe
+university of wolverhampton 2021-02-03 110328726 way University of Wolverhampton, Stafford Street, Heath Town, Wolverhampton, West Midlands Combined Authority, West Midlands, England, WV1 1LY, United Kingdom building university 0.301 United Kingdom gb Europe Northern Europe
+economist 2021-02-03 186500188 way The Economist, 25, St. James's Street, St. James's, Mayfair, City of Westminster, London, Greater London, England, SW1A 1HJ, United Kingdom office newspaper 0.241913844040538 United Kingdom gb Europe Northern Europe
+national audit office 2021-02-03 115991832 way National Audit Office, 157-197, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9SP, United Kingdom office government 0.644585942469205 United Kingdom gb Europe Northern Europe
+university of sheffield 2021-02-03 258762437 relation University of Sheffield, West Street, Saint George's, Sheffield, Yorkshire and the Humber, England, S1 4ET, United Kingdom amenity university 0.816705192186971 United Kingdom gb Europe Northern Europe
+assembly 2021-02-03 119076353 way Assembly, Temple, Old Market, Bristol, City of Bristol, South West England, England, United Kingdom landuse construction 0.3 United Kingdom gb Europe Northern Europe
+oxford circus 2021-02-03 22497767 node Oxford Circus, Oxford Street, Fitzrovia, City of Westminster, London, Greater London, England, W1B 2ER, United Kingdom tourism information 0.685759448486215 United Kingdom gb Europe Northern Europe
+island press 2021-02-03 159537 node Press, North East Derbyshire, Derbyshire, East Midlands, England, S42 6AZ, United Kingdom place village 0.375 United Kingdom gb Europe Northern Europe
+glaxosmithkline 2021-02-03 153515967 way GlaxoSmithKline, Elmbridge, Surrey, South East, England, KT13 0DE, United Kingdom landuse commercial 0.3 United Kingdom gb Europe Northern Europe
+socialist party 2021-02-03 51925227 node The Socialist Party, Clapham High Street, Clapham Park, London Borough of Lambeth, London, Greater London, England, SW4 7TY, United Kingdom office political_party 0.201 United Kingdom gb Europe Northern Europe
+isc 2021-02-03 147374618 way St Mary's Airport, High Cross Lane, Parting Carn, St Mary's, Old Town, Isles of Scilly, South West England, England, TR21 0NG, United Kingdom aeroway aerodrome 0.418002769416701 United Kingdom gb Europe Northern Europe
+hampshire 2021-02-03 258402538 relation Hampshire, England, United Kingdom boundary ceremonial 0.725068049293215 United Kingdom gb Europe Northern Europe
+grantham museum 2021-02-03 144368628 way Grantham Museum, Saint Peter's Hill, South Kesteven, Lincolnshire, East Midlands, England, NG31 6QA, United Kingdom tourism museum 0.201 United Kingdom gb Europe Northern Europe
+wellcome trust uk 2021-02-03 165545925 way Wellcome Trust, 215, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom building yes 0.630084056292374 United Kingdom gb Europe Northern Europe
+wellcome trust 2021-02-03 165545925 way Wellcome Trust, 215, Euston Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 2BE, United Kingdom building yes 0.630084056292374 United Kingdom gb Europe Northern Europe
+alliance manchester business school 2021-02-03 707500 node Alliance Manchester Business School, Booth Street West, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M15 6PB, United Kingdom amenity university 0.401 United Kingdom gb Europe Northern Europe
+blackburn 2021-02-03 118886 node Blackburn, Blackburn with Darwen, North West England, England, BB1 7DP, United Kingdom place town 0.621773723501146 United Kingdom gb Europe Northern Europe
+kavli institute for cosmology 2021-02-03 108662646 way Kavli Institute for Cosmology, IoA Path, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0HA, United Kingdom building university 0.401 United Kingdom gb Europe Northern Europe
+university of exeter 2021-02-03 259019581 relation University of Exeter, Blackboy Road, Newtown, Exeter, Devon, South West England, England, EX4 6TB, United Kingdom amenity university 0.803356007669835 United Kingdom gb Europe Northern Europe
+uk department of health 2021-02-03 139424486 way Department Of Health, 39, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1, United Kingdom office government 0.301 United Kingdom gb Europe Northern Europe
+national science and technology council 2021-02-03 183761570 way Dartford Science & Technology College, Dartford Technology College, Dartford, Kent, South East, England, DA1 2LY, United Kingdom amenity school 0.613179143195807 United Kingdom gb Europe Northern Europe
+us episcopal church 2021-02-03 4563113 node Episcopal Church, Panmure Street, Ashludie Farm, Monifieth, Angus, Scotland, DD5 4EB, United Kingdom highway bus_stop 0.301 United Kingdom gb Europe Northern Europe
+uk national graphene institute 2021-02-03 301795627 way National Graphene Institute, Booth Street East, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M13 9EP, United Kingdom amenity research_institute 0.652151062176819 United Kingdom gb Europe Northern Europe
+university of durham 2021-02-03 53254670 node University, New Durham Road, Ashbrooke, Sunderland, North East England, England, SR2 7PD, United Kingdom railway station 0.433228686818865 United Kingdom gb Europe Northern Europe
+cse 2021-02-03 109879705 way Computer Science, University of York, Heslington, York, Yorkshire and the Humber, England, YO10 5GH, United Kingdom building university 0.001 United Kingdom gb Europe Northern Europe
+gryphon 2021-02-03 1367040 node The Gryphon, 9, Vera Avenue, Grange Park, London Borough of Enfield, London, Greater London, England, N21 1RE, United Kingdom amenity restaurant 0.101 United Kingdom gb Europe Northern Europe
+sheffield hallam university 2021-02-03 209297729 way Sheffield Hallam University, Pond Street, City Centre, Sheffield, Yorkshire and the Humber, England, S1 1AA, United Kingdom amenity university 0.301 United Kingdom gb Europe Northern Europe
+cabinet office 2021-02-03 100375252 way Cabinet Office, 70, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2AS, United Kingdom office government 0.648641885623921 United Kingdom gb Europe Northern Europe
+agri-food & biosciences institute 2021-02-03 202394885 way Agri-Food and Biosciences Institute, 50, Houston Road, Crossnacreevy, Belfast, County Down, Northern Ireland, BT6 9SH, United Kingdom office government 0.401 United Kingdom gb Europe Northern Europe
+abcam 2021-02-03 64287809 node Abcam, 200, Cambridge Science Park, Chesterton, Cambridge, Cambridgeshire, East of England, England, CB4 0GZ, United Kingdom office company 0.101 United Kingdom gb Europe Northern Europe
+university of brighton 2021-02-03 189946524 way St Peter's House Library, 16-18, Richmond Place, Round Hill, Brighton, Brighton and Hove, South East, England, BN2 9NA, United Kingdom building university 0.101 United Kingdom gb Europe Northern Europe
+uk science and technology facilities council 2021-02-03 103985987 way Royal Observatory, Edinburgh, Observatory Road, Blackford Hill, Blackford, City of Edinburgh, Scotland, EH9 3HJ, United Kingdom tourism attraction 0.460151663261328 United Kingdom gb Europe Northern Europe
+lanner 2021-02-03 149878 node Lanner, Cornwall, South West England, England, TR16 6DW, United Kingdom place village 0.375 United Kingdom gb Europe Northern Europe
+cowling 2021-02-03 153851 node Cowling, Craven, North Yorkshire, Yorkshire and the Humber, England, BD22 0BX, United Kingdom place village 0.375 United Kingdom gb Europe Northern Europe
+museum of archaeology and anthropology 2021-02-03 4139522 node Museum of Archaeology and Anthropology, Downing Street, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 3DZ, United Kingdom tourism museum 0.87774807032046 United Kingdom gb Europe Northern Europe
+royal astronomical society 2021-02-03 2216371 node Royal Astronomical Society, Burlington Arcade, St. James's, Mayfair, City of Westminster, London, Greater London, England, W1J 0ET, United Kingdom amenity learned_society;library 0.794024211333493 United Kingdom gb Europe Northern Europe
+ulster university 2021-02-03 59072243 node Ulster University, York Street, Smithfield and Union, Carrick Hill, Belfast, County Antrim, Northern Ireland, BT15 1AS, United Kingdom highway bus_stop 0.201 United Kingdom gb Europe Northern Europe
+surrey space centre 2021-02-03 11415803 node Surrey Space Centre, Spine Road, Guildford Park, Guildford, Surrey, South East, England, GU2 7XJ, United Kingdom office research 0.301 United Kingdom gb Europe Northern Europe
+human tissue authority 2021-02-03 17570009 node Human Tissue Authority, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom office government 0.301 United Kingdom gb Europe Northern Europe
+national farmers union 2021-02-03 179034227 way National Farmers' Union, Haw Street, Wotton-under-Edge, Kingswood, Stroud, Gloucestershire, South West England, England, GL12 7AQ, United Kingdom building yes 0.301 United Kingdom gb Europe Northern Europe
+centre for ecology and hydrology 2021-02-03 101917409 way Centre for Ecology and Hydrology, Benson Lane, Preston Crowmarsh, Benson, Crowmarsh Gifford, South Oxfordshire, Oxfordshire, South East, England, OX10 8BB, United Kingdom amenity research_institute 0.754365194683011 United Kingdom gb Europe Northern Europe
+university of liverpool 2021-02-03 139896766 way University of Liverpool, Peach Street, Knowledge Quarter, Liverpool, North West England, England, L7, United Kingdom amenity university 0.301 United Kingdom gb Europe Northern Europe
+european centre for medium-range weather forecasts in reading 2021-02-03 101206182 way European Centre for Medium-Range Weather Forecasts, Shinfield, Reading, Wokingham, South East, England, RG2 9AX, United Kingdom landuse industrial 1.1 United Kingdom gb Europe Northern Europe
+birkbeck college london 2021-02-03 96971911 way Birkbeck College, Malet Street, St Giles, St Pancras, London Borough of Camden, London, Greater London, England, WC1E 7HX, United Kingdom amenity university 0.773518221802039 United Kingdom gb Europe Northern Europe
+national institute for advanced studies 2021-02-03 156623105 way Institute for Advanced Studies, 1, University Walk, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS2, United Kingdom building university 0.401 United Kingdom gb Europe Northern Europe
+great britain 2021-02-03 302503364 relation Great Britain, United Kingdom place island 0.896790110521564 United Kingdom gb Europe Northern Europe
+trojans 2021-02-03 131238608 way Liverpool Trojans Baseball Club, Bootle, Sefton, North West England, England, United Kingdom landuse recreation_ground 0.3 United Kingdom gb Europe Northern Europe
+natural history museum 2021-02-03 94551563 way Natural History Museum, Cromwell Road, Brompton, Royal Borough of Kensington and Chelsea, London, Greater London, England, SW7 5BD, United Kingdom tourism museum 0.901298316780421 United Kingdom gb Europe Northern Europe
+christian aid 2021-02-03 115017495 way Christian Aid, 35-41, Lower Marsh, Lambeth, London Borough of Lambeth, London, Greater London, England, SE1 7RL, United Kingdom office ngo 0.201 United Kingdom gb Europe Northern Europe
+university of kent 2021-02-03 130686043 way University of Kent, Giles Lane, Hales Place, Tyler Hill, Canterbury, Kent, South East, England, CT2 7NJ, United Kingdom amenity university 0.789199447242987 United Kingdom gb Europe Northern Europe
+merton college 2021-02-03 258811698 relation Merton College, Grove Passage, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4JF, United Kingdom amenity university 0.446981559290857 United Kingdom gb Europe Northern Europe
+institute of development studies 2021-02-03 258327927 relation Institute of Development Studies, Arts Road, Stanmer, Brighton and Hove, South East, England, BN1 9RE, United Kingdom building university 0.401 United Kingdom gb Europe Northern Europe
+uk space agency 2021-02-03 79817723 node UK Space Agency, North Star Avenue, Gorse Hill, Central Swindon North, Swindon, South West England, England, SN2 1EU, United Kingdom office government 0.742006417463271 United Kingdom gb Europe Northern Europe
+royal society b 2021-02-03 3796847 node The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom building yes 0.847225834784319 United Kingdom gb Europe Northern Europe
+royal society of medicine 2021-02-03 100091001 way Royal Society of Medicine, 1, Wimpole Street, Mayfair, City of Westminster, London, Greater London, England, W1G 8GP, United Kingdom building yes 0.401 United Kingdom gb Europe Northern Europe
+university of lincoln 2021-02-03 4219519 node University of Lincoln, Brayford Way, New Boultham, Lincoln, Lincolnshire, East Midlands, England, LN1 1RD, United Kingdom highway bus_stop 0.301 United Kingdom gb Europe Northern Europe
+biosciences 2021-02-03 258876052 relation Biosciences, West Gate, Bournbrook, Metchley, Birmingham, West Midlands Combined Authority, West Midlands, England, B15 2TT, United Kingdom building university 0.101 United Kingdom gb Europe Northern Europe
+uk conservative party 2021-02-03 150193380 way Conservative Party, Glenlea Road, Well Hall, Royal Borough of Greenwich, London, Greater London, England, SE9 1DZ, United Kingdom office political 0.201 United Kingdom gb Europe Northern Europe
+green bonds 2021-02-03 6339326 node Bonds, Barnacre-with-Bonds, Garstang, Wyre, Lancashire, North West England, England, PR3 1ZQ, United Kingdom place hamlet 0.35 United Kingdom gb Europe Northern Europe
+lancashire 2021-02-03 258129935 relation Lancashire, England, United Kingdom boundary ceremonial 0.742602820947042 United Kingdom gb Europe Northern Europe
+financial times 2021-02-03 103776457 way Financial Times, 1, Friday Street, Blackfriars, City of London, Greater London, England, EC4M 9BT, United Kingdom office newspaper 0.756792051580292 United Kingdom gb Europe Northern Europe
+lancaster university 2021-02-03 95263873 way Lancaster University, Scotforth Road, Lower Burrow, Hala, Bailrigg, Lancaster, Lancashire, North West England, England, LA2 0PH, United Kingdom amenity university 0.201 United Kingdom gb Europe Northern Europe
+university college hospital 2021-02-03 189976437 way University College Hospital, 235, Euston Road, Somers Town, London Borough of Camden, London, Greater London, England, NW1 2BU, United Kingdom amenity hospital 0.691955796512831 United Kingdom gb Europe Northern Europe
+coalition s 2021-02-03 15861155 node Coalition, King's Road, Queen's Park, Brighton, Brighton and Hove, South East, England, BN1 1NB, United Kingdom amenity nightclub 0.201 United Kingdom gb Europe Northern Europe
+science and technology facilities council 2021-02-03 103985987 way Royal Observatory, Edinburgh, Observatory Road, Blackford Hill, Blackford, City of Edinburgh, Scotland, EH9 3HJ, United Kingdom tourism attraction 0.460151663261328 United Kingdom gb Europe Northern Europe
+university of reading 2021-02-03 54678990 node The Ure Museum of Greek Archaeology, Queen's Drive, Lower Earley, Earley, Reading, Wokingham, South East, England, RG6 6DN, United Kingdom tourism museum 0.43859140675544 United Kingdom gb Europe Northern Europe
+commission 2021-02-03 174443117 way The Commission, Stratford Road, London Borough of Hillingdon, London, Greater London, England, TW6 3FB, United Kingdom amenity restaurant 0.101 United Kingdom gb Europe Northern Europe
+culham centre 2021-02-03 688400 node Culham, South Oxfordshire, Oxfordshire, South East, England, OX14 4LY, United Kingdom place village 0.375 United Kingdom gb Europe Northern Europe
+research pathogen 2021-02-03 102722066 way Peter Medawar Building for Pathogen Research, South Parks Road, City Centre, Oxford, Oxfordshire, South East, England, OX1 3RF, United Kingdom building university 0.201 United Kingdom gb Europe Northern Europe
+chatham house 2021-02-03 185683088 way Chatham House (The Royal Institute of International Affairs), 10, St James's Square, St. James's, Mayfair, City of Westminster, London, Greater London, England, SW1Y 4LE, United Kingdom office ngo 0.585200970199076 United Kingdom gb Europe Northern Europe
+joint committee 2021-02-03 117993195 way WJEC, Western Avenue, Llandaff, Cardiff, Cymru / Wales, CF, United Kingdom office quango 0.314317004425986 United Kingdom gb Europe Northern Europe
+open data institute 2021-02-03 51911699 node Open Data Institute, 65, Clifton Street, Shoreditch, London Borough of Hackney, London, Greater London, England, EC2A 4JE, United Kingdom office company 0.301 United Kingdom gb Europe Northern Europe
+university of essex 2021-02-03 62209739 node University of Essex, Wivenhoe, Colchester, Essex, East of England, England, CO4 3WA, United Kingdom place suburb 0.575 United Kingdom gb Europe Northern Europe
+montefiore medical center 2021-02-03 113982822 way East Cliff Practice, Dumpton Park Drive, East Cliff, Ramsgate, Thanet, Kent, South East, England, CT11 8AD, United Kingdom amenity doctors 0.001 United Kingdom gb Europe Northern Europe
+university of northampton 2021-02-03 175011057 way The Pavillion, Boughton Green Road, Hill Top, Kingsthorpe, Northampton, Northamptonshire, East Midlands, England, NN2 7AL, United Kingdom amenity bar 0.101 United Kingdom gb Europe Northern Europe
+hefce 2021-02-03 259588926 relation hefce, Carroll Court, Stoke Park, Stoke Gifford, Filton, South Gloucestershire, South West England, England, BS34, United Kingdom building yes 0.111 United Kingdom gb Europe Northern Europe
+university of surrey 2021-02-03 258855441 relation University of Surrey, Richard Meyjes Road, Park Barn, Guildford, Surrey, South East, England, GU2 7XH, United Kingdom amenity university 0.774083401364362 United Kingdom gb Europe Northern Europe
+soas university of london 2021-02-03 259443457 relation SOAS University of London, Woburn Square, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0AA, United Kingdom amenity university 0.887548679886816 United Kingdom gb Europe Northern Europe
+faam 2021-02-03 240912494 way Faam, 131, Percy Road, Whitton High Street, Whitton, London Borough of Richmond upon Thames, London, Greater London, England, TW2 6HT, United Kingdom shop art 0.101 United Kingdom gb Europe Northern Europe
+labour party 2021-02-03 72659499 node Labour Party, Jamaica Road, Butler's Wharf, Bermondsey, London Borough of Southwark, London, Greater London, England, SE16 4RX, United Kingdom office political_party 0.201 United Kingdom gb Europe Northern Europe
+royal society for the protection of birds 2021-02-03 145438865 way RSPB South Stack, South Stack Road, Trearddur, Holyhead, Ynys Môn / Isle of Anglesey, Cymru / Wales, LL65 1YH, United Kingdom tourism attraction 0.101 United Kingdom gb Europe Northern Europe
+office of medical services 2021-02-03 174252715 way Medical Services, Church Road, Aston, Birmingham, West Midlands Combined Authority, West Midlands, England, B6, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+conservative 2021-02-03 128024014 way Conservative Club, Whitecross Street, Overmonnow, Monmouth, Monmouthshire, Cymru / Wales, NP25 3BY, United Kingdom club yes 0.383827688081076 United Kingdom gb Europe Northern Europe
+uk treasury 2021-02-03 19225787 node The Treasury, 59-61, High Street, London Borough of Sutton, London, Greater London, England, SM1 1DT, United Kingdom amenity pub 0.101 United Kingdom gb Europe Northern Europe
+embo 2021-02-03 848668 node Embo, Highland, Scotland, IV25 3PS, United Kingdom place village 0.510664855391163 United Kingdom gb Europe Northern Europe
+universities uk 2021-02-03 55479876 node Universities UK, 20, Tavistock Square, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 9HQ, United Kingdom place house 0.201 United Kingdom gb Europe Northern Europe
+centre for ecology & hydrology 2021-02-03 101917409 way Centre for Ecology and Hydrology, Benson Lane, Preston Crowmarsh, Benson, Crowmarsh Gifford, South Oxfordshire, Oxfordshire, South East, England, OX10 8BB, United Kingdom amenity research_institute 0.654365194683011 United Kingdom gb Europe Northern Europe
+department for international development 2021-02-03 98247145 way Department for International Development, 22-24, Whitehall, Westminster, Covent Garden, City of Westminster, London, Greater London, England, SW1A 2WH, United Kingdom office government 0.401 United Kingdom gb Europe Northern Europe
+british geological survey 2021-02-03 99309132 way British Geological Survey, Keyworth, Stanton on the Wolds, Rushcliffe, Nottinghamshire, East Midlands, England, NG12 5GG, United Kingdom landuse commercial 0.70784642314719 United Kingdom gb Europe Northern Europe
+home office 2021-02-03 117457078 way Home Office, 2, Marsham Street, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 4DF, United Kingdom office government 0.201 United Kingdom gb Europe Northern Europe
+institute of hazard 2021-02-03 97604219 way Institute of Hazard and Risk Research, South Road, Houghall, City of Durham, Durham, County Durham, North East England, England, DH1 3TA, United Kingdom building university 0.301 United Kingdom gb Europe Northern Europe
+university of edinburgh 2021-02-03 87886135 way University of Edinburgh, Windmill Place, Pleasance, Southside, City of Edinburgh, Scotland, EH8 9XQ, United Kingdom amenity university 0.900742371444641 United Kingdom gb Europe Northern Europe
+metropolitan police 2021-02-03 258571119 relation Metropolitan Police, Greater London, England, United Kingdom boundary police 0.516167966338533 United Kingdom gb Europe Northern Europe
+england 2021-02-03 257775513 relation England, United Kingdom boundary administrative 0.938748907051256 United Kingdom gb Europe Northern Europe
+global challenges 2021-02-03 70067724 node Global Adventure Challenges Ltd, Hope Street, Lache, City of Chester, Chester, Cheshire West and Chester, North West England, England, CH4 8BU, United Kingdom shop travel_agency 0.201 United Kingdom gb Europe Northern Europe
+institute of neuroscience 2021-02-03 258398614 relation Institute of Psychiatry, Psychology & Neuroscience, 16, De Crespigny Park, Denmark Hill, Camberwell, London Borough of Southwark, London, Greater London, England, SE5 8AF, United Kingdom building university 0.642242222837154 United Kingdom gb Europe Northern Europe
+washington university medical school 2021-02-03 91134371 way Medical School, Clifton Boulevard, Dunkirk, City of Nottingham, East Midlands, England, NG7 2UH, United Kingdom amenity university 0.201 United Kingdom gb Europe Northern Europe
+eli lilly 2021-02-03 225577556 way Eli Lilly, Windlesham, Surrey Heath, Surrey, South East, England, GU20 6PH, United Kingdom landuse commercial 0.4 United Kingdom gb Europe Northern Europe
+tree-ring laboratory 2021-02-03 50297132 node Newton's Apple Tree, Bushy Road, National Physical Laboratory, Hampton Hill, London Borough of Richmond upon Thames, London, Greater London, England, TW11 0NL, United Kingdom natural tree 0.201 United Kingdom gb Europe Northern Europe
+public health england 2021-02-03 118029905 way Public Health England, Idmiston, Wiltshire, South West England, England, SP4 0JG, United Kingdom landuse industrial 0.5 United Kingdom gb Europe Northern Europe
+pirbright institute 2021-02-03 96398766 way The Pirbright Institute, Pirbright, Guildford, Surrey, South East, England, GU24 0NF, United Kingdom landuse industrial 0.4 United Kingdom gb Europe Northern Europe
+medicines and healthcare 2021-02-03 17808193 node Medicines and Healthcare Products Regulatory Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom office government 0.629555066820797 United Kingdom gb Europe Northern Europe
+rothschild 2021-02-03 131345270 way N M Rothschild & Sons, St Swithin's Lane, Bishopsgate, City of London, Greater London, England, EC4N 8AL, United Kingdom building commercial 0.511834385728338 United Kingdom gb Europe Northern Europe
+jodrell bank 2021-02-03 72862378 node Jodrell Bank, Lower Withington, Cheshire East, North West England, England, SK11 9DW, United Kingdom place hamlet 0.45 United Kingdom gb Europe Northern Europe
+biological sciences 2021-02-03 125084819 way Biological Sciences, St Ives Gardens, Queen's Quarter, Belfast, County Antrim, Northern Ireland, BT9 5AD, United Kingdom building university 0.201 United Kingdom gb Europe Northern Europe
+department of veterinary medicine, university of cambridge 2021-02-03 129270161 way Department of Veterinary Medicine (Vet School), Conduit Head Road, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0EY, United Kingdom amenity university 0.601 United Kingdom gb Europe Northern Europe
+oxford university press 2021-02-03 94205924 way Oxford University Press, Jericho, Oxford, Oxfordshire, South East, England, OX2 6DP, United Kingdom landuse commercial 0.972109324380291 United Kingdom gb Europe Northern Europe
+northumbria university in newcastle 2021-02-03 4155510 node Northumbria University, Sandyford Road, Haymarket, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE1 8JG, United Kingdom highway bus_stop 0.401 United Kingdom gb Europe Northern Europe
+defra 2021-02-03 120106481 way National Agri-Food Innovation Campus York, Sand Hutton, Ryedale, North Yorkshire, Yorkshire and the Humber, England, YO41 1LZ, United Kingdom landuse commercial 0.2 United Kingdom gb Europe Northern Europe
+northrup grumman 2021-02-03 71896950 node Northrup Grumman, 118, Burlington Road, West Barnes, London Borough of Merton, London, Greater London, England, KT3, United Kingdom office company 0.201 United Kingdom gb Europe Northern Europe
+mrc laboratory of molecular biology 2021-02-03 125035001 way MRC Laboratory of Molecular Biology (LMB), Francis Crick Avenue, Cambridge, Cambridgeshire, East of England, England, CB2 0AA, United Kingdom building university 0.501 United Kingdom gb Europe Northern Europe
+european bioinformatics institute 2021-02-03 259174699 relation European Bioinformatics Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SD, United Kingdom amenity research_institute 0.754244998383175 United Kingdom gb Europe Northern Europe
+institute of zoology 2021-02-03 100713929 way Institute of Zoology, Outer Circle, Chalk Farm, London Borough of Camden, London, Greater London, England, NW1 4RY, United Kingdom amenity research_institute 0.517338060184507 United Kingdom gb Europe Northern Europe
+scottish national party 2021-02-03 44686012 node Scottish National Party, Brothock Bridge, Westport, Arbroath, Angus, Scotland, DD11 1NP, United Kingdom office political_party 0.301 United Kingdom gb Europe Northern Europe
+king's college hospital 2021-02-03 156162088 way King's College Hospital, Denmark Hill, Camberwell, London Borough of Southwark, London, Greater London, England, SE5 9RS, United Kingdom amenity hospital 0.765781769297865 United Kingdom gb Europe Northern Europe
+university of york 2021-02-03 259581754 relation University of York, Low Lane, Heslington, York, Yorkshire and the Humber, England, YO10 5DD, United Kingdom amenity university 0.808489417863799 United Kingdom gb Europe Northern Europe
+royal veterinary college 2021-02-03 107180102 way Royal Veterinary College, Camden Campus, Royal College Street, Somers Town, London Borough of Camden, London, Greater London, England, NW1 0TH, United Kingdom amenity university 0.707433058758147 United Kingdom gb Europe Northern Europe
+airbus 2021-02-03 227109417 way Airbus, Filton, South Gloucestershire, South West England, England, BS34, United Kingdom landuse industrial 0.3 United Kingdom gb Europe Northern Europe
+idq 2021-02-03 37948615 node Idq, Kenyon Street, Jewellery Quarter, Aston, Birmingham, West Midlands Combined Authority, West Midlands, England, B18, United Kingdom office company 0.101 United Kingdom gb Europe Northern Europe
+tb alliance 2021-02-03 244997628 way Alliance, Mill Lane, City Centre, Castle, Cardiff, Cymru / Wales, CF, United Kingdom tourism artwork 0.36691348680426 United Kingdom gb Europe Northern Europe
+world conservation monitoring centre 2021-02-03 125654147 way World Conservation Monitoring Centre, 219c, Huntingdon Road, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0DL, United Kingdom building yes 0.401 United Kingdom gb Europe Northern Europe
+conservative party 2021-02-03 150193380 way Conservative Party, Glenlea Road, Well Hall, Royal Borough of Greenwich, London, Greater London, England, SE9 1DZ, United Kingdom office political 0.201 United Kingdom gb Europe Northern Europe
+university of bath 2021-02-03 173079366 way University of Bath, All Saints Place, Claverton Down, Bath, Bath and North East Somerset, South West England, England, BA2 6DU, United Kingdom amenity university 0.782140725159681 United Kingdom gb Europe Northern Europe
+liberal democrat 2021-02-03 64051674 node Aylesbury Liberal Democrat Headquarters, Castle Street, Walton, Aylesbury, Buckinghamshire, South East, England, HP20 2QL, United Kingdom office political_party 0.201 United Kingdom gb Europe Northern Europe
+unicef 2021-02-03 112681341 way UNICEF, 30a, Great Sutton Street, Farringdon, Clerkenwell, London Borough of Islington, London, Greater London, England, EC1V 0DU, United Kingdom office ngo 0.694034602256172 United Kingdom gb Europe Northern Europe
+bis 2021-02-03 154731847 way Business, Energy & Industrial Strategy, 1, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1H 0ET, United Kingdom office government 0.414108902120048 United Kingdom gb Europe Northern Europe
+scottish crop research institute 2021-02-03 243039744 way Scottish Crop Research Institute, Kingoodie, Invergowrie, Perth and Kinross, Scotland, DD2 5DA, United Kingdom landuse research 0.6 United Kingdom gb Europe Northern Europe
+oxfordshire 2021-02-03 258306804 relation Oxfordshire, South East, England, United Kingdom boundary administrative 0.703092947092873 United Kingdom gb Europe Northern Europe
+leakeys 2021-02-03 105503596 way Leakey's, Church Street, Haugh, Inverness, Highland, Scotland, IV1 1EY, United Kingdom shop books 0.001 United Kingdom gb Europe Northern Europe
+university of bristol 2021-02-03 50251699 node University of Bristol, Woodland Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS2, United Kingdom tourism information 0.301 United Kingdom gb Europe Northern Europe
+megaloceros 2021-02-03 251919749 way Megaloceros - Irish Elk (fawn), Thicket Road, Anerley, Crystal Palace, London Borough of Bromley, London, Greater London, England, SE20 8DP, United Kingdom tourism artwork 0.101 United Kingdom gb Europe Northern Europe
+kavli institute 2021-02-03 108662646 way Kavli Institute for Cosmology, IoA Path, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0HA, United Kingdom building university 0.201 United Kingdom gb Europe Northern Europe
+cruk 2021-02-03 76715823 node Cancer Research UK, 2, Redman Place, Stratford Marsh, London Borough of Newham, London, Greater London, England, E20 1JQ, United Kingdom office charity 0.001 United Kingdom gb Europe Northern Europe
+eaves 2021-02-03 642644 node Eaves, Wyre, Lancashire, North West England, England, PR4 0BE, United Kingdom place village 0.375 United Kingdom gb Europe Northern Europe
+university and college union 2021-02-03 146247548 way University and College Union, Carlow Street, Somers Town, London Borough of Camden, London, Greater London, England, NW1 7LL, United Kingdom office trade_union 0.401 United Kingdom gb Europe Northern Europe
+royal college of surgeons 2021-02-03 106178821 way Royal College of Surgeons, 35-43, Portugal Street, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 3PE, United Kingdom place house 0.779338672131387 United Kingdom gb Europe Northern Europe
+centre for science and policy 2021-02-03 130406915 way Centre for Science and Policy, 11-12, Trumpington Street, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 1QA, United Kingdom building university 0.501 United Kingdom gb Europe Northern Europe
+uk academy of medical sciences 2021-02-03 223952996 way Academy of Medical Sciences, 41, Portland Place, Fitzrovia, City of Westminster, London, Greater London, England, W1B 1AE, United Kingdom office charity 0.401 United Kingdom gb Europe Northern Europe
+aberystwyth university 2021-02-03 105273952 way Aberystwyth University, Llanbadarn Campus, Cefn Esgair, Llanbadarn Fawr, Aberystwyth, Ceredigion, Cymru / Wales, SY23 3JG, United Kingdom amenity university 0.201 United Kingdom gb Europe Northern Europe
+university of st andrews 2021-02-03 44520497 node University of St Andrews, North Street, St Andrews, Fife, Scotland, KY16 9AJ, United Kingdom amenity university 0.967907552390845 United Kingdom gb Europe Northern Europe
+international animal rescue 2021-02-03 62630833 node International Animal Rescue, 121, High Street, New Town, Uckfield, Wealden, East Sussex, South East, England, TN22 1RE, United Kingdom office yes 0.301 United Kingdom gb Europe Northern Europe
+center for global development 2021-02-03 191950659 way Center for Global Development, Wilton Road, Victoria, City of Westminster, London, Greater London, England, SW1V 1HN, United Kingdom office ngo 0.401 United Kingdom gb Europe Northern Europe
+cancer research uk 2021-02-03 25437189 node Cancer Research UK, 22-24, High Street, Enmore Green, Shaftesbury, Dorset, South West England, England, SP7 8JG, United Kingdom place houses 0.35 United Kingdom gb Europe Northern Europe
+spt 2021-02-03 124844971 way Stockport Railway Station, Grand Central, Portwood, Stockport, Greater Manchester, North West England, England, SK3 9HZ, United Kingdom building train_station 0.357411994477751 United Kingdom gb Europe Northern Europe
+the pirbright institute 2021-02-03 96398766 way The Pirbright Institute, Pirbright, Guildford, Surrey, South East, England, GU24 0NF, United Kingdom landuse industrial 0.5 United Kingdom gb Europe Northern Europe
+hli 2021-02-03 226710397 way HLI, Stogursey, Somerset West and Taunton, Somerset, South West England, England, United Kingdom landuse industrial 0.3 United Kingdom gb Europe Northern Europe
+church 2021-02-03 299392511 way Church, Thruxton, Test Valley, Hampshire, South East, England, SP11 8PW, United Kingdom highway raceway 0.539445078941215 United Kingdom gb Europe Northern Europe
+collins, the nih 2021-02-03 258666253 relation Collins, Northern Ireland, United Kingdom boundary administrative 0.45 United Kingdom gb Europe Northern Europe
+durham university 2021-02-03 34350681 node Palatine Reception, Palatine Centre, Stockton Road, City of Durham, Durham, County Durham, North East England, England, DH1 3LE, United Kingdom tourism information 0.101 United Kingdom gb Europe Northern Europe
+royal society of edinburgh 2021-02-03 19133034 node Royal Society of Edinburgh, 22-26, George Street, New Town, New Town/Broughton, City of Edinburgh, Scotland, EH2 2PQ, United Kingdom office charity 0.401 United Kingdom gb Europe Northern Europe
+city university london 2021-02-03 4711510 node Myddleton Street Building, City University London, Myddelton Street, Clerkenwell Green, Clerkenwell, London Borough of Islington, London, Greater London, England, EC1R 1UW, United Kingdom place house 0.301 United Kingdom gb Europe Northern Europe
+research environment 2021-02-03 41936693 node Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom office research 0.472343749103071 United Kingdom gb Europe Northern Europe
+digital services 2021-02-03 68602811 node Digital Services, 116, Westmead Road, Benhilton, London Borough of Sutton, London, Greater London, England, SM1 4JE, United Kingdom shop electronics 0.201 United Kingdom gb Europe Northern Europe
+royal society 2021-02-03 3796847 node The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom building yes 0.847225834784319 United Kingdom gb Europe Northern Europe
+royal holloway university of london 2021-02-03 85234417 way Royal Holloway, Prune Hill, Ripley Springs, Bakeham House, Stroude, Runnymede, Surrey, South East, England, TW20 9TR, United Kingdom amenity university 0.661486997579685 United Kingdom gb Europe Northern Europe
+covington & burling 2021-02-03 164356944 way Covington & Burling, 265, Strand, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2R 1BH, United Kingdom office lawyer 0.201 United Kingdom gb Europe Northern Europe
+buckinghamshire 2021-02-03 258178243 relation Buckinghamshire, South East, England, United Kingdom boundary historic 0.696549595581997 United Kingdom gb Europe Northern Europe
+manchester 2021-02-03 258159411 relation Manchester, Greater Manchester, North West England, England, United Kingdom boundary administrative 0.781718719589409 United Kingdom gb Europe Northern Europe
+polar research institute 2021-02-03 86946864 way Scott Polar Research Institute (SPRI), Lensfield Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 1ER, United Kingdom building university 0.709070137722353 United Kingdom gb Europe Northern Europe
+royal society and science 2021-02-03 40152391 node Blue plaque: Royal Society of Chemistry publishing, 290-292, Cambridge Science Park, Milton, South Cambridgeshire, Cambridgeshire, East of England, England, CB4 0FZ, United Kingdom historic memorial 0.401 United Kingdom gb Europe Northern Europe
+greenpeace uk 2021-02-03 98060114 way Greenpeace, Canonbury Villas, Highbury, London Borough of Islington, London, Greater London, England, N1 2PN, United Kingdom building office 0.101 United Kingdom gb Europe Northern Europe
+tokyo central wholesale market 2021-02-03 154165677 way Wholesale Market, Perry Barr, Birmingham, West Midlands Combined Authority, West Midlands, England, United Kingdom landuse commercial 0.4 United Kingdom gb Europe Northern Europe
+kew 2021-02-03 114707 node Kew, London Borough of Richmond upon Thames, London, Greater London, England, TW9 3AB, United Kingdom place suburb 0.575721107070673 United Kingdom gb Europe Northern Europe
+motorola 2021-02-03 23450963 node Motorola, St. Andrews, Broad Blunsdon, Swindon, South West England, England, SN25 4YF, United Kingdom place neighbourhood 0.35 United Kingdom gb Europe Northern Europe
+warwickshire 2021-02-03 257896615 relation Warwickshire, West Midlands, England, United Kingdom boundary administrative 0.685194555348613 United Kingdom gb Europe Northern Europe
+vertex pharmaceuticals 2021-02-03 74733580 node Vertex Pharmaceuticals (U.K.) Limited, 2, Kingdom Street, Paddington Central, Paddington, City of Westminster, London, Greater London, England, W2 6PY, United Kingdom office company 0.201 United Kingdom gb Europe Northern Europe
+bournemouth university 2021-02-03 112509122 way Bournemouth University (Talbot Campus), Gillett Road, Talbot Woods, Talbot Village, Bournemouth, Christchurch and Poole, South West England, England, BH3 7DR, United Kingdom amenity university 0.621665177399236 United Kingdom gb Europe Northern Europe
+sainsbury laboratory 2021-02-03 120833906 way Sainsbury Laboratory, Middle Walk, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 8BP, United Kingdom building university 0.560862131063799 United Kingdom gb Europe Northern Europe
+earlham institute 2021-02-03 153626366 way Earlham Institute, Rosalind Franklin Road, Colney, Norwich, Norfolk, East of England, England, NR4 7UZ, United Kingdom amenity research_institute 0.201 United Kingdom gb Europe Northern Europe
+london research institute 2021-02-03 116604474 way London Research Institute - Clare Hall Site, South Mimms, Ridge, Hertsmere, Hertfordshire, East of England, England, EN6 3LD, United Kingdom landuse industrial 0.5 United Kingdom gb Europe Northern Europe
+queen mary university of london 2021-02-03 104273414 way Queen Mary University of London, Mile End Road, Globe Town, Mile End, London Borough of Tower Hamlets, London, Greater London, England, E1 4NS, United Kingdom amenity university 0.962411757792441 United Kingdom gb Europe Northern Europe
+alba 2021-02-03 257273413 relation Scotland, United Kingdom boundary administrative 0.778974525409939 United Kingdom gb Europe Northern Europe
+babraham institute 2021-02-03 128767 node Babraham Institute, Babraham Institute Cycleway, Babraham, South Cambridgeshire, Cambridgeshire, East of England, England, CB22 3AQ, United Kingdom landuse commercial 0.201 United Kingdom gb Europe Northern Europe
+international maritime organization 2021-02-03 102541491 way International Maritime Organization, 4, Albert Embankment, Vauxhall, London Borough of Lambeth, London, Greater London, England, SE1 7SR, United Kingdom building office 0.301 United Kingdom gb Europe Northern Europe
+newcastle university 2021-02-03 129397314 way Newcastle University, Queen Victoria Road, Haymarket, Newcastle upon Tyne, Tyne and Wear, North East England, England, NE1 7RU, United Kingdom amenity university 0.700454702492461 United Kingdom gb Europe Northern Europe
+british antarctic survey 2021-02-03 258339816 relation British Antarctic Survey, High Cross, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0ET, United Kingdom office research 0.301 United Kingdom gb Europe Northern Europe
+wellcome trust sanger institute 2021-02-03 259312934 relation Wellcome Trust Sanger Institute, A1301, Wellcome Genome Campus, Hinxton, South Cambridgeshire, Cambridgeshire, East of England, England, CB10 1SA, United Kingdom amenity research_institute 0.811524674526993 United Kingdom gb Europe Northern Europe
+laboratory for molecular biology 2021-02-03 85272032 node MRC Laboratory for Molecular Cell Biology, Malet Place, St Pancras, London Borough of Camden, London, Greater London, England, WC1H 0AT, United Kingdom amenity university 0.401 United Kingdom gb Europe Northern Europe
+science policy centre 2021-02-03 130406915 way Centre for Science and Policy, 11-12, Trumpington Street, Newnham, Cambridge, Cambridgeshire, East of England, England, CB2 1QA, United Kingdom building university 0.301 United Kingdom gb Europe Northern Europe
+time team 2021-02-03 63776799 node Castle Hill (Time Team), Liddon Hill, Roundham, West Crewkerne, Crewkerne, South Somerset, Somerset, South West England, England, TA18 8RL, United Kingdom historic archaeological_site 0.201 United Kingdom gb Europe Northern Europe
+lovell telescope 2021-02-03 84170869 way Lovell Telescope, Bomish Lane, Blackden Heath, Goostrey, Cheshire East, North West England, England, CW4 8FZ, United Kingdom man_made telescope 0.610900543630094 United Kingdom gb Europe Northern Europe
+royal free 2021-02-03 249802441 way Royal Free Hospital, Haverstock Hill, Belsize Park, London Borough of Camden, London, Greater London, England, NW3 4PT, United Kingdom amenity hospital 0.583512305679518 United Kingdom gb Europe Northern Europe
+honeywell 2021-02-03 42965726 node Honeywell, Barnsley, Yorkshire and the Humber, England, S71 1LR, United Kingdom place neighbourhood 0.35 United Kingdom gb Europe Northern Europe
+britain 2021-02-03 258411454 relation United Kingdom boundary administrative 0.872378013283733 United Kingdom gb Europe Northern Europe
+nhs 2021-02-03 97017893 way Queen Alexandra Hospital, Old London Road, Cosham, Portsmouth, South East, England, PO6 3ES, United Kingdom amenity hospital 0.217338060184506 United Kingdom gb Europe Northern Europe
+shaw 2021-02-03 142176 node Shaw, Oldham, Greater Manchester, North West England, England, OL2 7WS, United Kingdom place town 0.502153233789513 United Kingdom gb Europe Northern Europe
+ad astra 2021-02-03 252844154 way Ad Astra, Pound Road, Over Wallop, Test Valley, Hampshire, South East, England, SO20 8JG, United Kingdom building house 0.201 United Kingdom gb Europe Northern Europe
+astra zeneca 2021-02-03 4552729 node Astra Zeneca, Bakewell Road, Loughborough, Charnwood, Leicestershire, East Midlands, England, LE11 5TH, United Kingdom highway bus_stop 0.201 United Kingdom gb Europe Northern Europe
+anglia 2021-02-03 257775513 relation England, United Kingdom boundary administrative 0.838748907051256 United Kingdom gb Europe Northern Europe
+heart foundation 2021-02-03 75654553 node Heart Foundation, Walter Street, Harpurhey, Manchester, Greater Manchester, North West England, England, M9 4DL, United Kingdom shop charity 0.201 United Kingdom gb Europe Northern Europe
+betty & gordon moore library 2021-02-03 89660043 way Betty and Gordon Moore Library, Wilberforce Road, Eddington, Cambridge, Cambridgeshire, East of England, England, CB3 0WD, United Kingdom amenity library 0.401 United Kingdom gb Europe Northern Europe
+national graphene institute 2021-02-03 301795627 way National Graphene Institute, Booth Street East, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M13 9EP, United Kingdom amenity research_institute 0.652151062176819 United Kingdom gb Europe Northern Europe
+wellcome open research 2021-02-03 131091915 way The Wellcome Trust Clinical Research Facility, Grafton Street, Chorlton-on-Medlock, Manchester, Greater Manchester, North West England, England, M13 9WU, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+thomson reuters 2021-02-03 135775517 way Thomson Reuters, 30, South Colonnade, Canary Wharf, Isle of Dogs, London Borough of Tower Hamlets, London, Greater London, England, E14 5EP, United Kingdom building office 0.43181178765026 United Kingdom gb Europe Northern Europe
+liverpool school of tropical medicine 2021-02-03 296757298 way Liverpool School of Tropical Medicine, Pembroke Place, Knowledge Quarter, Liverpool, North West England, England, L3 5QA, United Kingdom amenity university 0.884723197268746 United Kingdom gb Europe Northern Europe
+queen's college 2021-02-03 93331608 way The Queen's College, High Street, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4AN, United Kingdom amenity university 0.76362357530052 United Kingdom gb Europe Northern Europe
+culham science centre 2021-02-03 168790121 way Culham Science Centre, Clifton Hampden, South Oxfordshire, Oxfordshire, South East, England, United Kingdom landuse commercial 0.5 United Kingdom gb Europe Northern Europe
+lshtm 2021-02-03 185180502 way London School of Hygiene and Tropical Medicine, Gower Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7HT, United Kingdom amenity university 0.441052336501247 United Kingdom gb Europe Northern Europe
+canterbury 2021-02-03 257929986 relation Canterbury, Kent, South East, England, United Kingdom boundary administrative 0.689001871311268 United Kingdom gb Europe Northern Europe
+national oceanography centre 2021-02-03 257842880 relation National Oceanography Centre, European Way, Port of Southampton, St Mary's, Southampton, South East, England, SO14 3ZH, United Kingdom building yes 0.557277503353622 United Kingdom gb Europe Northern Europe
+wrexham glyndŵr university 2021-02-03 126645813 way Wrexham Glyndŵr University, Mold Road, Offa, Wrexham, Cymru / Wales, LL11 2AW, United Kingdom amenity university 0.688219355609235 United Kingdom gb Europe Northern Europe
+british museum 2021-02-03 257845646 relation British Museum, Great Russell Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1B 3DG, United Kingdom tourism museum 0.834130826976438 United Kingdom gb Europe Northern Europe
+lincolnshire 2021-02-03 258300503 relation Lincolnshire, England, United Kingdom boundary ceremonial 0.712373747600004 United Kingdom gb Europe Northern Europe
+francis crick institute 2021-02-03 121182065 way The Francis Crick Institute, 1, Midland Road, St Pancras, London Borough of Camden, London, Greater London, England, NW1 1AT, United Kingdom amenity research_institute 0.684723197268746 United Kingdom gb Europe Northern Europe
+university of sussex 2021-02-03 99822511 way University of Sussex, East Street, Falmer, Lewes, East Sussex, South East, England, BN1 9PB, United Kingdom amenity university 0.814277218171963 United Kingdom gb Europe Northern Europe
+tea party 2021-02-03 62281634 node Tea Party, Friern Barnet Lane, Whetstone, London Borough of Barnet, London, Greater London, England, N20 0ND, United Kingdom tourism artwork 0.201 United Kingdom gb Europe Northern Europe
+daily mail 2021-02-03 24473561 node Daily Mail, Weoley Castle Road, Weoley Castle, Birmingham, West Midlands Combined Authority, West Midlands, England, B29, United Kingdom shop newsagent 0.201 United Kingdom gb Europe Northern Europe
+grantham institute 2021-02-03 41936693 node Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom office research 0.472343749103071 United Kingdom gb Europe Northern Europe
+telegram 2021-02-03 116623602 way Greyabbey Road, Ballywalter, County Down, Northern Ireland, BT22 2NT, United Kingdom highway secondary 0.1 United Kingdom gb Europe Northern Europe
+royal botanic gardens 2021-02-03 85407776 way Royal Botanic Garden Edinburgh, Warriston Drive, Warriston, Stockbridge/Inverleith, City of Edinburgh, Scotland, EH3 5LY, United Kingdom leisure garden 0.616158624493363 United Kingdom gb Europe Northern Europe
+marine biological association 2021-02-03 118003644 way Marine Biological Association, Madeira Road, Barbican, Plymouth, South West England, England, PL1 2JU, United Kingdom building yes 0.301 United Kingdom gb Europe Northern Europe
+university oxford 2021-02-03 115937498 way University College, Logic Lane, St Ebbes, City Centre, Oxford, Oxfordshire, South East, England, OX1 4EX, United Kingdom amenity university 0.683844730994415 United Kingdom gb Europe Northern Europe
+sutton trust 2021-02-03 254201689 way Sutton House, 2 & 4, Homerton High Street, Lower Clapton, Homerton, London Borough of Hackney, London, Greater London, England, E9 6JQ, United Kingdom tourism attraction 0.429260878198397 United Kingdom gb Europe Northern Europe
+bracewell 2021-02-03 150485 node Bracewell, Pendle, Lancashire, North West England, England, BD23 3JU, United Kingdom place village 0.375 United Kingdom gb Europe Northern Europe
+national review 2021-02-03 107634947 way Review, 131, Bellenden Road, Bellenden, London Borough of Southwark, London, Greater London, England, SE15 4QY, United Kingdom shop books 0.101 United Kingdom gb Europe Northern Europe
+bbc 2021-02-03 101162178 way BBC, 23, Whiteladies Road, High Kingsdown, Tyndall's Park, Bristol, City of Bristol, South West England, England, BS8 2LR, United Kingdom building commercial 0.484120725224289 United Kingdom gb Europe Northern Europe
+air vent 2021-02-03 145610257 way Air Vent, Lordship Lane, Hornsey Park, Hornsey, London Borough of Haringey, London, Greater London, England, N22 5JP, United Kingdom man_made chimney 0.201 United Kingdom gb Europe Northern Europe
+tyndall centre for climate change research 2021-02-03 99663934 way Climatic Research Unit (CRU), Chancellors Drive, Earlham, Norwich, Norfolk, East of England, England, NR4 7TJ, United Kingdom building yes 0.427161274702289 United Kingdom gb Europe Northern Europe
+national institute for biological standards and control 2021-02-03 117169035 way The National Institute for Biological Standards and Control, South Mimms, Ridge, Hertsmere, Hertfordshire, East of England, England, EN6 3QG, United Kingdom landuse industrial 0.9 United Kingdom gb Europe Northern Europe
+emsl 2021-02-03 65408688 node EMSL, Arden Press Way, Phoenix Park Estate, Jubilee Industrial Centre, Norton, North Hertfordshire, Hertfordshire, East of England, England, SG6 1LH, United Kingdom office yes 0.101 United Kingdom gb Europe Northern Europe
+university of london 2021-02-03 59535451 node University of London, Thornhaugh Street, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1H 0XG, United Kingdom tourism information 0.301 United Kingdom gb Europe Northern Europe
+greenpeace 2021-02-03 98060114 way Greenpeace, Canonbury Villas, Highbury, London Borough of Islington, London, Greater London, England, N1 2PN, United Kingdom building office 0.101 United Kingdom gb Europe Northern Europe
+celgene 2021-02-03 302516654 way Celgene, 1, Longwalk Road, Stockley Park, West Drayton, London Borough of Hillingdon, London, Greater London, England, UB11 1AS, United Kingdom building yes 0.101 United Kingdom gb Europe Northern Europe
+department for transport 2021-02-03 96766515 way Department for Transport, 33, Horseferry Road, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1P 4DR, United Kingdom office government 0.768431032071491 United Kingdom gb Europe Northern Europe
+department of business innovation and skills 2021-02-03 18987190 node Department of Business, Innovation and Skills, 1, Victoria Street, Westminster, Victoria, City of Westminster, London, Greater London, England, SW1, United Kingdom office government 0.601 United Kingdom gb Europe Northern Europe
+pakefield 2021-02-03 148091667 way Pakefield, Lowestoft, East Suffolk, Suffolk, East of England, England, United Kingdom place suburb 0.432701719497591 United Kingdom gb Europe Northern Europe
+dmx 2021-02-03 158234190 way DMX Productions, Unit 2, 14-16, Bissell Street, Digbeth, Highgate, Birmingham, West Midlands Combined Authority, West Midlands, England, B5 7HP, United Kingdom office company 0.101 United Kingdom gb Europe Northern Europe
+dartmouth 2021-02-03 139925 node Dartmouth, South Hams, Devon, South West England, England, TQ6 9ES, United Kingdom place town 0.580540443145906 United Kingdom gb Europe Northern Europe
+medium-range weather forecasts in reading 2021-02-03 101206182 way European Centre for Medium-Range Weather Forecasts, Shinfield, Reading, Wokingham, South East, England, RG2 9AX, United Kingdom landuse industrial 0.8 United Kingdom gb Europe Northern Europe
+houses of parliament 2021-02-03 258402540 relation Palace of Westminster, The Terrace, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 0AA, United Kingdom tourism attraction 0.655970619437777 United Kingdom gb Europe Northern Europe
+science & technology facilities council 2021-02-03 103985987 way Royal Observatory, Edinburgh, Observatory Road, Blackford Hill, Blackford, City of Edinburgh, Scotland, EH9 3HJ, United Kingdom tourism attraction 0.360151663261328 United Kingdom gb Europe Northern Europe
+st helens 2021-02-03 258010551 relation St Helens, North West England, England, United Kingdom boundary administrative 0.675666298352635 United Kingdom gb Europe Northern Europe
+volkswagen 2021-02-03 240063450 way Isaac Agnew VW, Boucher Road, Upper Falls, Windsor, Belfast, County Antrim, Northern Ireland, BT12 6HR, United Kingdom shop car 0.55042408908923 United Kingdom gb Europe Northern Europe
+regulatory agency 2021-02-03 17808193 node Medicines and Healthcare Products Regulatory Agency, 123/151, Buckingham Palace Road, Victoria, City of Westminster, London, Greater London, England, SW1W 9UD, United Kingdom office government 0.529555066820797 United Kingdom gb Europe Northern Europe
+isis 2021-02-03 136970771 way ISIS, Road Eight, East Hendred, Vale of White Horse, Oxfordshire, South East, England, OX11 0RD, United Kingdom building industrial 0.411628560800675 United Kingdom gb Europe Northern Europe
+national institute of mental health 2021-02-03 140482817 way Institute of Mental Health, Triumph Road, Wollaton Park, City of Nottingham, East Midlands, England, NG8 1FD, United Kingdom building yes 0.401 United Kingdom gb Europe Northern Europe
+house of commons 2021-02-03 201453802 way House of Commons, Westminster, Millbank, City of Westminster, London, Greater London, England, SW1A 0PW, United Kingdom highway footway 0.375 United Kingdom gb Europe Northern Europe
+royal statistical society 2021-02-03 103932057 way Royal Statistical Society, 12, Errol Street, Saint Luke's, Finsbury, London Borough of Islington, London, Greater London, England, EC1Y 8LX, United Kingdom office association 0.301 United Kingdom gb Europe Northern Europe
+conservatives 2021-02-03 85341767 node Conservatives, The Strand, Lower Walmer, Walmer, Deal, Dover, Kent, South East, England, CT14 7DX, United Kingdom office political_party 0.101 United Kingdom gb Europe Northern Europe
+the university of oxford 2021-02-03 96249903 way Oxford University Museum of Natural History, Parks Road, City Centre, Oxford, Oxfordshire, South East, England, OX1 3PW, United Kingdom tourism museum 0.690225650640271 United Kingdom gb Europe Northern Europe
+ascal 2021-02-03 39636306 node Ascal, Corrard, Belle Isle ED, County Fermanagh, Northern Ireland, BT94 5HY, United Kingdom place locality 0.225 United Kingdom gb Europe Northern Europe
+regenerative medicine institute 2021-02-03 302291462 way Institute of Developmental and Regenerative Medicine (IDRM), Roosevelt Drive, Highfield, Lye Valley, Oxford, Oxfordshire, South East, England, OX3 7NB, United Kingdom building construction 0.301 United Kingdom gb Europe Northern Europe
+rutherford appleton laboratory 2021-02-03 107529003 way Rutherford Appleton Laboratory, Roman Fields, Chilton, Vale of White Horse, Oxfordshire, South East, England, OX11 0UF, United Kingdom amenity laboratory 0.650918373098637 United Kingdom gb Europe Northern Europe
+ncs 2021-02-03 52089143 node NCS, Carlton Court, Team Valley Trading Estate, Lobley Hill, Gateshead, Tyne and Wear, North East England, England, NE11 0AZ, United Kingdom office yes 0.101 United Kingdom gb Europe Northern Europe
+grantham research institute on climate change 2021-02-03 41936693 node Grantham Research Institute on Climate Change and the Environment, Clement's Inn, St Clement Danes, Covent Garden, City of Westminster, London, Greater London, England, WC2A 2AZ, United Kingdom office research 0.872343749103071 United Kingdom gb Europe Northern Europe
+nature medicine 2021-02-03 123758464 way Nature Chinese Medicine Centre, 7, Wellington Terrace, Notting Hill, Royal Borough of Kensington and Chelsea, London, Greater London, England, W2 4LW, United Kingdom building yes 0.201 United Kingdom gb Europe Northern Europe
+brunel university london 2021-02-03 85590905 way Brunel University London, Kingston Lane, Hillingdon, London Borough of Hillingdon, London, Greater London, England, UB8 3PN, United Kingdom amenity university 0.743225044527799 United Kingdom gb Europe Northern Europe
+goonhilly earth station 2021-02-03 122363874 way Goonhilly Satellite Earth Station, Mawgan-in-Meneage, Cornwall, South West England, England, United Kingdom landuse commercial 0.624352223496241 United Kingdom gb Europe Northern Europe
+uk research councils 2021-02-03 258509732 relation UK Research Councils, North Star Avenue, Gorse Hill, Central Swindon North, Swindon, South West England, England, SN2 1ET, United Kingdom building office 0.301 United Kingdom gb Europe Northern Europe
+uk biobank 2021-02-03 139565700 way UK Biobank, Europa Way, Stockport, Greater Manchester, North West England, England, SK3 0SA, United Kingdom building warehouse 0.201 United Kingdom gb Europe Northern Europe
+coalition 2021-02-03 15861155 node Coalition, King's Road, Queen's Park, Brighton, Brighton and Hove, South East, England, BN1 1NB, United Kingdom amenity nightclub 0.101 United Kingdom gb Europe Northern Europe
+mrc institute of hearing research 2021-02-03 104741680 way MRC Institute of Hearing Research, Science Road, Dunkirk, City of Nottingham, East Midlands, England, NG7 2JE, United Kingdom building yes 0.501 United Kingdom gb Europe Northern Europe
+university of st. andrews 2021-02-03 44520497 node University of St Andrews, North Street, St Andrews, Fife, Scotland, KY16 9AJ, United Kingdom amenity university 0.967907552390845 United Kingdom gb Europe Northern Europe
+scott polar research institute 2021-02-03 65100696 node Scott Polar Research Institute, Lensfield Road, Petersfield, Cambridge, Cambridgeshire, East of England, England, CB2 1EH, United Kingdom emergency defibrillator 0.401 United Kingdom gb Europe Northern Europe
+panasonic 2021-02-03 95424837 way Panasonic, Wokingham, South East, England, RG40 2AT, United Kingdom landuse commercial 0.3 United Kingdom gb Europe Northern Europe
+credit suisse 2021-02-03 137065671 way Credit Suisse, 1, Cabot Square, Canary Wharf, Isle of Dogs, London Borough of Tower Hamlets, London, Greater London, England, E14 4QJ, United Kingdom office financial 0.460058384040688 United Kingdom gb Europe Northern Europe
+de montfort university 2021-02-03 102186166 way De Montfort University, Oxford Street, Bede Island, Leicester, City of Leicester, East Midlands, England, LE1 5XT, United Kingdom amenity university 0.301 United Kingdom gb Europe Northern Europe
+panasonic electric works 2021-02-03 193292786 way Panasonic Electric Works, Sunrise Parkway, Linford Wood, Stantonbury, Milton Keynes, South East, England, MK14 6LS, United Kingdom building yes 0.301 United Kingdom gb Europe Northern Europe
+royal centre for defence medicine 2021-02-03 192979920 way Royal Centre for Defence Medicine, Longbridge, Birmingham, West Midlands Combined Authority, West Midlands, England, United Kingdom landuse residential 0.7 United Kingdom gb Europe Northern Europe
+the royal society 2021-02-03 3796847 node The Royal Society, 6-9, Carlton House Terrace, St. James's, Covent Garden, City of Westminster, London, Greater London, England, SW1Y 5AG, United Kingdom building yes 0.947225834784319 United Kingdom gb Europe Northern Europe
+london school of hygiene and tropical medicine 2021-02-03 185180502 way London School of Hygiene and Tropical Medicine, Gower Street, St Giles, Bloomsbury, London Borough of Camden, London, Greater London, England, WC1E 7HT, United Kingdom amenity university 1.14105233650125 United Kingdom gb Europe Northern Europe
+university of grenada 2021-02-03 179679128 way St George's University Grand Anse Campus, Maurice Bishop Highway, Grand Anse, 1473, Grenada amenity university 0.489701883147039 Grenada gd Americas Caribbean
+st george 2021-02-03 633094 node St. George's, 1473, Grenada place town 0.691680176132246 Grenada gd Americas Caribbean
+macmillan 2021-02-03 56703064 node MacMillan, Mallfoot, GRENADA, Grenada natural peak 0.4 Grenada gd Americas Caribbean
+irms 2021-02-03 24118191 node IRMS, ვáƒ<90>ჟáƒ<90>-ფშáƒ<90>ველáƒ<90>ს გáƒ<90>მზირი, ვáƒ<90>ჟáƒ<90>-ფშáƒ<90>ველáƒ<90>ს კვáƒ<90>რტლები, ვáƒ<90>კე-სáƒ<90>ბურთáƒ<90>ლáƒ<9d>ს რáƒ<90>იáƒ<9d>ნი, თბილისი, 0186, სáƒ<90>ქáƒ<90>რთველáƒ<9d> place house 0.101 სáƒ<90>ქáƒ<90>რთველáƒ<9d> ge Asia Western Asia
+eliava institute 2021-02-03 145502768 way გიáƒ<9d>რგი ელიáƒ<90>ვáƒ<90>ს სáƒ<90>ხელáƒ<9d>ბის ბáƒ<90>ქტერიáƒ<9d>ფáƒ<90>გიის, მიკრáƒ<9d>ბიáƒ<9d>ლáƒ<9d>გიისáƒ<90> დáƒ<90> ვირუსáƒ<9d>ლáƒ<9d>გიის ინსტიტუტი, 3, ლევáƒ<90>ნ გáƒ<9d>თუáƒ<90>ს ქუჩáƒ<90>, ვეძისი, ვáƒ<90>კე-სáƒ<90>ბურთáƒ<90>ლáƒ<9d>ს რáƒ<90>იáƒ<9d>ნი, თბილისი, 0160, სáƒ<90>ქáƒ<90>რთველáƒ<9d> amenity hospital 0.001 სáƒ<90>ქáƒ<90>რთველáƒ<9d> ge Asia Western Asia
+desi 2021-02-03 108632894 way დესი, ქვემáƒ<9d> დესი, ყáƒ<90>ზბეგის მუნიციპáƒ<90>ლიტეტი, მცხეთáƒ<90>-მთიáƒ<90>ნეთი, სáƒ<90>ქáƒ<90>რთველáƒ<9d> waterway river 0.275 სáƒ<90>ქáƒ<90>რთველáƒ<9d> ge Asia Western Asia
+republic of georgia 2021-02-03 258029143 relation Ð<90>бхазиÑ<8f> - Ð<90>Ò§Ñ<81>ны, სáƒ<90>ქáƒ<90>რთველáƒ<9d> boundary administrative 0.620982812009427 სáƒ<90>ქáƒ<90>რთველáƒ<9d> ge Asia Western Asia
+red list 2021-02-03 76324808 node The Red List of Plants in Georgia, თბილისის ქუჩის მე-5 შეს, სáƒ<90>ხáƒ<90>ლვáƒ<90>შáƒ<9d>, ბáƒ<90>თუმი, áƒ<90>დლიáƒ<90>, áƒ<90>áƒáƒ<90>რის áƒ<90>ვტáƒ<9d>ნáƒ<9d>მიური რესპუბლიკáƒ<90>, 6411, სáƒ<90>ქáƒ<90>რთველáƒ<9d> tourism information 0.201 სáƒ<90>ქáƒ<90>რთველáƒ<9d> ge Asia Western Asia
+movement for justice 2021-02-03 15256134 node მáƒ<9d>ძრáƒ<90>áƒ<9d>ბáƒ<90> სáƒ<90>მáƒ<90>რთლიáƒ<90>ნი სáƒ<90>ქáƒ<90>რთველáƒ<9d>სáƒ<90>თვის (Political Movement "Justice for Georgia"), ლუკáƒ<90> áƒ<90>სáƒ<90>თიáƒ<90>ნის ქუჩáƒ<90>, ძველი ბáƒ<90>თუმის უბáƒ<90>ნი, ფერიáƒ<90>, ბáƒ<90>თუმი, áƒ<90>დლიáƒ<90>, áƒ<90>áƒáƒ<90>რის áƒ<90>ვტáƒ<9d>ნáƒ<9d>მიური რესპუბლიკáƒ<90>, 6008, სáƒ<90>ქáƒ<90>რთველáƒ<9d> amenity public_building 0.301 სáƒ<90>ქáƒ<90>რთველáƒ<9d> ge Asia Western Asia
+ge 2021-02-03 257665009 relation სáƒ<90>ქáƒ<90>რთველáƒ<9d> boundary administrative 0.738453797356621 სáƒ<90>ქáƒ<90>რთველáƒ<9d> ge Asia Western Asia
+mardaleishvili medical center 2021-02-03 62767859 node მáƒ<90>რდáƒ<90>ლეიშვილის უნრედის ტექნáƒ<9d>ლáƒ<9d>გიისáƒ<90> დáƒ<90> თერáƒ<90>პიის კლინიკáƒ<90>, 4, ლეáƒ<9d> კვáƒ<90>áƒáƒ<90>ძის ქუჩáƒ<90>, ვáƒ<90>კე-სáƒ<90>ბურთáƒ<90>ლáƒ<9d>ს რáƒ<90>იáƒ<9d>ნი, ქვემáƒ<9d> ლისი, მცხეთის მუნიციპáƒ<90>ლიტეტი, მცხეთáƒ<90>-მთიáƒ<90>ნეთი, 0017, სáƒ<90>ქáƒ<90>რთველáƒ<9d> amenity hospital 0.001 სáƒ<90>ქáƒ<90>რთველáƒ<9d> ge Asia Western Asia
+sarc 2021-02-03 84803879 way Sark, Guernsey place island 0.487026464500426 Guernsey gg Europe Northern Europe
+university of health and allied sciences 2021-02-03 169051652 way University of Health and Allied Sciences, Denu - Ho Road, Adaklu, Volta Region, 6803, Ghana tourism hostel 0.601 Ghana gh Africa Western Africa
+university of bamako 2021-02-03 246851633 way Knutsford University College, Bamako Avenue, East Legon, Accra Metropolitan, Greater Accra Region, BOX LG25, Ghana amenity university 0.201 Ghana gh Africa Western Africa
+central food research institute 2021-02-03 74854109 node Food Research Institute, Josif Broz Tito Avenue, Ringway Estates, Kokomlemle, Accra Metropolitan, Greater Accra Region, 9505, Ghana office research 0.301 Ghana gh Africa Western Africa
+ernst & young 2021-02-03 183594557 way Ernst & Young, Airport Residential Area, Accra Metropolitan, Greater Accra Region, Ghana landuse commercial 0.4 Ghana gh Africa Western Africa
+association of universities 2021-02-03 59776675 node Association of African Universities, Trinity Avenue, Accra Metropolitan, Ga East, Greater Accra Region, BOX LG25, Ghana office ngo 0.581311730611622 Ghana gh Africa Western Africa
+ifdc 2021-02-03 19062776 node IFDC, Abafun Crescent, Labone, La, Accra Metropolitan, Greater Accra Region, 10408, Ghana office foundation 0.101 Ghana gh Africa Western Africa
+committee on natural resources 2021-02-03 64828499 node Presidential Committee on Environment and Natural Resources, 5th Avenue Extension, Kanda Estates, Kokomlemle, Accra Metropolitan, Greater Accra Region, NE2 8AH, Ghana office government 0.401 Ghana gh Africa Western Africa
+neem 2021-02-03 164242490 way Neem, Danyame, Kumasi, Ashanti Region, M9VH+94, Ghana highway residential 0.2 Ghana gh Africa Western Africa
+noguchi memorial institute for medical research 2021-02-03 258616093 relation Noguchi Memorial Institute for Medical Research, Akilagpa Sawyerr Road, Little Legon, East Legon, Accra Metropolitan, Greater Accra Region, BOX LG25, Ghana building yes 0.601 Ghana gh Africa Western Africa
+innovations for poverty action 2021-02-03 212438214 way Innovations for Poverty Action, Harun Pegu Avenue, Abouabo, Tamale, Northern Region, 232, Ghana office ngo 0.401 Ghana gh Africa Western Africa
+university of ghana 2021-02-03 164347766 way University of Ghana, Lower Hill Drive, Little Legon, Accra Metropolitan, Greater Accra Region, BOX LG25, Ghana amenity university 0.736359020811001 Ghana gh Africa Western Africa
+us department of the treasury 2021-02-03 66802555 node Department of Feeder Roads (Head Offiice), Treasury Road, Ministries, Accra Metropolitan, Victoriaborg, Greater Accra Region, GA-183-8164, Ghana office government 0.301 Ghana gh Africa Western Africa
+ghana 2021-02-03 258409793 relation Ghana boundary administrative 0.812029140680526 Ghana gh Africa Western Africa
+science policy research unit 2021-02-03 74607278 node Science and Technology Policy Research Institute, Research Crescent, Maamobi, Kokomlemle, Accra Metropolitan, Greater Accra Region, 16033, Ghana office research 0.301 Ghana gh Africa Western Africa
+national council for tertiary education 2021-02-03 171308631 way National Council for Tertiary Education, Trinity Avenue, Accra Metropolitan, Ga East, Greater Accra Region, BOX LG25, Ghana office government 0.501 Ghana gh Africa Western Africa
+thule 2021-02-03 1195220 node Qaanaaq, Avannaata, 3971, Kalaallit Nunaat place town 0.454011689337226 Kalaallit Nunaat gl Americas Northern America
+pmel 2021-02-03 133289772 way Fuels Management PMEL, North Street, Kangerlussuaq, Qeqqata, Kalaallit Nunaat building yes 0.101 Kalaallit Nunaat gl Americas Northern America
+greenland institute of natural resources 2021-02-03 153302829 way Pinngortitaleriffik, 2, Kivioq, Nuussuaq, Nuuk, Sermersooq, 3905, Kalaallit Nunaat office research 0.119931111449547 Kalaallit Nunaat gl Americas Northern America
+greenland 2021-02-03 258682464 relation Kalaallit Nunaat boundary administrative 0.677424867756203 Kalaallit Nunaat gl Americas Northern America
+gambia 2021-02-03 258194808 relation Gambia boundary administrative 0.752242698231784 Gambia gm Africa Western Africa
+gm 2021-02-03 258194808 relation Gambia boundary administrative 0.652242698231784 Gambia gm Africa Western Africa
+medical research council 2021-02-03 69565154 node Medical Research Council, South Bank Road, Basse Santa Su, Basse Fulladu East, Basse, Upper River, Gambia amenity hospital 0.301 Gambia gm Africa Western Africa
+unc 2021-02-03 201161301 way UNC, Rue RO. 370, Kaporo, Kaporo Centre, Ratoma, Conakry, BP 5810, Guinée amenity university 0.258083983169266 Guinée gn Africa Western Africa
+faa 2021-02-03 149031448 way Faranah Airport, N2, Soléa, Sirakémoya, Faranah, Guinée aeroway aerodrome 0.278015094618814 Guinée gn Africa Western Africa
+guinea 2021-02-03 257301923 relation Guinée boundary administrative 0.674714358349369 Guinée gn Africa Western Africa
+equatorial guinea 2021-02-03 257904282 relation Guinea Ecuatorial boundary administrative 0.751043770650231 Guinea Ecuatorial gq Africa Middle Africa
+ikaria 2021-02-03 258844397 relation ΙκαÏ<81>ία, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΙκαÏ<81>ίας, ΠεÏ<81>ιφÎÏ<81>εια Î’ÏŒÏ<81>ειου Αιγαίου, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αιγαίου, Ελλάδα place island 0.454824436051658 Ελλάδα gr Europe Southern Europe
+orthodox academy of crete 2021-02-03 109202482 way Orthodox Academy of Crete, ΚολυμβάÏ<81>ι - Δελιανά, Λιμάνι του ΚολυμβαÏ<81>ίου, Δήμος Πλατανιά, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Χανίων, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 73006, Ελλάδα building yes 0.401 Ελλάδα gr Europe Southern Europe
+ipsos 2021-02-03 17704082 node Ύψος, Δήμος ΚÎÏ<81>κυÏ<81>ας, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚÎÏ<81>κυÏ<81>ας, ΠεÏ<81>ιφÎÏ<81>εια Ιονίων Î<9d>ήσων, ΑποκεντÏ<81>ωμÎνη Διοίκηση Πελοποννήσου, Δυτικής Ελλάδας και Ιονίου, 49083, Ελλάδα place village 0.275 Ελλάδα gr Europe Southern Europe
+technical university of crete 2021-02-03 177964332 way Πολυτεχνείο ΚÏ<81>ήτης, Cluster A, ΚοÏ<81>ακιÎÏ‚, Δήμος Χανίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Χανίων, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 731 33, Ελλάδα amenity university 0.001 Ελλάδα gr Europe Southern Europe
+cyta 2021-02-03 59992481 node Cyta, 15, ΦιλυÏ<81>ών, Κάτω ΗλιοÏ<8d>πολη, ΕÏ<8d>οσμος, Κοινότητα Ευόσμου, Δημοτική Ενότητα Ευόσμου, Δήμος ΚοÏ<81>δελιοÏ<8d> - Ευόσμου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Θεσσαλονίκης, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 56224, Ελλάδα shop mobile_phone 0.101 Ελλάδα gr Europe Southern Europe
+greece 2021-02-03 258453061 relation Ελλάδα boundary administrative 0.798996101984371 Ελλάδα gr Europe Southern Europe
+university of macedonia 2021-02-03 90202405 way Πανεπιστήμιο Μακεδονίας, 156, Εγνατία, ΜητÏ<81>οπολιτική ΠεÏ<81>ιοχή, 1ο Δημοτικό ΔιαμÎÏ<81>ισμα Θεσσαλονίκης, Δημοτική Ενότητα Θεσαλονίκης, Δήμος Θεσσαλονίκης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Θεσσαλονίκης, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 54636, Ελλάδα amenity university 0.351947318522272 Ελλάδα gr Europe Southern Europe
+cha 2021-02-03 258578670 relation ΧαÎ, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Ρόδου, ΠεÏ<81>ιφÎÏ<81>εια Î<9d>οτίου Αιγαίου, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αιγαίου, Ελλάδα place island 0.325 Ελλάδα gr Europe Southern Europe
+aristotle university of thessaloniki 2021-02-03 89323602 way Τμήμα Ψυχολογίας, ΗÏ<81>ακλείας, ΣαÏ<81>άντα Εκκλησίες, 1ο Δημοτικό ΔιαμÎÏ<81>ισμα Θεσσαλονίκης, Δημοτική Ενότητα Θεσαλονίκης, Δήμος Θεσσαλονίκης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Θεσσαλονίκης, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 546 36, Ελλάδα amenity university 0.476021686869768 Ελλάδα gr Europe Southern Europe
+earthquake administration 2021-02-03 108990987 way ΕÏ<81>γαστήÏ<81>ιο Αντισεισμικής Τεχνολογίας, ΚοκκινοποÏ<8d>λου, Δήμος ΖωγÏ<81>άφου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 15773, Ελλάδα amenity laboratory 0.001 Ελλάδα gr Europe Southern Europe
+bank of greece 2021-02-03 258543457 relation ΤÏ<81>άπεζα της Ελλάδος, Σταδίου, Ακαδημία, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 10561, Ελλάδα building public 0.439838583226862 Ελλάδα gr Europe Southern Europe
+eridani 2021-02-03 97771831 way ΗÏ<81>ιδανοÏ<8d>, Κολωνάκι, Αμπελόκηποι, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 11521, Ελλάδα highway residential 0.1 Ελλάδα gr Europe Southern Europe
+xoma 2021-02-03 115973337 way xoma, ΜΑΚΡΙΑ ΛΑΧΙΔΙΑ, ΑÏ<81>Ï„Îμιδα, Δήμος Σπάτων - ΑÏ<81>Ï„Îμιδος, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Ανατολικής Αττικής, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 19016, Ελλάδα highway track 0.21 Ελλάδα gr Europe Southern Europe
+delphi 2021-02-03 123422309 way Δελφοί, Λιβαδειάς - Άμφισσας, Κοινότητα Δελφών, Δημοτική Ενότητα Δελφών, Δήμος Δελφών, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Φωκίδας, ΠεÏ<81>ιφÎÏ<81>εια ΣτεÏ<81>εάς Ελλάδος, ΑποκεντÏ<81>ωμÎνη Διοίκηση Θεσσαλίας - ΣτεÏ<81>εάς Ελλάδος, 33054, Ελλάδα tourism attraction 0.582802507745551 Ελλάδα gr Europe Southern Europe
+alexander fleming biomedical sciences research centre 2021-02-03 174584668 way ΕÏ<81>ευνητικό ΚÎντÏ<81>ο ΒιοϊατÏ<81>ικών Επιστημών «ΑλÎξανδÏ<81>ος ΦλÎμιγκ», 34, ΦλÎμινγκ, ΒάÏ<81>κιζα, Κοινότητα ΒάÏ<81>ης, Δημοτική Ενότητα ΒάÏ<81>ης, Δήμος ΒάÏ<81>ης - ΒοÏ<8d>λας - ΒουλιαγμÎνης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Ανατολικής Αττικής, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 16672, Ελλάδα building office 0.001 Ελλάδα gr Europe Southern Europe
+foodini 2021-02-03 73698678 node Foodini, Αμυκλών, ΡιζοÏ<8d>πολη, Συνοικία Ριζουπόλεως, 5º Δημοτικό ΔιαμÎÏ<81>ισμα Αθηνών, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 11142, Ελλάδα amenity restaurant 0.101 Ελλάδα gr Europe Southern Europe
+interior laboratory 2021-02-03 103979613 way laboratory, Γιάννη ΚοÏ<81>νάÏ<81>ου, ΗÏ<81>άκλειο, Δημοτική Κοινότητα ἩÏ<81>ακλείου, Δήμος ΗÏ<81>ακλείου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΗÏ<81>ακλείου, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 714 10, Ελλάδα building yes 0.111 Ελλάδα gr Europe Southern Europe
+hellenic pasteur institute 2021-02-03 258616327 relation Eλληνικό ΙνστιτοÏ<8d>το ΠαστÎÏ<81>, 127, Ι. Αθανασιάδου, ΚουντουÏ<81>ιώτικα, Αμπελόκηποι, Αθήνα, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 11521, Ελλάδα amenity research_institute 0.001 Ελλάδα gr Europe Southern Europe
+athena swan 2021-02-03 373873 node Αθήνα, Αθήνα - Θεσσαλονίκη - ΕÏ<8d>ζωνοι, ΤσαλαβοÏ<8d>τα, 4ο Δημοτικό ΔιαμÎÏ<81>ισμα ΠεÏ<81>ιστεÏ<81>ίου, Δήμος ΠεÏ<81>ιστεÏ<81>ίου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΔυτικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 12131, Ελλάδα highway motorway_junction 0.369728853996096 Ελλάδα gr Europe Southern Europe
+mesopotamia 2021-02-03 980059 node Μεσοποταμία, Δήμος ΚαστοÏ<81>ιάς, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚαστοÏ<81>ιάς, ΠεÏ<81>ιφÎÏ<81>εια Δυτικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΗπείÏ<81>ου - Δυτικής Μακεδονίας, 52050, Ελλάδα place town 0.449569974883352 Ελλάδα gr Europe Southern Europe
+republic of macedonia 2021-02-03 23115231 node Republic, ΕλευθεÏ<81>ίου ΒενιζÎλου, Παλιά ΑγοÏ<81>ά, Γιαννιτσά, Δήμος Î Îλλας, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Î Îλλας, ΠεÏ<81>ιφÎÏ<81>εια ΚεντÏ<81>ικής Μακεδονίας, ΑποκεντÏ<81>ωμÎνη Διοίκηση Μακεδονίας - ΘÏ<81>άκης, 58100, Ελλάδα amenity cafe 0.101 Ελλάδα gr Europe Southern Europe
+greek parliament 2021-02-03 258491953 relation Βουλή των Ελλήνων, Πλατεία Αγνώστου ΣτÏ<81>ατιώτου, Κολωνάκι, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, Ελλάδα tourism attraction 0.520183376106203 Ελλάδα gr Europe Southern Europe
+oase 2021-02-03 785263 node Όαση, Δήμος Χανίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα Χανίων, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 73100, Ελλάδα place village 0.275 Ελλάδα gr Europe Southern Europe
+university of crete 2021-02-03 52030770 node House of Europe, Μακεδονίας, Δήμος ΡεθÏ<8d>μνης, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΡεθÏ<8d>μνης, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 74123, Ελλάδα tourism hotel 0.101 Ελλάδα gr Europe Southern Europe
+phobos 2021-02-03 220395190 way Phobos, κ. Λεωνιδίου, Δημοτική Ενότητα Λεωνιδίου, Δήμος Î<9d>ότιας ΚυνουÏ<81>ίας, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΑÏ<81>καδίας, ΠεÏ<81>ιφÎÏ<81>εια Πελοποννήσου, ΑποκεντÏ<81>ωμÎνη Διοίκηση Πελοποννήσου, Δυτικής Ελλάδας και Ιονίου, 223 00, Ελλάδα natural cliff 0.3 Ελλάδα gr Europe Southern Europe
+university of manchester archaeological unit 2021-02-03 631961 node ΑÏ<81>χαιολογικό Μουσείο, 2, Ξανθουδίδου Στεφ., ΗÏ<81>άκλειο, Δημοτική Κοινότητα ἩÏ<81>ακλείου, Δήμος ΗÏ<81>ακλείου, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΗÏ<81>ακλείου, ΠεÏ<81>ιφÎÏ<81>εια ΚÏ<81>ήτης, ΑποκεντÏ<81>ωμÎνη Διοίκηση ΚÏ<81>ήτης, 71202, Ελλάδα tourism museum 0.383021208265432 Ελλάδα gr Europe Southern Europe
+athena 2021-02-03 298973026 node Αθήνα, Δήμος Αθηναίων, ΠεÏ<81>ιφεÏ<81>ειακή Ενότητα ΚεντÏ<81>ικοÏ<8d> ΤομÎα Αθηνών, ΠεÏ<81>ιφÎÏ<81>εια Αττικής, ΑποκεντÏ<81>ωμÎνη Διοίκηση Αττικής, 10667, Ελλάδα place city 0.732722808213196 Ελλάδα gr Europe Southern Europe
+guatemala 2021-02-03 258193481 relation Guatemala boundary administrative 0.810709287382318 Guatemala gt Americas Central America
+gw 2021-02-03 257557052 relation Guiné-Bissau boundary administrative 0.647675005742315 Guiné-Bissau gw Africa Western Africa
+minister of industry 2021-02-03 58959117 node Minister office MOA, Shiv Chanderpaul Drive, Queenstown, City of Georgetown, Plaisance-Industry Local Government, Demerara-Mahaica, 413741, Guyana office government 0.301 Guyana gy Americas South America
+caprisa 2021-02-03 186241405 way Caprisa, 4a Calle, Centro de Comayagüela, Comayagüela, Tegucigalpa, Distrito Central, Francisco Morazán, 12101, Honduras shop yes 0.101 Honduras hn Americas Central America
+honduras 2021-02-03 257416285 relation Honduras boundary administrative 0.801423826610442 Honduras hn Americas Central America
+stap 2021-02-03 182269951 way Stap, Općina Starigrad, Zadarska županija, Hrvatska landuse meadow 0.3 Hrvatska hr Europe Southern Europe
+brac 2021-02-03 258816711 relation BraÄ<8d>, Splitsko-dalmatinska županija, Hrvatska place island 0.480082774710875 Hrvatska hr Europe Southern Europe
+nustar 2021-02-03 3942294 node Nuštar, Općina Nuštar, Vukovarsko-srijemska županija, 32221, Hrvatska place village 0.379599826756761 Hrvatska hr Europe Southern Europe
+croatia 2021-02-03 257878830 relation Hrvatska boundary administrative 0.783685743027873 Hrvatska hr Europe Southern Europe
+eso 2021-02-03 259184791 relation Iž, Grad Zadar, Zadarska županija, 23284, Hrvatska place island 0.409231479174104 Hrvatska hr Europe Southern Europe
+pag 2021-02-03 258305699 relation Pag, Zadarska županija, Hrvatska place island 0.559094572124133 Hrvatska hr Europe Southern Europe
+university of split 2021-02-03 124254987 way SveuÄ<8d>iliÅ¡te u Splitu, VranÄ<8d>ićeva, Pisano Kame, Split 3, Split, Grad Split, Splitsko-dalmatinska županija, 21111, Hrvatska amenity university 0.101 Hrvatska hr Europe Southern Europe
+university of rijeka 2021-02-03 103463556 way Kampus Trsat, Tome Strižića, MarÄ<8d>i, Mjesni odbor Gornja Vežica, Grad Rijeka, Primorsko-goranska županija, 51216, Hrvatska amenity university 0.101 Hrvatska hr Europe Southern Europe
+university of zagreb 2021-02-03 107714436 way Klinika za psihijatriju VrapÄ<8d>e, 32, BolniÄ<8d>ka cesta, Stenjevec, Gradska Ä<8d>etvrt Podsused - VrapÄ<8d>e, Zagreb, Grad Zagreb, 10090, Hrvatska amenity hospital 0.101 Hrvatska hr Europe Southern Europe
+international medical corps 2021-02-03 16244363 node International Medical Corps, RC 700A, 1re Maniche, Maniche, Commune Maniche, Arrondissement des Cayes, Département du Sud, Ayiti amenity doctors 0.301 Ayiti ht Americas Caribbean
+iscf 2021-02-03 21279485 node InstitutionScolaire Claire Fontaine, Ruelle Capois la mort, Cité Blue Hills, 3e Petite Anse, Cap-Haïtien, Commune Cap-Haïtien, Arrondissement de Cap-Haïtien, Département du Nord, HT1113, Ayiti amenity school 0.001 Ayiti ht Americas Caribbean
+cnsa 2021-02-03 172983686 way Coordination Nationale de la Sécurité Alimentaire, 93, Impasse Pétion, Coeur de Palmier, 7e Bellevue Chardonnières, Petyonvil, Arrondissement de Port-au-Prince, Département de l'Ouest, HT6141, Ayiti building public 0.001 Ayiti ht Americas Caribbean
+time department 2021-02-03 71519977 node Break Time Bar Restaurant, 25, Rue Oreste Zamor, Les Lattes, 1re Juanaria, Hinche, Commune Hinche, Arrondissement de Hinche, Département du Centre, 5110, Ayiti amenity restaurant 0.101 Ayiti ht Americas Caribbean
+civil protection department 2021-02-03 212453122 way Protection Civil SMA, Saint Michel de l’Attalaye, Commune de Saint Michel de l'Attalaye, Arrondissement de Marmelade, Département de l'Artibonite, HT4520, Ayiti landuse residential 0.4 Ayiti ht Americas Caribbean
+commerce department 2021-02-03 169235488 way Rue du Commerce, Grande Passe, 1re Paricot, Bois Marguerite, Commune Port-à -Piment, Arrondissement des Côteaux, Département du Sud, Ayiti highway unclassified 0.2 Ayiti ht Americas Caribbean
+mandon 2021-02-03 5667738 node Mandon, Commune Cavaillon, Arrondissement d’Aquin, Département du Sud, Ayiti place village 0.375 Ayiti ht Americas Caribbean
+haiti 2021-02-03 257948040 relation Ayiti boundary administrative 0.689458681171941 Ayiti ht Americas Caribbean
+stm 2021-02-03 258431782 relation Commune de Saint Michel de l'Attalaye, Arrondissement de Marmelade, Département de l'Artibonite, Ayiti boundary administrative 0.35 Ayiti ht Americas Caribbean
+fodor 2021-02-03 162880526 way Fodor, Teleki utca, Dunafalva, Bajai járás, Bács-Kiskun megye, Dél-Alföld, Alföld és Észak, 6513, Magyarország amenity pub 0.101 Magyarország hu Europe Eastern Europe
+eötvös university 2021-02-03 123965591 way Eötvös Loránd Tudományegyetem Bölcsészettudományi Kar, 4-8, Múzeum körút, Belváros, V. kerület, Budapest, Közép-Magyarország, 1088, Magyarország amenity university 0.659079404587545 Magyarország hu Europe Eastern Europe
+national university of public service 2021-02-03 258425305 relation Nemzeti Közszolgálati Egyetem, 2, Ludovika tér, Orczy Fórum Városközpont, Orczy negyed, VIII. kerület, Budapest, Közép-Magyarország, 1083, Magyarország amenity university 0.001 Magyarország hu Europe Eastern Europe
+hungary 2021-02-03 257662998 relation Magyarország boundary administrative 0.808284595263048 Magyarország hu Europe Eastern Europe
+nistar 2021-02-03 60976160 node Nyistár, Bakonya, Pécsi járás, Baranya megye, Dél-Dunántúl, Dunántúl, 7675, Magyarország place locality 0.125 Magyarország hu Europe Eastern Europe
+tokai 2021-02-03 258396132 relation Tokaj, Tokaji járás, Borsod-Abaúj-Zemplén megye, Észak-Magyarország, Alföld és Észak, Magyarország boundary administrative 0.519419743521435 Magyarország hu Europe Eastern Europe
+un refugee agency 2021-02-03 122135603 way ENSZ Menekültügyi Főbiztosság, 5/A-D, Ipoly utca, Újlipótváros, XIII. kerület, Budapest, Közép-Magyarország, 1133, Magyarország office government 0.001 Magyarország hu Europe Eastern Europe
+ceu 2021-02-03 165252734 way Central European University, Október 6. utca, Lipótváros, V. kerület, Budapest, Közép-Magyarország, 1051, Magyarország amenity university 0.449444237200763 Magyarország hu Europe Eastern Europe
+kek 2021-02-03 258398258 relation Kék, Kemecsei járás, Szabolcs-Szatmár-Bereg megye, Észak-Alföld, Alföld és Észak, 4515, Magyarország boundary administrative 0.448129702072077 Magyarország hu Europe Eastern Europe
+kaposi 2021-02-03 66535112 node Kaposi, Erdőbénye, Tokaji járás, Borsod-Abaúj-Zemplén megye, Észak-Magyarország, Alföld és Észak, 3932, Magyarország place locality 0.225 Magyarország hu Europe Eastern Europe
+office of diversity 2021-02-03 157561731 way Diversity, Ã<81>sotthalom, Mórahalmi járás, Csongrád-Csanád megye, Dél-Alföld, Alföld és Észak, 6783, Magyarország natural grassland 0.3 Magyarország hu Europe Eastern Europe
+tass 2021-02-03 258122144 relation Tass, Kunszentmiklósi járás, Bács-Kiskun megye, Dél-Alföld, Alföld és Észak, 6098, Magyarország boundary administrative 0.532228989952608 Magyarország hu Europe Eastern Europe
+european institute of innovation and technology 2021-02-03 79975212 node EIT, Neumann János utca, Infopark, XI. kerület, Budapest, Közép-Magyarország, 1117, Magyarország office government 0.001 Magyarország hu Europe Eastern Europe
+hungarian academy of sciences 2021-02-03 256816091 relation Magyar Tudományos Akadémia, 9, Széchenyi István tér, Lipótváros, V. kerület, Budapest, Közép-Magyarország, 1051, Magyarország tourism attraction 0.578948761652427 Magyarország hu Europe Eastern Europe
+biologicals e 2021-02-03 146927310 way 82, GlaxoSmithKline Biologicals Gyógyszergyártó és Forgalmazó Kft., Haraszt, Gödöllő, Gödöllői járás, Pest megye, Közép-Magyarország, 2100, Magyarország landuse industrial 0.4 Magyarország hu Europe Eastern Europe
+fold 2021-02-03 46893027 node Föld, Ifjúsági sétány, Népliget, X. kerület, Budapest, Közép-Magyarország, 1101, Magyarország tourism artwork 0.378282845036744 Magyarország hu Europe Eastern Europe
+eötvös loránd university 2021-02-03 123965591 way Eötvös Loránd Tudományegyetem Bölcsészettudományi Kar, 4-8, Múzeum körút, Belváros, V. kerület, Budapest, Közép-Magyarország, 1088, Magyarország amenity university 0.759079404587545 Magyarország hu Europe Eastern Europe
+university of szeged 2021-02-03 258169251 relation Szegedi Tudományegyetem, 13, Dugonics tér, Belváros, Szeged, Szegedi járás, Csongrád-Csanád megye, Dél-Alföld, Alföld és Észak, 6720, Magyarország building university 0.577156057530702 Magyarország hu Europe Eastern Europe
+google earth 2021-02-03 210747083 way Jalan Saxophone, RW 05, Kel.Tunggulwulung, Landungsari, Malang, Jawa Timur, 65144, Indonesia highway service 0.075 Indonesia id Asia South-Eastern Asia
+srg 2021-02-03 196603793 way Bandar Udara Ahmad Yani, Jalan Taman Avonia VI, RW 04, Jerakah, Jawa Tengah, 50144, Indonesia aeroway aerodrome 0.394667642378454 Indonesia id Asia South-Eastern Asia
+pedot 2021-02-03 10559819 node Gunung Pedot, Jember, Jawa Timur, Indonesia natural peak 0.4 Indonesia id Asia South-Eastern Asia
+saiful islam 2021-02-03 206069525 way Dokter Hewan Saiful Islam, Jalan Awang Long, Gunung Elai, Kalimantan Timur, 75311, Indonesia amenity veterinary 0.201 Indonesia id Asia South-Eastern Asia
+university of gadjah mada 2021-02-03 207160405 way Universitas Kanjuruhan, Jalan Sudanco Supriyadi, RW 06 Kel. Sukun, Sukun, Kota Malang, Bandungrejosari, Malang, Jawa Timur, 65147, Indonesia amenity university 0.001 Indonesia id Asia South-Eastern Asia
+inaoe 2021-02-03 13470927 node Inaoe, Rote Ndao, Nusa Tenggara Timur, Indonesia place village 0.375 Indonesia id Asia South-Eastern Asia
+indonesian institute of sciences 2021-02-03 118440854 way Lembaga Ilmu Pengetahuan Indonesia, Jalan Jenderal Gatot Subroto, RW 01, Kuningan Barat, Mampang Prapatan, Daerah Khusus Ibukota Jakarta, 12950, Indonesia man_made works 0.001 Indonesia id Asia South-Eastern Asia
+mai-mai 2021-02-03 13953284 node Mai Mai, Papua Barat, Indonesia place village 0.475 Indonesia id Asia South-Eastern Asia
+southwest melas 2021-02-03 13958295 node Melas, Karo, Sumatera Utara, 22152, Indonesia place village 0.375 Indonesia id Asia South-Eastern Asia
+id 2021-02-03 257918359 relation Indonesia boundary administrative 0.815582040548682 Indonesia id Asia South-Eastern Asia
+pcb 2021-02-03 181632598 way Bandar Udara Pondok Cabe, Jalan Kayu Manis, Pondok Cabe Udik, Pamulang, Tangerang Selatan, Banten, 15418, Indonesia aeroway aerodrome 0.412601922414653 Indonesia id Asia South-Eastern Asia
+liang bua 2021-02-03 51149275 node Liang Bua, Jalan Ruteng-Reo, Barang, Manggarai, Nusa Tenggara Timur, Indonesia natural cave_entrance 0.588895403331395 Indonesia id Asia South-Eastern Asia
+gns 2021-02-03 216515106 way Bandar Udara Binaka, Nias, Sumatera Utara, Indonesia aeroway aerodrome 0.382027115756698 Indonesia id Asia South-Eastern Asia
+indonesia 2021-02-03 257918359 relation Indonesia boundary administrative 0.915582040548682 Indonesia id Asia South-Eastern Asia
+nda 2021-02-03 136395382 way Bandar Udara Bandaneira, Jl. Rajawali, Kampung Baru, Kepulauan Banda, Maluku, 97593, Indonesia aeroway aerodrome 0.488670877038008 Indonesia id Asia South-Eastern Asia
+la stampa 2021-02-03 13921820 node Stampa, Tapanuli Selatan, Sumatera Utara, Indonesia place village 0.475 Indonesia id Asia South-Eastern Asia
+padjadjaran university 2021-02-03 233157303 way Universitas Padjadjaran, Jalan Raya Jatinangor, Bandung, Jawa Barat, 45363, Indonesia amenity university 0.101 Indonesia id Asia South-Eastern Asia
+national institute of aeronautics and space 2021-02-03 198403505 way LAPAN, 1, Jalan Pemuda, RW 08, Jati, Pulo Gadung, Jakarta Timur, Daerah Khusus Ibukota Jakarta, 13220, Indonesia office government 0.416374248267951 Indonesia id Asia South-Eastern Asia
+cifor 2021-02-03 154300870 way Cifor, Bubulak, Jawa Barat, 16112, Indonesia highway trunk 0.2 Indonesia id Asia South-Eastern Asia
+bina nusantara university 2021-02-03 301970874 way Universitas BINUS (Bina Nusantara) Kampus Syahdan, 9, Jalan KH. Syahdan, RW 12, Palmerah, Jakarta Barat, Daerah Khusus Ibukota Jakarta, 11480, Indonesia amenity university 0.201 Indonesia id Asia South-Eastern Asia
+apha 2021-02-03 13638301 node Apha, Sawang, Aceh Selatan, Aceh, Indonesia place village 0.375 Indonesia id Asia South-Eastern Asia
+dprk 2021-02-03 198672978 way DPRK, Jalan Panglateh, Banda Sakti, Lhokseumawe, Aceh, 24351, Indonesia building commercial 0.101 Indonesia id Asia South-Eastern Asia
+eijkman institute for molecular biology 2021-02-03 199379553 way Lembaga Eijkman, 69, Jalan Pangeran Diponegoro, RW 05, Kenari, Senen, Jakarta Pusat, Daerah Khusus Ibukota Jakarta, 10430, Indonesia building yes 0.101 Indonesia id Asia South-Eastern Asia
+laetoli 2021-02-03 10742285 node Bulu Latoli, Sulawesi Selatan, Indonesia natural peak 0.3 Indonesia id Asia South-Eastern Asia
+nia 2021-02-03 259533884 relation Nias, Sumatera Utara, Indonesia place island 0.553227551541546 Indonesia id Asia South-Eastern Asia
+undp 2021-02-03 68184861 node UNDP, Jalan Kampung Bali 16, RW 10, Kampung Bali, Tanah Abang, Jakarta Pusat, Daerah Khusus Ibukota Jakarta, 10250, Indonesia office ngo 0.101 Indonesia id Asia South-Eastern Asia
+bca 2021-02-03 82555649 node BCA, 29-31, Jalan Jenderal Sudirman, RW 02, Setiabudi, Daerah Khusus Ibukota Jakarta, 12920, Indonesia amenity bank 0.48265030002841 Indonesia id Asia South-Eastern Asia
+tempel 2021-02-03 258758871 relation Tempel, Sleman, Daerah Istimewa Yogyakarta, 55552, Indonesia boundary administrative 0.5 Indonesia id Asia South-Eastern Asia
+pdip 2021-02-03 72671249 node PDIP, Jalan Kinibalu, Banjarmasin, Kalimantan Selatan, 70114, Indonesia office political_party 0.101 Indonesia id Asia South-Eastern Asia
+bandung institute of technology indonesia 2021-02-03 132073472 way Institut Teknologi Bandung, 10-12, Ganesha, Lebak Siliwangi, Jawa Barat, 40132, Indonesia amenity university 0.646170188407265 Indonesia id Asia South-Eastern Asia
+bandung institute of technology 2021-02-03 132073472 way Institut Teknologi Bandung, 10-12, Ganesha, Lebak Siliwangi, Jawa Barat, 40132, Indonesia amenity university 0.546170188407265 Indonesia id Asia South-Eastern Asia
+center for international forestry research 2021-02-03 242934787 way Center for International Forestry Research (CIFOR), Situ Gede, Jawa Barat, 16115, Indonesia landuse research 0.786244954737813 Indonesia id Asia South-Eastern Asia
+gadjah mada university 2021-02-03 117923558 way Gadjah Mada University Press, Jalan Teknika, Pogung Baru, Sinduadi, Mlati, Sleman, Daerah Istimewa Yogyakarta, 55222, Indonesia craft bookbinder 0.301 Indonesia id Asia South-Eastern Asia
+department of pharmacy 2021-02-03 161761878 way Departemen Farmasi, Jalan Profesor Dokter Mahar Mardjono, Pondok Cina, Jawa Barat, 16424, Indonesia building yes 0.101 Indonesia id Asia South-Eastern Asia
+cctv 2021-02-03 73875815 node CCTV, Turgo, Dusun Tegalmindi, Sleman, Daerah Istimewa Yogyakarta, 55786, Indonesia leisure park 0.25 Indonesia id Asia South-Eastern Asia
+nasem 2021-02-03 13768087 node Nasem, Merauke, Papua, Indonesia place locality 0.225 Indonesia id Asia South-Eastern Asia
+ppr 2021-02-03 225747104 way Bandar Udara Pasir Pangaraian, Jalan Rambah Utama, Kecamatan Rambah Samo, Rokan Hulu, Riau, Indonesia aeroway aerodrome 0.324987614684334 Indonesia id Asia South-Eastern Asia
+national university of ireland 2021-02-03 148002637 way National University of Ireland, 49, Merrion Square East, Dublin, Dublin 2, Leinster, DO2 VY60, Éire / Ireland building house 0.401 Éire / Ireland ie Europe Northern Europe
+thermo fisher 2021-02-03 98913796 way Thermo-Fisher, Carrigaline, Ballincollig - Carrigaline, County Cork, Munster, Éire / Ireland landuse industrial 0.4 Éire / Ireland ie Europe Northern Europe
+university college cork 2021-02-03 219587720 way IRA Volunteers Memorial and Gravesite, College Road, Gillabbey B, Cork, County Cork, Munster, T12 ND89, Éire / Ireland historic memorial 0.201 Éire / Ireland ie Europe Northern Europe
+esri 2021-02-03 144706611 way The Economic and Social Research Institute, Hanover Street East, Dublin, Dublin 2, Leinster, D02 WY65, Éire / Ireland building office 0.269299555080491 Éire / Ireland ie Europe Northern Europe
+pheic 2021-02-03 258835961 relation Peakroe, Aughrim ED, Athenry-Oranmore Municipal District, County Galway, Connacht, Éire / Ireland boundary administrative 0.25 Éire / Ireland ie Europe Northern Europe
+ncse 2021-02-03 76554855 node National Council for Special Education, Heritage Business Park, Mahon Industrial Estate, Mahon, Mahon B, Cork, County Cork, Munster, T12 XK5R, Éire / Ireland office government 0.001 Éire / Ireland ie Europe Northern Europe
+cams 2021-02-03 258628095 relation Cams, Drumfin ED, Ballymote-Tubbercurry Municipal District, County Sligo, Connacht, Éire / Ireland boundary administrative 0.35 Éire / Ireland ie Europe Northern Europe
+workers' party 2021-02-03 60364423 node The Workers' Party, 24/25a, Hill Street, Rotunda A ED, Dublin, Dublin 1, Leinster, D01 P5W9, Éire / Ireland office political_party 0.201 Éire / Ireland ie Europe Northern Europe
+republic of ireland 2021-02-03 258361977 relation Éire / Ireland boundary administrative 0.873845787392843 Éire / Ireland ie Europe Northern Europe
+national university of ireland galway 2021-02-03 128311337 way National University of Ireland, Galway, University Road, Nun's Island, Galway Municipal District, Cathair na Gaillimhe, County Galway, Connacht, H91 F5Y3, Éire / Ireland amenity university 0.501 Éire / Ireland ie Europe Northern Europe
+abbvie 2021-02-03 258648097 relation AbbVie, Calry ED, Sligo Municipal Borough District, County Sligo, Connacht, F91 XH39, Éire / Ireland landuse industrial 0.3 Éire / Ireland ie Europe Northern Europe
+intel ireland 2021-02-03 188372471 way Intel Ireland, Collinstown Industrial Park, Leixlip ED, The Municipal District of Celbridge — Leixlip, County Kildare, Leinster, W23 N2T7, Éire / Ireland highway service 0.275 Éire / Ireland ie Europe Northern Europe
+trinity college dublin 2021-02-03 165744701 way Trinity College Dublin, College Green, Mansion House A ED, Dublin, Dublin 2, Leinster, D02 HR67, Éire / Ireland amenity university 0.820634411605724 Éire / Ireland ie Europe Northern Europe
+newgrange 2021-02-03 96120841 way Newgrange, Towpath, Duleek, The Municipal District of Laytown — Bettystown, County Meath, Leinster, C15 XW28, Éire / Ireland tourism attraction 0.529041378051631 Éire / Ireland ie Europe Northern Europe
+nci 2021-02-03 258574096 relation National College of Ireland, Mayor Square, International Financial Services Centre, North Dock, Dublin, County Dublin, Leinster, Éire / Ireland amenity college 0.402778707896871 Éire / Ireland ie Europe Northern Europe
+research and development division 2021-02-03 83761129 node HSE, Research and Development, Parkgate Street, Islandbridge, Phoenix Park ED, Dublin, Dublin 8, Leinster, D08 YFF1, Éire / Ireland office government 0.301 Éire / Ireland ie Europe Northern Europe
+mayo foundation 2021-02-03 39624203 node Hospice Shop, Market Street, Ballina Urban ED, Ballina Municipal District, County Mayo, Connacht, F26 P6C1, Éire / Ireland shop charity 0.101 Éire / Ireland ie Europe Northern Europe
+physics division 2021-02-03 94426972 way Science Centre (North), Route1, Roebuck, Dundrum ED, Dundrum, Dún Laoghaire-Rathdown, County Dublin, Leinster, D04 XT65, Éire / Ireland building university 0.001 Éire / Ireland ie Europe Northern Europe
+ireland 2021-02-03 258361977 relation Éire / Ireland boundary administrative 0.873845787392843 Éire / Ireland ie Europe Northern Europe
+ucd 2021-02-03 6829023 node UCD, Wynnsward Drive, Roebuck, Clonskeagh-Belfield ED, Dundrum, Dún Laoghaire-Rathdown, County Dublin, Leinster, D14 NH72, Éire / Ireland place house 0.101 Éire / Ireland ie Europe Northern Europe
+royal irish academy 2021-02-03 156774738 way Royal Irish Academy, 19, Dawson Street, Dublin, Dublin 2, Leinster, 2, Éire / Ireland tourism attraction 0.758662567556056 Éire / Ireland ie Europe Northern Europe
+bull 2021-02-03 50108022 node The Bull, Kenmare Municipal District, County Kerry, Munster, Éire / Ireland natural peak 0.4 Éire / Ireland ie Europe Northern Europe
+alexion 2021-02-03 203009581 way Alexion, Cruiserath Road, College Business & Technology Park, Blanchardstown-Mulhuddart ED, Blanchardstown, Fingal, Dublin 15, Leinster, D15 R925, Éire / Ireland man_made works 0.101 Éire / Ireland ie Europe Northern Europe
+allergan 2021-02-03 296678202 way Allergan, Westport northern bypass, Westport Harbour, Westport Rural ED, Westport-Belmullet Municipal District, County Mayo, Connacht, F28 KX88, Éire / Ireland building industrial 0.101 Éire / Ireland ie Europe Northern Europe
+ardi 2021-02-03 226577 node Ardee, The Municipal District of Ardee, County Louth, Leinster, A92 H006, Éire / Ireland place town 0.370185956704757 Éire / Ireland ie Europe Northern Europe
+broad 2021-02-03 258639397 relation Broad, Trim Rural, The Municipal District of Trim, County Meath, Leinster, Éire / Ireland boundary administrative 0.35 Éire / Ireland ie Europe Northern Europe
+noc 2021-02-03 133056952 way Ireland West Airport Knock, R376, Sonnagh ED, Claremorris-Swinford Municipal District, County Mayo, Connacht, Éire / Ireland aeroway aerodrome 0.402778707896871 Éire / Ireland ie Europe Northern Europe
+merck sharp & dohme 2021-02-03 5765653 node Merck Sharp & Dohme, R448, Pollerton Little, Carlow Rural, The Municipal District of Carlow, County Carlow, Leinster, R93 Y381, Éire / Ireland man_made works 0.301 Éire / Ireland ie Europe Northern Europe
+ncbi 2021-02-03 297995042 node NCBI, High Street, Kilkenny No.1 Urban, The Municipal District of Kilkenny City, County Kilkenny, Leinster, R95 V6TE, Éire / Ireland shop charity 0.101 Éire / Ireland ie Europe Northern Europe
+maynooth university 2021-02-03 55317797 node Dance, River Apartments, Maynooth ED, The Municipal District of Clane — Maynooth, County Kildare, Leinster, KILDARE, Éire / Ireland tourism artwork 0.101 Éire / Ireland ie Europe Northern Europe
+county kildare 2021-02-03 258403200 relation County Kildare, Leinster, Éire / Ireland boundary administrative 0.723362011212736 Éire / Ireland ie Europe Northern Europe
+us department of defense 2021-02-03 258792189 relation Department of Defense, Station Road, Morristownbiller ED, The Municipal District of Kildare — Newbridge, County Kildare, Leinster, W12 AD93, Éire / Ireland office government 0.622075306013723 Éire / Ireland ie Europe Northern Europe
+university college dublin 2021-02-03 94729783 way James Joyce Library, Route1, Roebuck, Dundrum ED, Dundrum, Dún Laoghaire-Rathdown, County Dublin, Leinster, D04 XT65, Éire / Ireland amenity library 0.101 Éire / Ireland ie Europe Northern Europe
+department of defense 2021-02-03 258792189 relation Department of Defense, Station Road, Morristownbiller ED, The Municipal District of Kildare — Newbridge, County Kildare, Leinster, W12 AD93, Éire / Ireland office government 0.622075306013723 Éire / Ireland ie Europe Northern Europe
+news & views 2021-02-03 17702681 node News and Views, Main Street, Bundoran Urban ED, Donegal Municipal District, County Donegal, Éire / Ireland shop convenience 0.201 Éire / Ireland ie Europe Northern Europe
+iarc 2021-02-03 70264067 node Irish Ancestry Research Centre, O'Connell Street, Shannon B, The Metropolitan District of Limerick City, County Limerick, Munster, V94 951K, Éire / Ireland office association 0.001 Éire / Ireland ie Europe Northern Europe
+technion-israel institute of technology 2021-02-03 107068371 way ×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל amenity university 0.481395763639811 ישר×<90>ל il Asia Western Asia
+tel-aviv university 2021-02-03 37018800 node תל ×<90>ביב ×<90>×•× ×™×‘×¨×¡×™×˜×”, ×<90>יילון דרו×<9d>, תל ×<90>ביב - יפו, ×<90>×•× ×™×‘×¨×¡×™×˜×ª ת"×<90>, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל railway station 0.339805842395375 ישר×<90>ל il Asia Western Asia
+university of haifa 2021-02-03 103080369 way ×<90>×•× ×™×‘×¨×¡×™×˜×ª חיפה, ×<90>ב×<90> חושי, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל amenity university 0.520356220829959 ישר×<90>ל il Asia Western Asia
+israel institute of technology 2021-02-03 107068371 way ×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל amenity university 0.481395763639811 ישר×<90>ל il Asia Western Asia
+technion 2021-02-03 112050731 way ×˜×›× ×™×•×Ÿ, קרית ×”×˜×›× ×™×•×Ÿ, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל highway platform 0.1 ישר×<90>ל il Asia Western Asia
+hebrew university of jerusalem 2021-02-03 6058012 node ×”×<90>×•× ×™×‘×¨×¡×™×˜×” העברית בירושלי×<9d>, Reagan Plaza, הר הצופי×<9d>, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל amenity university 0.001 ישר×<90>ל il Asia Western Asia
+technion israel institute of technology 2021-02-03 107068371 way ×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל amenity university 0.481395763639811 ישר×<90>ל il Asia Western Asia
+meteorological service 2021-02-03 119417889 way המכון המט×<90>ורולוגי, 4, ×<90>זור תעשייה ×’, ר×<90>שון לציון, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל office government 0.324987614684334 ישר×<90>ל il Asia Western Asia
+bar-ilan university in ramat gan 2021-02-03 103805843 way ×<90>×•× ×™×‘×¨×¡×™×˜×ª בר ×<90>ילן, השקד, רמת ×<90>ילן, גבעת שמו×<90>ל, × ×¤×ª פתח תקווה, מחוז המרכז, no, ישר×<90>ל amenity university 0.517808168627706 ישר×<90>ל il Asia Western Asia
+technion — israel institute of technology 2021-02-03 107068371 way ×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל amenity university 0.481395763639811 ישר×<90>ל il Asia Western Asia
+technion institute 2021-02-03 107068371 way ×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל amenity university 0.481395763639811 ישר×<90>ל il Asia Western Asia
+rambam health care campus 2021-02-03 109452047 way רמב"×<9d> - הקריה הרפו×<90>ית לברי×<90>ות ×”×<90>ד×<9d>, עפרון, בת גלי×<9d>, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל amenity hospital 0.36529067188378 ישר×<90>ל il Asia Western Asia
+better place 2021-02-03 22147093 node Better Place, 65, מועצה ×<90>זורית גליל תחתון, × ×¤×ª יזרע×<90>ל, מחוז הצפון, no, ישר×<90>ל amenity fuel 0.201 ישר×<90>ל il Asia Western Asia
+bar-ilan university 2021-02-03 103805843 way ×<90>×•× ×™×‘×¨×¡×™×˜×ª בר ×<90>ילן, השקד, רמת ×<90>ילן, גבעת שמו×<90>ל, × ×¤×ª פתח תקווה, מחוז המרכז, no, ישר×<90>ל amenity university 0.517808168627706 ישר×<90>ל il Asia Western Asia
+open university 2021-02-03 107644861 way ×”×<90>×•× ×™×‘×¨×¡×™×˜×” הפתוחה, החורש, Kiryat Golomb, Kiryat Etgarim, ×¨×¢× × ×”, × ×¤×ª פתח תקווה, מחוז המרכז, no, ישר×<90>ל amenity university 0.467686595449203 ישר×<90>ל il Asia Western Asia
+barzilai 2021-02-03 103366196 way ברזילי, גיבתון, רחובות, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל highway residential 0.1 ישר×<90>ל il Asia Western Asia
+israel border police 2021-02-03 160962387 way משמר הגבול, מוס×<90> סייק, קרית ×ž× ×—×<9d> בגין, الشيخ جراØ, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל amenity police 0.001 ישר×<90>ל il Asia Western Asia
+ben-gurion university of the negev 2021-02-03 121961822 way ×<90>×•× ×™×‘×¨×¡×™×˜×ª בן גוריון ×‘× ×’×‘, פרופסור ×—×™×™×<9d> ×—× × ×™, Be'er Sheva Innovation District, ×©×›×•× ×” ד, ב×<90>ר שבע, × ×¤×ª ב×<90>ר שבע, מחוז הדרו×<9d>, no, ישר×<90>ל amenity university 0.487026464500426 ישר×<90>ל il Asia Western Asia
+knesset 2021-02-03 208123192 way משכן ×”×›× ×¡×ª, קפלן, קרית הממשלה, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל office government 0.341762590849456 ישר×<90>ל il Asia Western Asia
+technion institute of technology 2021-02-03 107068371 way ×”×˜×›× ×™×•×Ÿ - מכון ×˜×›× ×•×œ×•×’×™ לישר×<90>ל, הצפירה, זיו, חיפה, × ×¤×ª חיפה, מחוז חיפה, no, ישר×<90>ל amenity university 0.481395763639811 ישר×<90>ל il Asia Western Asia
+weizmann institute of science 2021-02-03 207850603 way מכון ויצמן למדע, כרמל, ×<90>חוזות ×”× ×©×™×<90>, רחובות, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל amenity university 0.482730278313856 ישר×<90>ל il Asia Western Asia
+weizmann institute 2021-02-03 17630960 node מכון ויצמן, הרצל, ×ž×¢×•× ×•×ª וולפסון, × ×•×•×” יהודה, רחובות, × ×¤×ª רחובות, מחוז המרכז, no, ישר×<90>ל highway bus_stop 0.001 ישר×<90>ל il Asia Western Asia
+un office for the coordination of humanitarian affairs 2021-02-03 6354500 node UN Office for the Coordination of Humanitarian Affairs (OCHA), ×—×™×™×<9d> ברלב, باب الساهرة, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל amenity public_building 0.801 ישר×<90>ל il Asia Western Asia
+israel aerospace industries 2021-02-03 17972127 node צומת תעשייה ×<90>ווירית, 40, מועצה ×<90>זורית חבל מודיעין, × ×¤×ª רמלה, מחוז המרכז, no, ישר×<90>ל highway bus_stop 0.001 ישר×<90>ל il Asia Western Asia
+tel aviv university in israel 2021-02-03 58968232 node ×”×˜×›× ×™×•×Ÿ, מרדכי מקלף, תל ×<90>ביב - יפו, ×’× ×™ ×©×¨×•× ×”, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל amenity university 0.001 ישר×<90>ל il Asia Western Asia
+saab 2021-02-03 258610150 relation شعب‎, × ×¤×ª עכו, מחוז הצפון, ישר×<90>ל boundary administrative 0.390771556772395 ישר×<90>ל il Asia Western Asia
+israel 2021-02-03 258074628 relation ישר×<90>ל boundary administrative 0.791602003658504 ישר×<90>ל il Asia Western Asia
+israel space agency 2021-02-03 298829047 node ×¡×•×›× ×•×ª החלל הישר×<90>לית, דוד חכמי, תל ×<90>ביב - יפו, ×ž×•× ×˜×™×¤×™×•×¨×™, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל office government 0.001 ישר×<90>ל il Asia Western Asia
+tel aviv university 2021-02-03 37018800 node תל ×<90>ביב ×<90>×•× ×™×‘×¨×¡×™×˜×”, ×<90>יילון דרו×<9d>, תל ×<90>ביב - יפו, ×<90>×•× ×™×‘×¨×¡×™×˜×ª ת"×<90>, תל ×<90>ביב-יפו, × ×¤×ª תל ×<90>ביב, מחוז תל ×<90>ביב, no, ישר×<90>ל railway station 0.339805842395375 ישר×<90>ל il Asia Western Asia
+israel academy of sciences and humanities 2021-02-03 115598477 way ×”×<90>קדמיה הל×<90>ומית הישר×<90>לית למדעי×<9d>, ×–'×‘×•×˜×™× ×¡×§×™, טלביה, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל amenity public_building 0.450401733787336 ישר×<90>ל il Asia Western Asia
+ministry of science and technology 2021-02-03 144400913 way משרד המדע ×•×”×˜×›× ×•×œ×•×’×™×”, ×”×<90>×•× ×™×‘×¨×¡×™×˜×” העברית, קרית ×ž× ×—×<9d> בגין, الشيخ جراØ, ירושלי×<9d>, × ×¤×ª ירושלי×<9d>, מחוז ירושלי×<9d>, no, ישר×<90>ל office government 0.001 ישר×<90>ל il Asia Western Asia
+wright brothers 2021-02-03 123047810 way ×”×<90>×—×™×<9d> רייט, ×<90>גמי×<9d>, רמת ידין, × ×ª× ×™×”, × ×¤×ª השרון, מחוז המרכז, no, ישר×<90>ל highway residential 0.1 ישר×<90>ל il Asia Western Asia
+iom 2021-02-03 105663494 way Isle of Man Airport, Balthane Road, Malew, Rushen, IM9 2AH, Isle of Man aeroway aerodrome 0.447526724801917 Isle of Man im Europe Northern Europe
+university of mysore 2021-02-03 183116886 way University of Mysore, Chamaraja Double Road, Chamarajapuram, Mysuru, Mysuru taluk, Mysuru district, Karnataka, 570001, India amenity university 0.667707938540516 India in Asia Southern Asia
+pslv 2021-02-03 230786339 way PSLV Rocket Model, Veli- Perumathura road, Veli, Thiruvananthapuram, Kerala, 695001, India tourism attraction 0.101 India in Asia Southern Asia
+nalco 2021-02-03 259264932 relation NALCO, Anugul, Odisha, 759145, India boundary administrative 0.55 India in Asia Southern Asia
+indian institute of technology 2021-02-03 1396119 node Indian Institute Of Technology, IIT Delhi Main Road, Mehrauli Tehsil, South Delhi, Delhi, 110 067, India amenity university 0.788558306414252 India in Asia Southern Asia
+indian council of medical research 2021-02-03 176721424 way Indian Council of Medical Research, Sadahalli, Devanahalli taluk, Bangalore Rural, Karnataka, India landuse commercial 0.7 India in Asia Southern Asia
+center for science 2021-02-03 78997138 node Centre for science(aravindan sir), ITS, Karunagapally, Karunagappally, Kollam, Kerala, 690518, India office educational_institution 0.201 India in Asia Southern Asia
+blood institute 2021-02-03 73364002 node Cumbala Hill Hospital And Heart Institute Blood Bank, NS Patkar Marg, Grant Road, D Ward, Zone 1, Mumbai, Mumbai City, Maharashtra, 400036, India amenity blood_bank 0.201 India in Asia Southern Asia
+dbt 2021-02-03 64558864 node Dakshin Barasat‎, Baruipur Kulpi Road, Dakshin Barasat‎, Jaynagar - I, South 24 Parganas, West Bengal, 743391, India railway station 0.338296402069185 India in Asia Southern Asia
+bhabha atomic research centre 2021-02-03 103414770 way Bhabha Atomic Research Centre - BARC, M/E Ward, Zone 5, Mumbai, Mumbai Suburban, Maharashtra, India landuse industrial 0.6 India in Asia Southern Asia
+teri 2021-02-03 259447258 relation Tehri, Tehri Garhwal, India boundary administrative 0.45 India in Asia Southern Asia
+national institute of biomedical genomics 2021-02-03 68325867 node National Institute of Biomedical Genomics, SH1, Gayespur, Chakdah, Nadia, West Bengal, 741232, India office educational_institution 0.501 India in Asia Southern Asia
+department of commerce 2021-02-03 247702407 way Department of Commerce, Adoor - Vandiperiyar Highway, Makkamkunnu, Pathanamthitta, Kerala, 683647, India building college 0.301 India in Asia Southern Asia
+cga 2021-02-03 5997295 node Chengail, NH16, Sankrail, Howrah, West Bengal, 711322, India railway station 0.24352463088163 India in Asia Southern Asia
+sse 2021-02-03 177888378 way Sholapur Airport, Hotgi Road, Ratandeep Housing Society, Ramlal Nagar, Solapur North, Solapur, Maharashtra, 413007, India aeroway aerodrome 0.390444593674683 India in Asia Southern Asia
+onb 2021-02-03 26652731 node O N B, Naduvattom, Beypore Road, Kozhikode Municipal Corporation - Beypore zone, Beypore, Kozhikode, Kozhikode district, Kerala, 673015, India building yes 0.001 India in Asia Southern Asia
+indian institute of science bangalore 2021-02-03 259230417 relation Indian Institute of Science, CV Raman Road, Malleswaram, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India amenity university 0.960020321697533 India in Asia Southern Asia
+tuberculosis research centre 2021-02-03 143672353 way Tuberculosis Research Institute, Club Road, Chetpet, Ward 107, Zone 8 Anna Nagar, Chennai, Chennai District, Tamil Nadu, 600 006, India amenity college 0.201 India in Asia Southern Asia
+gslv 2021-02-03 71301324 node GSLV Mk II rocket model, Veli- Perumathura road, Veli, Thiruvananthapuram, Kerala, 695001, India tourism attraction 0.101 India in Asia Southern Asia
+institute of aerospace medicine 2021-02-03 101944990 way Institute of Aerospace Medicine - IAM, Airport Arrival Road, HAL Township, HAL Airport Ward, Mahadevapura Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, 560103, India amenity college 0.401 India in Asia Southern Asia
+asv 2021-02-03 4568562 node Asarva, Naroda ROad, Kalapi nagar, Ahmedabad, Ahmadabad City Taluka, Ahmedabad District, Gujarat, 380001, India railway station 0.319711033684734 India in Asia Southern Asia
+defence research establishment 2021-02-03 224432662 way Defence Avionics Research Establishment - DARE, A Narayanapura, Mahadevapura Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, India landuse military 0.561844955490086 India in Asia Southern Asia
+centre for nanotechnology 2021-02-03 173998399 way Center for Nanotechnology, CIS road, Ward 105 Gachibowli, Hyderabad, Serilingampalle mandal, Rangareddy, Telangana, 50046, India building yes 0.201 India in Asia Southern Asia
+nuclear power corporation of india 2021-02-03 161045684 way Nuclear Power Research Corporation of India - NPCI, Benniganahalli Ward, East Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, India landuse commercial 0.7 India in Asia Southern Asia
+indian space research organisation 2021-02-03 102303066 way Indian Space Research Organisation - ISRO Vijinapura Campus, 1st Main Road, Dollar Colony, Raj Mahal Vilas, East Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560094, India office government 0.922406253415619 India in Asia Southern Asia
+yenepoya university 2021-02-03 296017516 node Yenepoya Pre University College, Mangalore-Kasaragodu Road, Kankanady, Jeppinamogaru, Mangaluru taluk, Dakshina Kannada, Karnataka, 575009, India amenity college 0.201 India in Asia Southern Asia
+aip 2021-02-03 59077197 node Attippattu, Manali Ponneri Road, Edayanchavadi, Ward 15, Nappalayam, Vellaiveyil Chavadi, Ponneri, Thiruvallur District, Tamil Nadu, 600120, India railway station 0.292441551930616 India in Asia Southern Asia
+regenerative medicine center 2021-02-03 226982489 way Institute For Stem Cell Science and Regenerative Medicine, 5th Main Road, Canara Bank Layout, Vidyaranyapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560065, India building yes 0.201 India in Asia Southern Asia
+department of electrical engineering and computer science 2021-02-03 166771882 way Department of Electrical engineering, IIT Bombay, Infinite Corridoor, Jyotiba Phule Nagar, S Ward, Zone 6, Mumbai, Mumbai Suburban, Maharashtra, 400076, INDIA, India building university 0.401 India in Asia Southern Asia
+medical college 2021-02-03 49107221 node Medical College, kudamaloor, Kottayam, Kerala, 686008, India place quarter 0.45 India in Asia Southern Asia
+google maps 2021-02-03 185532602 way Vani Dahivi Road, Vani, Dindori, Nashik, Maharashtra, 422215, India highway tertiary 0.1 India in Asia Southern Asia
+central bureau of investigation 2021-02-03 253091618 way Central Bureau Of Investigation, Road 3, Sector 7, Gandhinagar, Gandhinagar Taluka, Gandhinagar District, Gujarat, 382008, India office yes 0.401 India in Asia Southern Asia
+astronomy & astrophysics 2021-02-03 113630721 way Inter University Center for Astronomy & Astrophysics, Breman Chowk - Khadki Bazar Road, Mandalay Lines, Khadki, Pune City, Pune District, Maharashtra, 411007, India building yes 0.201 India in Asia Southern Asia
+goa university 2021-02-03 302010537 way Goa University, Library, Dr. E Borges Road, Dona Paula, Tiswadi, North Goa, Goa, 403004, India amenity library 0.201 India in Asia Southern Asia
+ctd 2021-02-03 14471317 node Chhota Udepur, SH62, Chhota Udaipur, Chhota Udaipur Taluka, Chhota Udaipur District, Gujarat, 391165, India railway station 0.320054390558144 India in Asia Southern Asia
+state supreme court 2021-02-03 258928765 relation Supreme Court, Tilak Marg, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India amenity courthouse 0.700289443464696 India in Asia Southern Asia
+iia 2021-02-03 99960273 way Indian Institute of Astrophysics, Koramangala 2nd Block, Koramangala, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, India boundary wall 0.389453166408414 India in Asia Southern Asia
+national law university 2021-02-03 138974523 way National Law University, Road 205, Sector 13, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110078, India amenity university 0.602323854176492 India in Asia Southern Asia
+kmt 2021-02-03 29584870 node Khammam, Railway Station road, Gandhi chowk, Khammam_Urban mandal, Khammam, Telangana, 507002, India railway station 0.239862222899095 India in Asia Southern Asia
+fisheries research 2021-02-03 120316625 way Fisheries Research, Okha, Okhamandal Taluka, Devbhumi Dwaraka District, Gujarat, 361350, India landuse commercial 0.4 India in Asia Southern Asia
+biocon 2021-02-03 74803996 node Biocon, Joggers Ln, Veerasandra Industrial Estate, Anantnagar, Anekal, Bangalore Urban, Karnataka, 560100, India office company 0.101 India in Asia Southern Asia
+bma 2021-02-03 82778948 node Belmuri, Durgapur Expressway, Polba - Dadpur, Hugli, West Bengal, 712305, India railway station 0.321743055077702 India in Asia Southern Asia
+inter-university centre for astronomy and astrophysics 2021-02-03 113630721 way Inter University Center for Astronomy & Astrophysics, Breman Chowk - Khadki Bazar Road, Mandalay Lines, Khadki, Pune City, Pune District, Maharashtra, 411007, India building yes 0.601 India in Asia Southern Asia
+uaa 2021-02-03 56392022 node Uppala, LR, Uppala, Manjeswaram, Kasaragod, Kerala, 671322, India railway station 0.299997827209804 India in Asia Southern Asia
+entrepreneurship institute 2021-02-03 129614030 way Xavier Institute of Management and Entrepreneurship, Shantipura Main Road, Electronics City Phase 2 (East), Bangalore South, Bangalore Urban, Karnataka, 560100, India amenity university 0.587306266325387 India in Asia Southern Asia
+iiser 2021-02-03 156513014 way Indian Institute of Science Education and Research (IISER), Pune, IISER-NCL Inner road, Pashan, Pune City, Pune District, Maharashtra, 411008, India amenity university 0.435695492967573 India in Asia Southern Asia
+andhra university 2021-02-03 220469423 way Andhra University, Sivajipalem Road, Sector 4, Pedda Waltair, Visakhapatnam, Visakhapatnam (Urban), Visakhapatnam, Andhra Pradesh, 530001, India amenity university 0.201 India in Asia Southern Asia
+delhi school of economics 2021-02-03 83554677 node Delhi School of Economics, Chhatra Marg, Delhi University (North Campus), Civil Lines Tehsil, Central Delhi, Delhi, 110007, India amenity college 0.401 India in Asia Southern Asia
+supreme court 2021-02-03 258928765 relation Supreme Court, Tilak Marg, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India amenity courthouse 0.700289443464696 India in Asia Southern Asia
+indian agricultural research institute 2021-02-03 140318395 way Indian Agricultural Research Institute, Aundh, Pune City, Pune District, Maharashtra, 411027, India landuse farmland 0.6 India in Asia Southern Asia
+sri sathya sai university 2021-02-03 296017694 node Sri Sathya Sai Loka Seva Pre University College, SH100, Alike, Bantwal taluk, Dakshina Kannada, Karnataka, 574235, India amenity college 0.401 India in Asia Southern Asia
+tata institute 2021-02-03 259230417 relation Indian Institute of Science, CV Raman Road, Malleswaram, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India amenity university 0.560020321697533 India in Asia Southern Asia
+banaras hindu university 2021-02-03 65891789 node काशी हिनà¥<8d>दू विशà¥<8d>वविदà¥<8d>यालय, Semi Circle Road 2, Karbirdas Colony, Varanasi, Uttar Pradesh, 221005, India amenity college 0.001 India in Asia Southern Asia
+bar association 2021-02-03 47769764 node Bar Association, Court Road, Paravur, Ernakulam district, Kerala, 683513, India office association 0.201 India in Asia Southern Asia
+science media centre 2021-02-03 48932681 node Science Media Center, CV Raman Road, Sadhashivanagar, Aramane Nagara Ward, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India office research 0.201 India in Asia Southern Asia
+azim premji university 2021-02-03 47600219 node Azim Premji University, Service Road, Begur, Bommanahalli Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, 560 100, India amenity university 0.569299555080491 India in Asia Southern Asia
+lhc 2021-02-03 208268818 way LHC, Sai Nagar, Chamundeshwari Nagar, Hubballi, Hubballi taluku, Dharwad district, Karnataka, 580020, India highway service 0.175 India in Asia Southern Asia
+indian institute of science 2021-02-03 259230417 relation Indian Institute of Science, CV Raman Road, Malleswaram, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560012, India amenity university 0.860020321697533 India in Asia Southern Asia
+aiims 2021-02-03 75775290 node All India Institute of Medical Sciences, Aurobindo Marg, Yusuf Sarai Market, Defence Colony Teshil, South East Delhi, Delhi, 110029, India railway station 0.344585942469205 India in Asia Southern Asia
+institute of space 2021-02-03 176056727 way Indian Institute of Space Science and Technology, Trivandrum, Manoorkonam-panacode, Maannoorkkonam, Nedumangad, Thiruvananthapuram, Kerala, 695547, India amenity university 0.676937105996802 India in Asia Southern Asia
+defence research & development organisation 2021-02-03 83060459 node Defence Research and Development Organisation, Bakavand Tahsil, Bastar, Chhattisgarh, India office research 0.401 India in Asia Southern Asia
+centre for cellular and molecular biology 2021-02-03 102044629 way Center for Cellular and molecular biology, Habsiguda Main Road, Tarnaka, Ward 6 Nacharam, Greater Hyderabad Municipal Corporation East Zone, Hyderabad, Uppal mandal, Medchal–Malkajgiri, Telangana, 500003, India office research 0.501 India in Asia Southern Asia
+foxconn 2021-02-03 223452108 way Foxconn, Sunguvarchatram, Sriperumbudur, Kanchipuram District, Tamil Nadu, India landuse industrial 0.3 India in Asia Southern Asia
+gmo 2021-02-03 6772130 node Netaji SC Bose Junction Gomoh, NH19, Topchanchi, Dhanbad, Jharkhand, 828402, India railway station 0.339306791900516 India in Asia Southern Asia
+jawaharlal nehru centre for advanced scientific research 2021-02-03 95864986 way Jawaharlal Nehru Centre for Advanced Scientific Research, Kempegowda Road, Coffee Board Layout, Byatarayanapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560064, India amenity university 0.977334066701962 India in Asia Southern Asia
+genomics institute 2021-02-03 130622683 way CSIR-Institute of Genomics & Integrative Biology, Mathura Road, Pocket A, Govindpuri, Kalkaji Tehsil, South East Delhi, Delhi, 1243, India office government 0.462719188578863 India in Asia Southern Asia
+physical society 2021-02-03 296019075 node Shree Prabhurajendra College of Physical Education, Cotton Sales Society Road, Gadag, Gadag taluk, Gadag district, Karnataka, 582101, India amenity college 0.201 India in Asia Southern Asia
+united technologies corporation 2021-02-03 75181630 node United Technologies Corp, Durgam Cheruvu Road, Madhapur, Ward 104 Kondapur, Hyderabad, Serilingampalle mandal, Rangareddy, Telangana, 996544, India office company 0.201 India in Asia Southern Asia
+indian national congress 2021-02-03 221253786 way Indian Trade Union Congress Nagar, Pudupalayam, Rajapalayam, Virudhunagar District, Tamil Nadu, 626117, India highway residential 0.3 India in Asia Southern Asia
+national green tribunal 2021-02-03 212085570 way National Green Tribunal, Faridkot House Lane, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India building yes 0.301 India in Asia Southern Asia
+agharkar research institute 2021-02-03 38271396 node Agharkar Research Institute, Gopal Ganesh Agarkar Path, Deccan Gymkhana, Pune City, Pune District, Maharashtra, 411004, India office educational_institution 0.301 India in Asia Southern Asia
+institute for plasma research 2021-02-03 192038053 way Institute For Plasma Research ,IPR,Bhat, Gandhinagar-Ahmedabad Highway, Bhat, Gandhinagar Taluka, Gandhinagar District, Gujarat, 382428, India amenity college 0.401 India in Asia Southern Asia
+centre for scientific research 2021-02-03 134025877 way Center for Scientific Research, Bliss Road, Annainagar, Ozhukarai Taluk, Puducherry district, Puducherry, 605101, India building yes 0.301 India in Asia Southern Asia
+ministry of external affairs 2021-02-03 65278763 node Ministry of External Affairs, Rajpath, Central Secretariat, Rakab Ganj, Chanakya Puri Tehsil, New Delhi, Delhi, 110001, India office government 0.84541340693117 India in Asia Southern Asia
+university of pune 2021-02-03 120165826 way Department of Geography, विदà¥<8d>यापीठरसà¥<8d>ता, Aundh, Khadki, Pune City, Pune District, Maharashtra, 411 007, India amenity college 0.201 India in Asia Southern Asia
+national centre for radio astrophysics 2021-02-03 154987972 way National Centre for Radio Astrophysics, Pune Univesity Campus, Breman Chowk - Khadki Bazar Road, Mandalay Lines, Khadki, Pune City, Pune District, Maharashtra, 411007, India amenity university 0.501 India in Asia Southern Asia
+christian medical college 2021-02-03 55073123 node Christian Medical College, NH38, Vellore, Vellore District, Tamil Nadu, 632002, India highway bus_stop 0.301 India in Asia Southern Asia
+d. d. & mariani 2021-02-03 259426205 relation Mariani, Jorhat, India boundary administrative 0.75 India in Asia Southern Asia
+hindu rao hospital 2021-02-03 85536497 node Hindu Rao Hospital, Chhatra Marg, Delhi University (North Campus), Civil Lines Tehsil, Central Delhi, Delhi, 110007, India amenity hospital 0.301 India in Asia Southern Asia
+environmental science and technology 2021-02-03 177481386 way Department of Environmental Studies, Cochin University of Science and Technology, Pathadipalam, Kalamassery, Kanayannur, Ernakulam district, Kerala, 682022, India building university 0.401 India in Asia Southern Asia
+medical council of india 2021-02-03 176721424 way Indian Council of Medical Research, Sadahalli, Devanahalli taluk, Bangalore Rural, Karnataka, India landuse commercial 0.6 India in Asia Southern Asia
+centre for sustainable agriculture 2021-02-03 68078354 node centre for sustainable agriculture (CSA), Street 14, Tarnaka, Ward 143 Tarnaka, Greater Hyderabad Municipal Corporation North Zone, Hyderabad, Maredpally mandal, Hyderabad, Telangana, 500003, India office ngo 0.401 India in Asia Southern Asia
+bjp 2021-02-03 5712332 node Vijayapura, Station Road, Yogapur, Vijayapura, Vijayapura taluk, Bijapur district, Karnataka, 586101, India railway station 0.284440950846107 India in Asia Southern Asia
+allen institute 2021-02-03 300497581 node Allen Career Institute Jalahalli East, MS Ramaiah Road, Doddabomasandra, Dodda Bommasandra, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560014, India office educational_institution 0.201 India in Asia Southern Asia
+national centre for biological sciences 2021-02-03 301582936 way NCBS Bangalore, 5th Main Road, Canara Bank Layout, Vidyaranyapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560065, India amenity research_institute 0.001 India in Asia Southern Asia
+council of scientific and industrial research 2021-02-03 24264243 node Council of Scientific & Industrial Research (CSIR), kuzhvila lane, Pappanamcode, 38 MSP Nagar, Thiruvananthapuram, Kerala, 695019, India amenity research_institute 0.501 India in Asia Southern Asia
+nmda 2021-02-03 14578782 node New Morinda Junction, Ludhiana-Chandigarh Highway, Sukho Majra, Chamkaur Sahib Tahsil, Rupnagar, Punjab, 140101, India railway station 0.001 India in Asia Southern Asia
+glenmark pharmaceuticals 2021-02-03 166823886 way Glenmark Pharmaceuticals Ltd., Shendra MIDC, Aurangabad, Maharashtra, India landuse industrial 0.4 India in Asia Southern Asia
+center for the study of science 2021-02-03 26344651 node CSTEP, 10th Cross Road, Papanna Layout, Kodigehalli, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560094, India office ngo 0.001 India in Asia Southern Asia
+department of biotechnology 2021-02-03 129892474 way Department of Biotechnology, Calicut University Villooniyal Road, Villoonniyal, Thenhipalam, Tirurangadi, Malappuram, Kerala, 673635, India building university 0.301 India in Asia Southern Asia
+cbd 2021-02-03 3342193 node Car Nicobar Air Force Station, Car Nicobar, Nicobar, Andaman and Nicobar Islands, India military airfield 0.416945583987361 India in Asia Southern Asia
+kemri 2021-02-03 298924784 node Kemri, Girwa Tehsil, Udaipur, Rajasthan, India place hamlet 0.35 India in Asia Southern Asia
+tata institute of fundamental research 2021-02-03 259525635 relation Tata Institute of Fundamental Research (TIFR), Survey No.36/P, Gopanpally - Wipro Road, Ward 105 Gachibowli, Hyderabad, Serilingampalle mandal, Rangareddy, Telangana, 500107, India office research 0.722549534893346 India in Asia Southern Asia
+central news agency 2021-02-03 69050515 node Central News Agency, Outer Circle, Connaught Place, Rakab Ganj, Chanakya Puri Tehsil, New Delhi, Delhi, 110001, India shop books 0.301 India in Asia Southern Asia
+hp labs 2021-02-03 15156752 node HP Labs and HP India Sales, Hosur Road, Adugodi, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, 560095, India building yes 0.201 India in Asia Southern Asia
+indian national science academy 2021-02-03 65559222 node à¤à¤¾à¤°à¤¤à¥€à¤¯ राषà¥<8d>टà¥<8d>रीय विजà¥<8d>ञान अकादमी, 2, Bahadur Shah Zafar Marg, Delhi, Kotwali Tehsil, Central Delhi, Delhi, 110002, India tourism attraction 0.001 India in Asia Southern Asia
+indraprastha university 2021-02-03 124450320 way Guru Gobind Singh Indraprastha University, Road 205, Sector 17, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110078, India amenity university 0.541762590849456 India in Asia Southern Asia
+cdm 2021-02-03 60122088 node Chidambaram, Railway Feeder Road, Chidambaram, Cuddalore District, Tamil Nadu, 608001, India railway station 0.328965278593994 India in Asia Southern Asia
+aclu 2021-02-03 72757132 node Achalu, Kanakapura taluk, Ramanagara district, Karnataka, 562126, India place village 0.275 India in Asia Southern Asia
+actionaid 2021-02-03 47347601 node ActionAid, Richmond Road, Craig Park Layout, Shantala Nagar, East Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, - 560095, India office ngo 0.101 India in Asia Southern Asia
+central information commission 2021-02-03 173685766 way Central Information Commission, Baba Gang Nath Marg, Vasant Vihar Tehsil, New Delhi, Delhi, 110 067, India office government 0.301 India in Asia Southern Asia
+century foundation 2021-02-03 75013783 node The New Century Medical & Education Foundation Trust Blood Bank & Aphaeresis Centre, Nagras Road, Aundh, Pune City, Pune District, Maharashtra, 411007, India amenity blood_bank 0.201 India in Asia Southern Asia
+us supreme court 2021-02-03 258928765 relation Supreme Court, Tilak Marg, Chanakya Puri Tehsil, New Delhi, Delhi, 020626, India amenity courthouse 0.700289443464696 India in Asia Southern Asia
+madras high court 2021-02-03 100230126 way Madras High Court, North Fort Road, Island Grounds, Ward 60, Zone 5 Royapuram, Chennai, Chennai District, Tamil Nadu, 600009, India amenity courthouse 0.767530366216316 India in Asia Southern Asia
+bsp 2021-02-03 6684331 node Bilaspur Junction, Bilaspur Bypass, Lalkhadan, Bilaspur, Bilaspur Tahsil, Bilaspur, Chhattisgarh, 495004, India railway station 0.332141421099015 India in Asia Southern Asia
+us catholics 2021-02-03 246582495 way St. Augustine Roman Catholics Latin Church, Murukkumpuzha, chirayinkeezhu-Thiruvananthapuram Road, Azhoor, Thiruvananthapuram, Kerala, 695302, India amenity place_of_worship 0.201 India in Asia Southern Asia
+university of delhi south campus 2021-02-03 205692666 way Benito Juarez Marg, Delhi Cantonment, New Delhi, Delhi, 110057, India highway tertiary 0.2 India in Asia Southern Asia
+msc 2021-02-03 650745 node Chennai Chetpat, McNichols Road, Ward 104, Zone 8 Anna Nagar, Chennai, Chennai District, Tamil Nadu, 600010, India railway station 0.310439474412231 India in Asia Southern Asia
+mmr 2021-02-03 67922341 node Manmad Junction, NH752G, Railway Colony, Manmad, Nandgaon, Nashik, Maharashtra, 423104, India railway station 0.363116169023831 India in Asia Southern Asia
+hpp 2021-02-03 6455070 node Harpalpur, NH76, Harpalpur, Nowgong Tahsil, Chhatarpur, Madhya Pradesh, India railway station 0.135420222661424 India in Asia Southern Asia
+jama 2021-02-03 259341928 relation Jama, Dumka, Jharkhand, 814110, India boundary administrative 0.55 India in Asia Southern Asia
+congress party 2021-02-03 60778451 node Congress Party, Powai Road, Anandgadh, N Ward, Zone 6, Mumbai, Mumbai Suburban, Maharashtra, 400084, India office government 0.201 India in Asia Southern Asia
+indian institute of science education and research 2021-02-03 136293867 way Indian Institute of Science, Education and Research, 1st Cross Road, Duttabad, FB Block, Rajarhat, North 24 Parganas, West Bengal, 700097, India amenity university 0.701 India in Asia Southern Asia
+indian medical association 2021-02-03 15338881 node Indian Medical Association, Albert Victor Road, Chamarajapete, Chamrajapet, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560 002, India amenity library 0.301 India in Asia Southern Asia
+htc 2021-02-03 11364266 node Hathras City, NH530B, Madan Lal Banswale, Hathras, Uttar Pradesh, 204101, India railway station 0.331291305560682 India in Asia Southern Asia
+world bank 2021-02-03 120702584 way World Bank, Ward 180, Zone 13 Adyar, Chennai, Chennai District, Tamil Nadu, India landuse commercial 0.617582068811379 India in Asia Southern Asia
+isro 2021-02-03 236288936 way ISRO, Thiruvananthapuram, Kerala, India landuse industrial 0.3 India in Asia Southern Asia
+institute of microbial technology 2021-02-03 120906770 way CSIR Institute for Microbial Technology, Pashchim Marg, Sector 39, Ward 9, Palsora, Chandigarh, 160039, India amenity research_institute 0.54352463088163 India in Asia Southern Asia
+open access india 2021-02-03 107854140 way Buddha Park Access Rd., Kanpur, Kanpur Nagar, Uttar Pradesh, 208012, India highway residential 0.3 India in Asia Southern Asia
+atomic energy regulatory board 2021-02-03 300213241 relation Atomic Energy Regulatory Board, V.N. Purav Marg, Govandi West, M/E Ward, Zone 5, Mumbai, Mumbai Suburban, Maharashtra, 400088, India building yes 0.401 India in Asia Southern Asia
+science and research 2021-02-03 83813152 node KPR College of Arts, Science and Research, KPR college road, Coimbatore, Sulur, Coimbatore District, Tamil Nadu, 641407, India office educational_institution 0.301 India in Asia Southern Asia
+times of india 2021-02-03 47081191 node Times of India, Rest House Crescent Road, Shantala Nagar, East Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, BENGALURU, India office newspaper 0.301 India in Asia Southern Asia
+serum institute of india 2021-02-03 79442200 node Serum Institute of India Pvt. Ltd., 212/2, Hadapsar, Solapur Road, Pune City, Pune District, Maharashtra, 411028, India place house 0.401 India in Asia Southern Asia
+jawaharlal nehru university 2021-02-03 95083567 way Jawaharlal Nehru University, Bhagwan Mahavir Marg, Vasant Kunj, Vasant Vihar Tehsil, New Delhi, Delhi, 110067, India amenity university 0.301 India in Asia Southern Asia
+raja ramanna centre for advanced technology in indore 2021-02-03 136320888 way Raja Ramanna Centre for Advanced Technology, Rau-Indore road, Indore, Indore Tahsil, Madhya Pradesh, 452001, India amenity university 0.801 India in Asia Southern Asia
+aaab 2021-02-03 38383655 node aaab, NH45, Sadar, Jabalpur, Jabalpur Tahsil, Jabalpur, Madhya Pradesh, 482001, India tourism museum 0.111 India in Asia Southern Asia
+regenerative medicine 2021-02-03 226982489 way Institute For Stem Cell Science and Regenerative Medicine, 5th Main Road, Canara Bank Layout, Vidyaranyapura, Yelahanka Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560065, India building yes 0.201 India in Asia Southern Asia
+information centre 2021-02-03 5709828 node Information Centre, Talala Taluka, Gir Somnath District, Gujarat, 362135, India place locality 0.325 India in Asia Southern Asia
+mahatma gandhi institute of medical sciences 2021-02-03 153697233 way Mahatma Gandhi Institute of Medical Sciences, SH258, Wardha, Sevagram, Wardha, Maharashtra, 442102, India amenity hospital 0.601 India in Asia Southern Asia
+wadia institute of himalayan geology 2021-02-03 158407716 way Wadia Institute of Himalayan Geology, General Mahadev Singh (GMS) Road, Ashirwad Enclave, Dehradun, 248001, India amenity school 0.501 India in Asia Southern Asia
+astrophysics institute 2021-02-03 99960273 way Indian Institute of Astrophysics, Koramangala 2nd Block, Koramangala, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, India boundary wall 0.589453166408414 India in Asia Southern Asia
+united nations children's fund 2021-02-03 143582995 way United Nations Childrens' Fund (UNICEF) - India, K. K. Birla Lane, Lodhi Estate, Chanakya Puri Tehsil, New Delhi, Delhi, 110003, India office government 0.501 India in Asia Southern Asia
+nstl 2021-02-03 244047342 way nstl road, Susarla Colony, Visakhapatnam, Visakhapatnam (Urban), Visakhapatnam, Andhra Pradesh, 530001, India highway residential 0.2 India in Asia Southern Asia
+ranbaxy 2021-02-03 715218 node Ranbaxy, Service Road, Sector 18, Gurgaon, Gurugram, Haryana, 122010, India landuse commercial 0.101 India in Asia Southern Asia
+central pollution control board 2021-02-03 141460125 way Pollution Control Board, Maharaj Surajmal Marg, Shahdara CBD, Vivek Vihar Tehsil, Shahdara, Delhi, 110051, India building public 0.301 India in Asia Southern Asia
+shiv nadar university 2021-02-03 174803369 way Hostel 2A, 2011 Street, Chithera, Dadri, Gautam Buddha Nagar, Uttar Pradesh, 201314, India tourism hostel 0.001 India in Asia Southern Asia
+mdr tb 2021-02-03 302694362 way MDR, Indore, Indore Tahsil, Madhya Pradesh, 452001, India highway primary 0.2 India in Asia Southern Asia
+jsps 2021-02-03 80164905 node JSPS Government Homeopathic Medical College, Uppal Road, Bharat Nagar, Ward 8 Habsiguda, Greater Hyderabad Municipal Corporation East Zone, Hyderabad, Uppal mandal, Medchal–Malkajgiri, Telangana, 500013, India amenity university 0.101 India in Asia Southern Asia
+akp 2021-02-03 10482569 node Anakapalle, Anakapalle - Chodavaram Road, Anakapalle, Visakhapatnam, Andhra Pradesh, 531001, India railway station 0.319018527529768 India in Asia Southern Asia
+indian institute of science education and research kolkata 2021-02-03 174148762 way IISER Kolkata, National Highway 34 Connector, Haringhata, Nadia, West Bengal, 741246, India amenity university 0.101 India in Asia Southern Asia
+aries systems 2021-02-03 16414945 node Aris Global Software Pvt Ltd., Krishnaraja Sagara Road, Kumbara Koppalu, Metagalli Industrial Area, Mysuru, Mysuru taluk, Mysuru district, Karnataka, 570016, India building office 0.001 India in Asia Southern Asia
+phr 2021-02-03 20501950 node Phillaur Junction, NH44, Phillaur, Phillaur Tahsil, Jalandhar, Punjab, 144410, India railway station 0.0677101113307119 India in Asia Southern Asia
+ap 2021-02-03 258583657 relation Andhra Pradesh, India boundary administrative 0.6434753044048 India in Asia Southern Asia
+panel 2021-02-03 83972940 node Panel, Tutu, Nankhari, Shimla, Himachal Pradesh, 172001, India place hamlet 0.35 India in Asia Southern Asia
+indian institute of technology kanpur 2021-02-03 258826308 relation Indian Institute of Technology Kanpur, Hall 9 Hall 10 Road, Kanpur, Kanpur Nagar, Uttar Pradesh, 208016, India amenity university 0.911291365481044 India in Asia Southern Asia
+guru gobind singh indraprastha university 2021-02-03 124450320 way Guru Gobind Singh Indraprastha University, Road 205, Sector 17, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110078, India amenity university 0.841762590849456 India in Asia Southern Asia
+bhp 2021-02-03 18383797 node Bolpur Santiniketan, NH114, Bolpur, Bolpur Sriniketan, Birbhum, West Bengal, 731204, India railway station 0.33596057896493 India in Asia Southern Asia
+delhi university 2021-02-03 84119222 node Delhi University, Bawana-Narela Road, Narela Tehsil, North Delhi, Delhi, 110039, India amenity restaurant 0.201 India in Asia Southern Asia
+bharat biotech 2021-02-03 146726935 way biotech road, Clappana, Karunagappally, Kollam, Kerala, 690525, India highway living_street 0.2 India in Asia Southern Asia
+bharatiya janata party 2021-02-03 172374753 way Bharatiya Janata Party Office, 21st Cross Road, Ejipura, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, 560047, India office political_party 0.301 India in Asia Southern Asia
+iucaa 2021-02-03 156683919 way IUCAA Quarters, Khadki, Pune City, Pune District, Maharashtra, India landuse residential 0.3 India in Asia Southern Asia
+csr 2021-02-03 55519048 node Chak Sikandar, Station Road Chaksikandar, Bidupur, Vaishali, Bihar, 844115, India railway station 0.279354982157541 India in Asia Southern Asia
+tata institute of social sciences 2021-02-03 175114004 way Tata Institute of Social Sciences, NIRD Rd, Rajendra Nagar, Ward 60 Rajendra Nagar, Greater Hyderabad Municipal Corporation South Zone, Hyderabad, Rajendranagar mandal, Rangareddy, Telangana, 500030, India building yes 0.501 India in Asia Southern Asia
+raman research institute 2021-02-03 100698195 way Raman Research Institute, 5th Cross Road, Sadhashivanagar, Aramane Nagara Ward, West Zone, Bengaluru, Bangalore North, Bangalore Urban, Karnataka, 560080", India amenity college 0.301 India in Asia Southern Asia
+indian astronomical observatory 2021-02-03 180757589 way Indian Astronomical Observatory, Hanle, Hanle-Ukdungle road, Leh, Leh District, Ladakh, India man_made observatory 0.301 India in Asia Southern Asia
+space science institute 2021-02-03 176056727 way Indian Institute of Space Science and Technology, Trivandrum, Manoorkonam-panacode, Maannoorkkonam, Nedumangad, Thiruvananthapuram, Kerala, 695547, India amenity university 0.676937105996802 India in Asia Southern Asia
+communist party 2021-02-03 251592329 way Communist Party, Vengode- Venjaramoodu Road, Thiruvananthapuram, Kerala, 695313, India office political_party 0.201 India in Asia Southern Asia
+bhaskaracharya college of applied sciences 2021-02-03 85536123 node Bhaskaracharya College Of Applied Sciences, Nala Road, Dwarka, Dwarka Tehsil, South West Delhi, Delhi, 110075, India amenity college 0.501 India in Asia Southern Asia
+institute of electronics 2021-02-03 129614030 way Xavier Institute of Management and Entrepreneurship, Shantipura Main Road, Electronics City Phase 2 (East), Bangalore South, Bangalore Urban, Karnataka, 560100, India amenity university 0.687306266325387 India in Asia Southern Asia
+india 2021-02-03 298116298 relation India boundary administrative 0.947689135880987 India in Asia Southern Asia
+ministry of finance 2021-02-03 64686582 node Ministry of Finance, Rajpath, Central Secretariat, Rakab Ganj, Chanakya Puri Tehsil, New Delhi, Delhi, 110004, India office government 0.723545743680597 India in Asia Southern Asia
+university of delhi 2021-02-03 156201546 way University of Delhi South Campus, Benito Juarez Marg, Delhi Cantonment, New Delhi, Delhi, 110021, India amenity university 0.301 India in Asia Southern Asia
+stem cell research 2021-02-03 83776381 node Plexus Neuro & Stem Cell Research Centre, B Channasandra Main Road, Banaswadi, Banasavadi, East Zone, Bengaluru, Bangalore East, Bangalore Urban, Karnataka, 560102, India amenity hospital 0.301 India in Asia Southern Asia
+ashoka university 2021-02-03 214685328 way Ashoka University, Grand Trunk Road, Kundli Industrial Area, Rasoi, Sonipat, Haryana, 131029, India amenity university 0.201 India in Asia Southern Asia
+sinochem 2021-02-03 153854957 way DSM Sinochem Pharmaceutical Industries, Balachaur Tahsil, Shaheed Bhagat Singh Nagar, Punjab, India landuse industrial 0.3 India in Asia Southern Asia
+dpj 2021-02-03 2772343 node Dharmapuri, Main Road, Dharmapuri, Dharmapuri District, Tamil Nadu, 636700, India railway station 0.328369791841981 India in Asia Southern Asia
+bpa 2021-02-03 47709681 node Begampur, Durgapur Expressway, Chanditala - II, Hugli, West Bengal, 712310, India railway station 0.323710213530857 India in Asia Southern Asia
+all india institute of medical sciences 2021-02-03 75775290 node All India Institute of Medical Sciences, Aurobindo Marg, Yusuf Sarai Market, Defence Colony Teshil, South East Delhi, Delhi, 110029, India railway station 0.944585942469205 India in Asia Southern Asia
+national chemical laboratory 2021-02-03 105954638 way National Chemical Laboratory, NCL Colony Road, Pune City, Pune District, Maharashtra, 411008, India building yes 0.59350420583069 India in Asia Southern Asia
+department of atomic energy 2021-02-03 250761108 way Department Of Atomic Energy, Poojappura Main Road, Thirumala, Poojappura, 38 MSP Nagar, Thiruvananthapuram, Kerala, 695012, India office government 0.401 India in Asia Southern Asia
+institute of astrophysics 2021-02-03 99960273 way Indian Institute of Astrophysics, Koramangala 2nd Block, Koramangala, South Zone, Bengaluru, Bangalore South, Bangalore Urban, Karnataka, India boundary wall 0.689453166408414 India in Asia Southern Asia
+integrative biology 2021-02-03 130622683 way CSIR-Institute of Genomics & Integrative Biology, Mathura Road, Pocket A, Govindpuri, Kalkaji Tehsil, South East Delhi, Delhi, 1243, India office government 0.462719188578863 India in Asia Southern Asia
+indian institute of technology bombay 2021-02-03 259128373 relation Indian Institute of Technology Bombay, Powai, S Ward, Zone 6, Mumbai, Mumbai Suburban, Maharashtra, 400076, India amenity university 0.913885190805925 India in Asia Southern Asia
+serum institute 2021-02-03 104626139 way Serum Institute Road, Aivarakandapura, Bangalore North, Bangalore Urban, Karnataka, 560088, India highway secondary 0.3 India in Asia Southern Asia
+royal institution 2021-02-03 246099153 way institution, Salem-Kochi-Kanyakumari Road, Karthikappally, Alappuzha, Kerala, 690548, India building yes 0.111 India in Asia Southern Asia
+technology and research 2021-02-03 168546735 way Technology and Research, Kh road, Sector 14, Gandhinagar, Gandhinagar Taluka, Gandhinagar District, Gujarat, 382024, India amenity college 0.301 India in Asia Southern Asia
+ngc 2021-02-03 68608272 node New Guwahati, Ambika giri nagar, Ambikagiri Nagar, Assam, Dispur, Kamrup Metropolitan, 781024, India railway station 0.249182950422608 India in Asia Southern Asia
+moon express 2021-02-03 83029856 node Gaub Tree, Eastern Express Highway, Neelam Nagar, T Ward, Zone 6, Thane, Maharashtra, 400081, India natural tree 0.101 India in Asia Southern Asia
+universities space research association 2021-02-03 156452951 way Bharati Vidyapeetha, Admiral Somnath Path, Sneh Paradise, Erandwana, Pune City, Pune District, Maharashtra, 411038, India amenity university 0.001 India in Asia Southern Asia
+giant metrewave radio telescope 2021-02-03 259119626 relation Giant Metrewave Radio Telescope, SH53, Ambegaon, Pune District, Maharashtra, India amenity research_institute 0.401 India in Asia Southern Asia
+phat 2021-02-03 81736230 node Phat, Palampur, Kangra, Himachal Pradesh, 176102, India place village 0.375 India in Asia Southern Asia
+crp 2021-02-03 6778817 node Chandrapura Junction, Chandrapura, Bokaro, Jharkhand, 828404, India railway station 0.328369791841981 India in Asia Southern Asia
+ligo-india 2021-02-03 234678680 way LIGO India project site, Aundha (Nagnath), Hingoli, Maharashtra, India landuse construction 0.4 India in Asia Southern Asia
+academic journals 2021-02-03 67750372 node المركز الاكاديمي للنشر Ù<81>ÙŠ المجلات العالمية, باب المعظم, مدينة الطب, البلدية الرصاÙ<81>Ø©, بغداد, ناØية مرکز قضاء الرصاÙ<81>Ø©, قضاء الرصاÙ<81>Ø©, Ù…ØاÙ<81>ظة بغداد, 10047, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© amenity university 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+university of technology 2021-02-03 109742498 way الجامعة التكنلوجية, سريع Ù…Øمد القاسم, Sinaa', البلدية الكرادة, بغداد, ناØية الكرادة, قضاء الرصاÙ<81>Ø©, Ù…ØاÙ<81>ظة بغداد, 3241, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© amenity university 0.3689594008139 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+higher institute of health 2021-02-03 247159587 way Higher Institute of Health Professions, شەقامی بازاڕی مووسەڵا, Ú¯Û•Ú•Û•Ú©ÛŒ قازی Ù…Øەمەد, كركوك, ناØیەی ناوەندەکەی قەزای کەرکووک, قضاء كركوك / قەزای كەركووك, Ù…ØاÙ<81>ظة كركوك / پارێزگای کەرکووک, 36001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© office educational_institution 0.401 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+national university of sciences and technology 2021-02-03 255577829 way الجامعة الوطنية للعلوم والتكنولوجيا, شارع المرتضا, الÙ<81>داء, الناصرية, Ù…ØاÙ<81>ظة ذي قار, 64001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© amenity college 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+ministry of natural resources 2021-02-03 213588840 way Ministry Of Natural Resources, Salahaddin, پارکی سامی عەبدولڕەØمان, هەولێر, ناØیەی ناوەندەکەی قەزای ھەولێر, قەزای ھەولێر, پارێزگای هەولێر, ‎هەرێمی کوردستان, 44001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© office government 0.401 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+refugees international 2021-02-03 67638652 node IFIR - Ù<81>یدراسیۆنی پەنابەران, 05, 412-5, Rizgari 412, سلێمانی, ناØیەی بەکرەجۆ, قەزای سلێمانی, ‎هەرێمی کوردستان, 46001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© office ngo 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+emergency response division 2021-02-03 69832805 node شعبة استجابة الطوارئ, شارع الجمهورية, الØكيمية, ناØية مرکز قضاء البصرة, قضاء البصرة, Ù…ØاÙ<81>ظة البصرة, 99650, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© tourism artwork 0.001 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+university of kurdistan 2021-02-03 69030276 node زانکۆی سەلاØەددین-ھەولێر/ Ú©Û†Ù„ÛŽÚ˜ÛŒ ئەندازیاری بەشی ئەندازیاریی سەرچاوەکانی ئاو Ùˆ بەنداوو, شەقامی زانکۆ, زانکۆ ٣٤١, هەولێر, ناØیەی ناوەندەکەی قەزای ھەولێر, قەزای ھەولێر, پارێزگای هەولێر, ‎هەرێمی کوردستان, 44001, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© amenity college 0.338041195081873 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+nwf 2021-02-03 24555027 node نوÙ<81>, ناØية السنية, قضاء الديوانية, Ù…ØاÙ<81>ظة القادسية, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© place village 0.275 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+national centre for scientific research 2021-02-03 109500352 way المركز الوطني للعلوم والابØاث, شارع الأميرات, Ù…Øلة 601, Mansour, المنصور, بغداد, قضاء الکرخ, Ù…ØاÙ<81>ظة بغداد, 10013, العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© office research 0.195871082899258 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+iraq 2021-02-03 257951804 relation العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© boundary administrative 0.746511820604847 العراق / عێراق / Ü¥Ü<9d>ܪÜ<90>Ü© iq Asia Western Asia
+tehran university 2021-02-03 259097888 relation دانشگاه تهران, منطقه ۶ شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, ایران boundary administrative 0.2 ایران ir Asia Southern Asia
+islamic revolutionary guard corps 2021-02-03 75598301 node سپاه پاسدارن انقلاب اسلامی, شهید Ù<81>همیده, گرمی, دهستان انی, بخش مرکزی, شهرستان گرمی, استان اردبیل, ایران office government 0.001 ایران ir Asia Southern Asia
+wsl 2021-02-03 177714403 way وصل, دزÙ<81>ول, شهر دزÙ<81>ول, بخش مرکزی, شهرستان دزÙ<81>ول, استان خوزستان, 009861, ایران highway residential 0.1 ایران ir Asia Southern Asia
+academy of medical sciences 2021-02-03 249549450 way Ù<81>رهنگستان علوم پزشکی, اراضی عباس آباد, منطقه Û³ شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1919816311, ایران highway tertiary 0.1 ایران ir Asia Southern Asia
+ministry of science 2021-02-03 216486765 way وزارت علوم، تØقیقات Ùˆ Ù<81>ناوری, پیروزان جنوبی, شهرک غرب, منطقه Û² شهر تهران, شهرداری تهران منطقه شش ساختمان انبار مرکزی, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1466913734, ایران office government 0.4318394385017 ایران ir Asia Southern Asia
+trp 2021-02-03 45155123 node ترپ, دهستان رودقات, بخش صوÙ<81>یان, شهرستان شبستر, استان آذربایجان شرقی, ایران place village 0.325302870611459 ایران ir Asia Southern Asia
+ira 2021-02-03 258075432 relation ایران boundary administrative 0.824702703615226 ایران ir Asia Southern Asia
+eni 2021-02-03 43316866 node اعنی, دهستان شوئیل, بخش رØیم آباد, شهرستان رودسر, استان گیلان, ایران place village 0.275 ایران ir Asia Southern Asia
+tehran university of medical sciences 2021-02-03 54623759 node دانشگاه علوم پزشکی Ùˆ خدمات بهداشتی درمانی تهران, Û±Û¶ آذر, دانشگاه تهران, منطقه Û¶ شهر تهران, شهرداری تهران منطقه شش ناØیه سه, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1314665611, ایران amenity university 0.383021208265432 ایران ir Asia Southern Asia
+institute for research in fundamental sciences 2021-02-03 133035312 way پژوهشگاه دانش‌های بنیادی, دکتر باهنر, Øصار بوعلی, نیاوران, منطقه Û± شهر تهران, شهر تهران, بخش رودبار قصران, شهرستان شمیرانات, استان تهران, ١٩٧٨٧٣٧٤٨٣, ایران amenity university 0.31689306175332 ایران ir Asia Southern Asia
+nfl 2021-02-03 52785808 node Ù†Ù<81>Ù„, دهستان جایزان, بخش جایزان, شهرستان امیدیه, استان خوزستان, ایران place hamlet 0.25 ایران ir Asia Southern Asia
+nsl 2021-02-03 6151867 node نسل, دهستان رزآب, بخش مرکزی, شهرستان سروآباد, استان کردستان, ایران place village 0.281311730611622 ایران ir Asia Southern Asia
+iran 2021-02-03 258075432 relation ایران boundary administrative 0.824702703615226 ایران ir Asia Southern Asia
+tarbiat modares university 2021-02-03 188950452 way tarbiat modares university, آل اØمد - شریعتی, آل اØمد, منطقه Û¶ شهر تهران, شهرداری تهران منطقه شش ساختمان انبار مرکزی, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1439634564, ایران highway service 0.375 ایران ir Asia Southern Asia
+hse 2021-02-03 258618125 relation استان هرمزگان, ایران boundary administrative 0.571634966054199 ایران ir Asia Southern Asia
+goodarzi 2021-02-03 199464728 way گودرزی, Ú©ÙˆÛŒ Ù<81>رهنگیان, شهر بروجرد, دهستان همت‌آباد, بخش مرکزی, شهرستان بروجرد, استان لرستان‎, 6915863614, ایران highway residential 0.1 ایران ir Asia Southern Asia
+islamic azad university 2021-02-03 66010042 node دانشگاه آزاد اسلامی همدان, مرز دانشگاه آزاد اسلامی, شهر همدان, بخش مرکزی شهرستان همدان, شهرستان همدان, استان همدان, همدان, ایران place neighbourhood 0.25 ایران ir Asia Southern Asia
+niakan 2021-02-03 197613717 way نیاکان, پوریای ولی, شهر اصÙ<81>هان, بخش مرکزی شهرستان اصÙ<81>هان, شهرستان اصÙ<81>هان, استان اصÙ<81>هان, 8148745781, ایران highway residential 0.1 ایران ir Asia Southern Asia
+nimh 2021-02-03 79156398 node کوه Ù†Ù<90>مه, دهستان سولقان, بخش Ú©Ù†, شهرستان تهران, استان تهران, ایران natural ridge 0.2 ایران ir Asia Southern Asia
+sharif university of technology 2021-02-03 139885466 way دانشگاه صنعتی شریÙ<81>, خیابان آزادی, زنجان شمالی, منطقه Û² شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1458744811, ایران amenity university 0.430996300874427 ایران ir Asia Southern Asia
+institute of agricultural resources 2021-02-03 71510476 node مرکز تØقیقات کشاورزی Ùˆ منابع‌طبیعی زابل, مرکز تØقیقات کشاورزی, دهستان قائم آباد, بخش مرکزی, شهرستان نیمروز, استان سیستان Ùˆ بلوچستان, 432, ایران office research 0.001 ایران ir Asia Southern Asia
+university of tehran 2021-02-03 180641108 way پردیس مرکزی دانشگاه‌ تهران, Û±Û¶ آذر, دانشگاه تهران, منطقه Û¶ شهر تهران, شهرداری تهران منطقه شش ناØیه سه, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1418893844, ایران amenity university 0.317252435362624 ایران ir Asia Southern Asia
+agriculture organization 2021-02-03 54642145 node جهادکشاورزی استان آذربایجان شرقی, امیر کبیر, مرز Ù…Øله, لیلاوا, شهر تبریز, بخش مرکزی شهرستان تبریز, شهرستان تبریز, استان آذربایجان شرقی, 5183731665, ایران office government 0.001 ایران ir Asia Southern Asia
+toshiba 2021-02-03 259514382 relation توشیبا, شهر رشت, بخش مرکزی شهرستان رشت, شهرستان رشت, استان گیلان, ایران boundary administrative 0.2 ایران ir Asia Southern Asia
+sony 2021-02-03 83913921 node sony xperia نمایندگی سونی, 1, خیابان بهشت, بهشت, ناØیه۲ منطقه Û±, منطقه Û±, شهر مشهد, بخش مرکزی شهرستان مشهد, شهرستان مشهد, استان خراسان رضوی, 9183717469, ایران shop mobile_phone 0.594712396341918 ایران ir Asia Southern Asia
+cultural heritage 2021-02-03 194900450 way سازمان میراث Ù<81>رهنگی، صنایع دستی Ùˆ گردشگری, یکم, شهرک ملاصدرا, چهارصد دستگاه, شهر قزوین, مرز شهر قزوین, شهرستان قزوین, استان قزوین, چهار راه هشت بهشت, ایران office yes 0.001 ایران ir Asia Southern Asia
+niid 2021-02-03 61915448 node ناهید, سه راه امین, بازار, لک لر, شهر تبریز, بخش مرکزی شهرستان تبریز, شهرستان تبریز, استان آذربایجان شرقی, 5133837777, ایران highway bus_stop 0.001 ایران ir Asia Southern Asia
+energy research institute 2021-02-03 100441310 way مرکز تØقیقات وزارت نیرو, گلستان دوم, درختی, منطقه Û² شهر تهران, شهر تهران, بخش مرکزی شهرستان تهران, شهرستان تهران, استان تهران, 1468763785, ایران amenity university 0.001 ایران ir Asia Southern Asia
+house 2021-02-03 258618125 relation استان هرمزگان, ایران boundary administrative 0.571634966054199 ایران ir Asia Southern Asia
+kermanshah university of medical sciences 2021-02-03 206194946 way دانشگاه علوم پزشکی کرمانشاه, شاهمرادی, کرمانشاه, شهر کرمانشاه, بخش مرکزی, شهرستان کرمانشاه, استان کرمانشاه, 6714853559, ایران amenity university 0.001 ایران ir Asia Southern Asia
+oic 2021-02-03 227400895 way OIEC, منطقه ۱ شهر تهران, شهر تجریش, بخش رودبار قصران, شهرستان شمیرانات, استان تهران, ایران landuse commercial 0.2 ایران ir Asia Southern Asia
+perlan 2021-02-03 96152073 way Perlan, 1, VarmahlÃð, HlÃðar, ReykjavÃkurborg, Höfuðborgarsvæðið, 105, Ã<8d>sland tourism attraction 0.379354982157541 Ã<8d>sland is Europe Northern Europe
+iceland 2021-02-03 258407939 relation Ã<8d>sland boundary administrative 0.735687578250399 Ã<8d>sland is Europe Northern Europe
+egs 2021-02-03 210808767 way Egilsstaðaflugvöllur, Flugvallarvegur Egilsstöðum, Egilsstaðir, Múlaþing, Austurland, 700, Ã<8d>sland aeroway aerodrome 0.328668254407684 Ã<8d>sland is Europe Northern Europe
+decode genetics 2021-02-03 81109668 node Ã<8d>slensk erfðagreining, 8, Sturlugata, Háskóli, Miðborg, ReykjavÃkurborg, Höfuðborgarsvæðið, 102, Ã<8d>sland office company 0.001 Ã<8d>sland is Europe Northern Europe
+national earthquake center 2021-02-03 163994877 way Skjálftasetrið, Akurgerði, Kópasker, Norðurþing, Norðurland eystra, 670, Ã<8d>sland tourism museum 0.001 Ã<8d>sland is Europe Northern Europe
+reykjavik 2021-02-03 258385845 relation ReykjavÃkurborg, Höfuðborgarsvæðið, Ã<8d>sland boundary administrative 0.618605174933632 Ã<8d>sland is Europe Northern Europe
+university of iceland 2021-02-03 259157894 relation Háskóli Ã<8d>slands, Ingunnargata, Háskóli, Miðborg, ReykjavÃkurborg, Höfuðborgarsvæðið, 102, Ã<8d>sland amenity university 0.460302392667561 Ã<8d>sland is Europe Northern Europe
+nasu 2021-02-03 257688452 relation Naso, Messina, Sicilia, 98074, Italia boundary administrative 0.477768525385992 Italia it Europe Southern Europe
+bari 2021-02-03 301984442 relation Bari, Puglia, Italia boundary administrative 0.718718321253269 Italia it Europe Southern Europe
+people nih 2021-02-03 50769806 node People, Piazza dell'Olmo, Terni, Umbria, 05100, Italia amenity bar 0.101 Italia it Europe Southern Europe
+university of valle 2021-02-03 104135116 way Università degli Studi dell'Insubria, Piazza della Repubblica, Motta, Giubiano, Biumo Superiore, Varese, Lombardia, Italia amenity university 0.395276863807175 Italia it Europe Southern Europe
+abr 2021-02-03 258290208 relation Abruzzo, Italia boundary administrative 0.755885514368911 Italia it Europe Southern Europe
+sanaria 2021-02-03 72287577 node Sanaria, Via Armando Diaz, Centro Storico, Borgo San Giuseppe, Cuneo, Piemonte, 12100, Italia shop chemist 0.101 Italia it Europe Southern Europe
+sachs 2021-02-03 63324331 node Sachs, Rio, Paularo, UTI della Carnia, Friuli Venezia Giulia, 33027, Italia place isolated_dwelling 0.3 Italia it Europe Southern Europe
+civil protection 2021-02-03 7407617 node Sede Protezione Civile, 4, Via delle Gambarare, San Tommaso, Soleschiano, Vermegliano, Ronchi dei Legionari, UTI Carso Isonzo Adriatico / MTU Kras SoÄ<8d>a Jadran, Friuli Venezia Giulia, 34077, Italia building public 0.101 Italia it Europe Southern Europe
+us marine 2021-02-03 257688159 relation Marineo, Palermo, Sicilia, 90035, Italia boundary administrative 0.569621885852042 Italia it Europe Southern Europe
+pz 2021-02-03 256841560 relation Potenza, Basilicata, Italia boundary administrative 0.623700593766485 Italia it Europe Southern Europe
+cossa 2021-02-03 13413104 node Cossa, Via Vittorio Asinari di Bernezzo, Parella, Circoscrizione 4, Torino, Piemonte, 10146, Italia highway bus_stop 0.101 Italia it Europe Southern Europe
+cal 2021-02-03 258205142 relation Calabria, Italia boundary administrative 0.767103527755831 Italia it Europe Southern Europe
+foscari university of venice 2021-02-03 27324924 node Università Ca' Foscari, Calle Giustinian, Dorsoduro, Venezia-Murano-Burano, Mestre, Venezia, Veneto, 30170, Italia amenity university 0.548258147549701 Italia it Europe Southern Europe
+mol 2021-02-03 256848066 relation Molise, Italia boundary administrative 0.73612097112061 Italia it Europe Southern Europe
+fao 2021-02-03 50992903 node FAO, Viale Aventino, Municipio Roma I, Roma, Roma Capitale, Lazio, 00153, Italia office government 0.503670690295642 Italia it Europe Southern Europe
+continental africa 2021-02-03 59058346 node Africa, Monteveglio Alto, Monteveglio, Valsamoggia, Unione dei comuni Valli del Reno, Lavino e Samoggia, Bologna, Emilia-Romagna, 40053, Italia place locality 0.225 Italia it Europe Southern Europe
+parma 2021-02-03 257214446 relation Parma, Emilia-Romagna, Italia boundary administrative 0.725573424016841 Italia it Europe Southern Europe
+nus 2021-02-03 258085241 relation Nus, Valle d'Aosta/Vallée d'Aoste, Italia boundary administrative 0.581645085983748 Italia it Europe Southern Europe
+consert 2021-02-03 217849481 way ConserT srl, Cavaione, Truccazzano, Milano, Lombardia, Italia landuse industrial 0.3 Italia it Europe Southern Europe
+us navy 2021-02-03 16815715 node Us Navy, SP69/II, San Giorgio-Librino-San Giuseppe la Rena-Zia Lisa-Villaggio Sant'Agata, Lentini, Siracusa, Sicilia, Italia amenity fuel 0.201 Italia it Europe Southern Europe
+university of trento 2021-02-03 102238581 way ex Biblioteca universitaria centrale, Via Giuseppe Verdi, Laboratorio Sociale Officina Piedicastello, Piedicastello, Trento, Territorio Val d'Adige, Provincia di Trento, Trentino-Alto Adige/Südtirol, 38122, Italia building university 0.201 Italia it Europe Southern Europe
+adria 2021-02-03 257700491 relation Adria, Rovigo, Veneto, 45011, Italia boundary administrative 0.58739021265696 Italia it Europe Southern Europe
+palermo 2021-02-03 258312426 relation Palermo, Sicilia, Italia boundary administrative 0.756114817144791 Italia it Europe Southern Europe
+aetna 2021-02-03 241820 node Etna, Maletto, Catania, Sicilia, Italia natural volcano 0.547928846167033 Italia it Europe Southern Europe
+imt 2021-02-03 258348177 relation Campus IMT, 19, Piazza San Francesco, San Concordio, Lucca, Toscana, 55100, Italia building school 0.443892137025745 Italia it Europe Southern Europe
+vlbi 2021-02-03 60295636 node Antenna VLBI, SP5, Matera, Basilicata, 74013, Italia man_made tower 0.101 Italia it Europe Southern Europe
+chamber of deputies 2021-02-03 61264691 node Camera dei deputati, Piazza del Parlamento, Rione III Colonna, Municipio Roma I, Roma, Roma Capitale, Lazio, 00186, Italia office government 0.553523844412523 Italia it Europe Southern Europe
+sar 2021-02-03 259005837 relation Sardegna, Italia boundary administrative 0.784794769506041 Italia it Europe Southern Europe
+cs 2021-02-03 257689055 relation Cosenza, Calabria, Italia boundary administrative 0.62816937725518 Italia it Europe Southern Europe
+fgf 2021-02-03 15408539 node FGF, 12, Piazza Insurrezione, Isola San Giacomo, Padova, Veneto, 35149, Italia shop clothes 0.101 Italia it Europe Southern Europe
+cosac 2021-02-03 179535513 way Vicolo Cosac, Carvacco, Vendoglio, Treppo Grande, UTI Collinare, Friuli Venezia Giulia, Italia highway residential 0.2 Italia it Europe Southern Europe
+cassini 2021-02-03 3464485 node Cassini, Barasso, Varese, Lombardia, 21025, Italia place hamlet 0.35 Italia it Europe Southern Europe
+legambiente 2021-02-03 67713400 node Legambiente, Piazzetta San Giovanni dal Fosso, Perugia, Umbria, 06122, Italia office association 0.101 Italia it Europe Southern Europe
+casa sollievo 2021-02-03 73520663 node Casa Sollievo, Due Torri 3 Perpendicolare, Due Torri, Fiumarella, Milazzo, Messina, Sicilia, 98057, Italia amenity social_facility 0.201 Italia it Europe Southern Europe
+national research council of italy 2021-02-03 258812264 relation Consiglio Nazionale delle Ricerche, Via degli Irpini, San Lorenzo, Municipio Roma II, Roma, Roma Capitale, Lazio, 00185, Italia amenity research_centre 0.001 Italia it Europe Southern Europe
+allea 2021-02-03 224399555 way Largo Luigi Sante Colonna, Sacro Cuore, Novara, Piemonte, 28100, Italia highway tertiary 0.1 Italia it Europe Southern Europe
+university of padua 2021-02-03 5420036 node Aula studio "Jappelli", Via Giuseppe Jappelli, Forcellini, Padova, Veneto, 35121, Italia amenity university 0.001 Italia it Europe Southern Europe
+ri 2021-02-03 258315439 relation Rieti, Lazio, Italia boundary administrative 0.722134276481888 Italia it Europe Southern Europe
+mar 2021-02-03 257717754 relation Marche, Italia boundary administrative 0.753750462851578 Italia it Europe Southern Europe
+university of pavia 2021-02-03 4601061 node Università di Pavia, Largo Giorgio La Pira, Borgo Ticino, Pavia, Lombardia, 27100, Italia amenity university 0.602616832398112 Italia it Europe Southern Europe
+university of catania 2021-02-03 259056568 relation Università degli Studi di Catania - Dipartimento di Giurisprudenza, Picanello-Ognina-Barriera-Canalicchio, Catania, Sicilia, Italia amenity university 0.565624057571395 Italia it Europe Southern Europe
+ictp 2021-02-03 99444447 way ICTP Galileo Guesthouse, 7, Via Beirut, Roiano-Gretta-Barcola-Cologna-Scorcola, Miramare / Miramar, Trieste, UTI Giuliana / Julijska MTU, Friuli Venezia Giulia, 34151, Italia building university 0.101 Italia it Europe Southern Europe
+crisanti 2021-02-03 37862607 node Casa Crisanti, Scillato, Palermo, Sicilia, 90020, Italia place isolated_dwelling 0.3 Italia it Europe Southern Europe
+sca 2021-02-03 226340670 way Sca, Montaretto, Bonassola, La Spezia, Liguria, Italia natural beach 0.3 Italia it Europe Southern Europe
+university of bologna 2021-02-03 45355087 node Johns Hopkins University, 11, Via Belmeloro, Irnerio, Santo Stefano, Bologna, Emilia-Romagna, 40126, Italia amenity university 0.201 Italia it Europe Southern Europe
+forza italia 2021-02-03 49634864 node Forza Italia, 3, Via del Borgo Antico, Centro, Gallarate, Varese, Lombardia, 21013, Italia office political_party 0.201 Italia it Europe Southern Europe
+european food safety authority 2021-02-03 258983516 relation EFSA, 1A, Via Carlo Magno, Cornocchio, Pablo, Parma, Emilia-Romagna, 43126, Italia office government 0.45558864174307 Italia it Europe Southern Europe
+di maio 2021-02-03 61053488 node Di Maio, Piazza Noce, Uditore, V Circoscrizione, Palermo, Sicilia, 90135, Italia shop bakery 0.201 Italia it Europe Southern Europe
+cmv 2021-02-03 129267416 way CMV, Via Baldassarre Malamini, Zona Industriale Cento 2000, Cento, Unione Alto Ferrarese, Ferrara, Emilia-Romagna, 44042, Italia building yes 0.101 Italia it Europe Southern Europe
+university of pisa 2021-02-03 95844002 way Reserved university parking, Via Emanuele Filiberto (Duca d'Aosta), Pratale, Pisa, Toscana, 56127, Italia amenity parking 0.201 Italia it Europe Southern Europe
+national front 2021-02-03 257702157 relation Front, Torino, Piemonte, Italia boundary administrative 0.628491408781471 Italia it Europe Southern Europe
+mosaico 2021-02-03 44551556 node Mosaico, Via Tito Livio, San Leonardo, Larino, Campobasso, Molise, 86035, Italia tourism attraction 0.377334066701962 Italia it Europe Southern Europe
+cornare 2021-02-03 15654248 node Cornarè, Mansuè, Treviso, Veneto, 31018, Italia place hamlet 0.25 Italia it Europe Southern Europe
+verona 2021-02-03 257258792 relation Verona, Veneto, Italia boundary administrative 0.746157388882853 Italia it Europe Southern Europe
+ingv 2021-02-03 105415909 way Istituto Nazionale di Geofisica e Vulcanologia, 605, Via di Vigna Murata, Quartiere XX Ardeatino, Roma, Roma Capitale, Lazio, 00143, Italia amenity research_institute 0.312795139465266 Italia it Europe Southern Europe
+italy 2021-02-03 258444203 relation Italia boundary administrative 0.883101903144055 Italia it Europe Southern Europe
+candiolo cancer institute 2021-02-03 100915781 way Istituto per la Ricerca e la Cura del Cancro Candiolo (IRCCS), SP142, Candiolo, Torino, Piemonte, Italia amenity hospital 0.101 Italia it Europe Southern Europe
+icr 2021-02-03 257993141 way ICR, Casa Malaspina, Lodi, Lombardia, Italia landuse industrial 0.3 Italia it Europe Southern Europe
+national institute of statistics 2021-02-03 69505825 node ISTAT Ufficio Regionale Toscana, 80, Via dell'Agnolo, San Niccolò, Quartiere 1, Firenze, Toscana, 50122, Italia office research 0.703323682867195 Italia it Europe Southern Europe
+sapienza university of rome 2021-02-03 716518 node Università La Sapienza sede distaccata Architettura, Piazza Borghese, Rione IV Campo Marzio, Municipio Roma I, Roma, Roma Capitale, Lazio, 00186, Italia amenity university 0.101 Italia it Europe Southern Europe
+sapienza university 2021-02-03 93614288 way Sapienza Università di Roma, Piazzale del Verano, San Lorenzo, Municipio Roma II, Roma, Roma Capitale, Lazio, 00161, Italia amenity university 0.646633621782453 Italia it Europe Southern Europe
+efsa 2021-02-03 258983516 relation EFSA, 1A, Via Carlo Magno, Cornocchio, Pablo, Parma, Emilia-Romagna, 43126, Italia office government 0.55558864174307 Italia it Europe Southern Europe
+numonyx 2021-02-03 33774179 node Via Alfredo Agosta f/te Numonyx, Via Alfredo Agosta, San Giorgio-Librino-San Giuseppe la Rena-Zia Lisa-Villaggio Sant'Agata, Catania, Sicilia, 95121, Italia highway bus_stop 0.101 Italia it Europe Southern Europe
+joint research centre 2021-02-03 233423450 way Joint Research Centre, Barza, Ispra, Varese, Lombardia, Italia landuse industrial 0.663793454953531 Italia it Europe Southern Europe
+inaf 2021-02-03 113942153 way La Specola, 5, Vicolo dell'Osservatorio, San Giuseppe, Padova, Veneto, 35141, Italia tourism attraction 0.258218474293395 Italia it Europe Southern Europe
+university of milan bicocca 2021-02-03 44257894 node University Bar, 13, Via Luigi Pulci, Bicocca, Municipio 9, Milano, Lombardia, 20162, Italia amenity restaurant 0.301 Italia it Europe Southern Europe
+sissa 2021-02-03 256792 node Sissa, Sissa Trecasali, Parma, Emilia-Romagna, 43018, Italia place village 0.549149847834766 Italia it Europe Southern Europe
+university of insubria 2021-02-03 104135116 way Università degli Studi dell'Insubria, Piazza della Repubblica, Motta, Giubiano, Biumo Superiore, Varese, Lombardia, Italia amenity university 0.495276863807175 Italia it Europe Southern Europe
+baselga 2021-02-03 257765077 relation Baselga di Piné, Comunità Alta Valsugana e Bersntol, Provincia di Trento, Trentino-Alto Adige/Südtirol, 38042, Italia boundary administrative 0.610764750724671 Italia it Europe Southern Europe
+istituto di astrofisica 2021-02-03 96661608 way INAF - Istituto Nazionale di AstroFisica, Viale Professor Cesare Sanfilippo, Picanello-Ognina-Barriera-Canalicchio, Catania, Sicilia, 95123, Italia building university 0.574532111506442 Italia it Europe Southern Europe
+university of milan-bicocca 2021-02-03 44257894 node University Bar, 13, Via Luigi Pulci, Bicocca, Municipio 9, Milano, Lombardia, 20162, Italia amenity restaurant 0.301 Italia it Europe Southern Europe
+epica 2021-02-03 188500501 way Epica, SP146/bis, Pianomonaci, Sinagra, Messina, Sicilia, 98069, Italia craft brewery 0.101 Italia it Europe Southern Europe
+eia 2021-02-03 3653571 node Eia, Golese, Parma, Emilia-Romagna, 43126, Italia place hamlet 0.526719844716193 Italia it Europe Southern Europe
+fermi 2021-02-03 15584094 node Fermi, Via Edmondo De Amicis, Borgata Paradiso, Collegno, Torino, Piemonte, 10093, Italia railway station 0.394028740055238 Italia it Europe Southern Europe
+asce 2021-02-03 50299980 node Sc'é, Dalico, Chiuro, Comunità Montana della Valtellina di Sondrio, Sondrio, Lombardia, 23026, Italia place locality 0.125 Italia it Europe Southern Europe
+cta 2021-02-03 103730268 way Aeroporto di Catania Fontanarossa, Via Filippo Eredia, Villaggio Santa Maria Goretti, San Giorgio-Librino-San Giuseppe la Rena-Zia Lisa-Villaggio Sant'Agata, Catania, Sicilia, 95121, Italia aeroway aerodrome 0.452592978117187 Italia it Europe Southern Europe
+la repubblica 2021-02-03 2308014 node Repubblica, Piazza della Repubblica, Municipio Roma I, Roma, Roma Capitale, Lazio, 00184, Italia railway station 0.563961619858331 Italia it Europe Southern Europe
+piper 2021-02-03 24253230 node Monte Piper, Dogna, UTI del Canal del Ferro - Val Canale, Friuli Venezia Giulia, Italia natural peak 0.4 Italia it Europe Southern Europe
+university of cagliari 2021-02-03 49358856 node Scuola Universitaria per Mediatori Linguistici, Via Abruzzi, San Michele, Pirri, Cagliari - Casteddu, Cagliari, Sardegna, 09122, Italia amenity university 0.101 Italia it Europe Southern Europe
+cagliari 2021-02-03 258069296 relation Cagliari - Casteddu, Cagliari, Sardegna, Italia boundary administrative 0.702776535106675 Italia it Europe Southern Europe
+jrc 2021-02-03 233423450 way Joint Research Centre, Barza, Ispra, Varese, Lombardia, Italia landuse industrial 0.363793454953531 Italia it Europe Southern Europe
+university of rome 2021-02-03 104579427 way Pontificia Università Gregoriana, 4, Piazza della Pilotta, Rione II Trevi, Municipio Roma I, Roma, Roma Capitale, Lazio, 00187, Italia amenity university 0.553259727348553 Italia it Europe Southern Europe
+procter & gamble 2021-02-03 107973245 way 100, Procter & Gamble, Santa Palomba, Pomezia, Roma Capitale, Lazio, 00040, Italia landuse industrial 0.4 Italia it Europe Southern Europe
+university of padova 2021-02-03 5420036 node Aula studio "Jappelli", Via Giuseppe Jappelli, Forcellini, Padova, Veneto, 35121, Italia amenity university 0.101 Italia it Europe Southern Europe
+gavi 2021-02-03 258404642 relation Gavi, Alessandria, Piemonte, 15066, Italia boundary administrative 0.626348589615649 Italia it Europe Southern Europe
+ceres 2021-02-03 257753212 relation Ceres, Unione Montana di Comuni delle Valli di Lanzo, Ceronda e Casternone, Torino, Piemonte, Italia boundary administrative 0.633997464448559 Italia it Europe Southern Europe
+nokia bell labs 2021-02-03 202583074 way Nokia Bell Labs, Via Energy Park, Segro Energy Park, Torri Bianche, Vimercate, Monza e della Brianza, Lombardia, 20871, Italia building yes 0.301 Italia it Europe Southern Europe
+cia 2021-02-03 94840491 way Aeroporto di Roma-Ciampino, Via Palmiro Togliatti, Ciampino, Roma Capitale, Lazio, 00043, Italia aeroway aerodrome 0.548980991840454 Italia it Europe Southern Europe
+famiglia cristiana 2021-02-03 119137909 way Via Famiglia Cristiana, Sicomo, Mazara del Vallo, Trapani, Sicilia, 91026, Italia highway residential 0.3 Italia it Europe Southern Europe
+ferrari 2021-02-03 107882148 way Museo Galleria Ferrari, 43, Viale Alfredo Dino Ferrari, Bell'Italia, Maranello, Unione dei comuni del Distretto Ceramico, Modena, Emilia-Romagna, 41053, Italia tourism museum 0.427161274702289 Italia it Europe Southern Europe
+university of perugia 2021-02-03 26169643 node Università per Stranieri di Perugia, Piazza Braccio Fortebraccio, Elce, Ponte Rio, Perugia, Umbria, 06122, Italia amenity university 0.508664926536407 Italia it Europe Southern Europe
+etna 2021-02-03 241820 node Etna, Maletto, Catania, Sicilia, Italia natural volcano 0.647928846167033 Italia it Europe Southern Europe
+ceva 2021-02-03 257748591 relation Ceva, Cuneo, Piemonte, 12073, Italia boundary administrative 0.645044323052155 Italia it Europe Southern Europe
+ari 2021-02-03 257982588 relation Ari, Chieti, Abruzzo, Italia boundary administrative 0.588735462120359 Italia it Europe Southern Europe
+university of bergamo 2021-02-03 145293897 way Università degli Studi di Bergamo, Via dei Caniana, Finazzi, San Tommaso, Grumellina, Bergamo, Lombardia, 24122, Italia amenity university 0.508338828424476 Italia it Europe Southern Europe
+university of turin 2021-02-03 59730551 node Università degli Studi di Torino - Dipartimento di Chimica, Via Pietro Giuria, San Salvario, Circoscrizione 8, Torino, Piemonte, 10125, Italia amenity university 0.001 Italia it Europe Southern Europe
+fera 2021-02-03 12359963 node Il Ferà , Cuneo, Piemonte, Italia natural peak 0.3 Italia it Europe Southern Europe
+aurora cannabis 2021-02-03 299833705 way Cannabis, Livorno, Toscana, 57128, Italia highway path 0.175 Italia it Europe Southern Europe
+ibl 2021-02-03 108832964 way IBL, Cavallino, Coniolo, Alessandria, Piemonte, Italia landuse industrial 0.3 Italia it Europe Southern Europe
+university of udine 2021-02-03 46572117 node University Residences Udine, 14, Via della Vigna, Borgo Grazzano, Udine, UTI del Friuli Centrale, Friuli Venezia Giulia, 33100, Italia building dormitory 0.201 Italia it Europe Southern Europe
+mose 2021-02-03 2517979 node Mosè, 4/a, Piazza di San Pietro in Vincoli, Rione I Monti, Municipio Roma I, Roma, Roma Capitale, Lazio, 00184, Italia tourism artwork 0.427503445679354 Italia it Europe Southern Europe
+di ferranti 2021-02-03 14645919 node Ferranti, Strada Provinciale 502 di Cingoli, Savignano, Caccamo, Serrapetrona, Macerata, Marche, Italia tourism hotel 0.201 Italia it Europe Southern Europe
+slow food italy 2021-02-03 55351950 node Slow Food Godo e Bassa Romagna, 17, Via della Chiesa, Villanova di Bagnacavallo, Bagnacavallo, Unione dei comuni della Bassa Romagna, Ravenna, Emilia-Romagna, 48012, Italia office association 0.201 Italia it Europe Southern Europe
+gsk vaccines 2021-02-03 259248267 relation GSK Vaccines, Petriccio, Siena, Toscana, Italia landuse industrial 0.4 Italia it Europe Southern Europe
+cosce 2021-02-03 136820 node Monte Cosce, Configni, Rieti, Lazio, Italia natural peak 0.4 Italia it Europe Southern Europe
+united nations world food programme 2021-02-03 119517457 way United Nations World Food Programme, Brindisi, Puglia, Italia landuse military 0.7 Italia it Europe Southern Europe
+huvepharma 2021-02-03 159437631 way Huvepharma (ex Sanofi), Garessio, Cuneo, Piemonte, Italia landuse industrial 0.3 Italia it Europe Southern Europe
+sti 2021-02-03 258286912 relation Cittiglio, Unione dei comuni del Medio Verbano, Varese, Lombardia, 21033, Italia boundary administrative 0.491063953249507 Italia it Europe Southern Europe
+euratom 2021-02-03 233423450 way Joint Research Centre, Barza, Ispra, Varese, Lombardia, Italia landuse industrial 0.363793454953531 Italia it Europe Southern Europe
+vimm 2021-02-03 121353519 way VIMM, Via Giuseppe Orus, Stanga, Padova, Veneto, 35131, Italia amenity public_building 0.101 Italia it Europe Southern Europe
+university of venice 2021-02-03 258599724 relation Venice International University, Viale Vittorio Veneto, Sant'Elena, Venezia-Murano-Burano, Lido, Venezia, Veneto, 30132, Italia amenity university 0.507572334229807 Italia it Europe Southern Europe
+durrell wildlife conservation trust 2021-02-03 129612064 way Jersey Zoo, La Profonde Rue, Trinity, JE3 5BP, Jersey tourism zoo 0.30922699466609 Jersey je Europe Northern Europe
+npg 2021-02-03 177301691 way NPG, Tobago Avenue, New Kingston, Saint Andrew, Surrey County, KINGSTON 5, Jamaica building commercial 0.101 Jamaica jm Americas Caribbean
+maytals 2021-02-03 139033445 way Maytals Crescent, Cooreville Gardens, Saint Andrew, Surrey County, 20, Jamaica highway residential 0.2 Jamaica jm Americas Caribbean
+vanity fair 2021-02-03 76246848 node Vanity Fair, Saint Mary, Middlesex County, Jamaica place hamlet 0.45 Jamaica jm Americas Caribbean
+jamaica 2021-02-03 258485445 relation Jamaica boundary administrative 0.807261561694498 Jamaica jm Americas Caribbean
+international seabed authority 2021-02-03 177833065 way International Seabed Authority HQ, Duke Street, Kingston, Surrey County, KINGSTON CSO, Jamaica building yes 0.301 Jamaica jm Americas Caribbean
+jordan university of science and technology 2021-02-03 148655079 way Jordan University of Science and Technology, Betra St, إربد‎, إربد, الأردن amenity university 0.601 الأردن jo Asia Western Asia
+ama 2021-02-03 16241175 node عمان, 2062, الأردن place city 0.610035786199553 الأردن jo Asia Western Asia
+jordan 2021-02-03 258022296 relation الأردن boundary administrative 0.716221771346838 الأردن jo Asia Western Asia
+four seasons hotel 2021-02-03 138307414 way Four Seasons Hotel, شارع البصرة, ام اذينة الشرقي, عمان, 11195, الأردن tourism hotel 0.750443028528829 الأردن jo Asia Western Asia
+wadi rum 2021-02-03 149386364 way وادي رم, العقبة, الأردن natural desert 0.408010995739962 الأردن jo Asia Western Asia
+xfel 2021-02-03 103594598 way XFEL, 上郡末広線, 光都二ä¸<81>ç›®, éž<8d>å±…, 上郡町, 赤穂郡, 兵庫県, 日本 building yes 0.101 日本 jp Asia Eastern Asia
+goto 2021-02-03 258571934 relation 五島市, 長崎県, 日本 boundary administrative 0.430996300874427 日本 jp Asia Eastern Asia
+obama white house 2021-02-03 258672713 relation å°<8f>浜市, ç¦<8f>井県, 日本 boundary administrative 0.449107677186954 日本 jp Asia Eastern Asia
+tamagawa 2021-02-03 258585111 relation 多摩å·<9d>, 神奈å·<9d>県, 198-0212, 日本 waterway river 0.450854461294197 日本 jp Asia Eastern Asia
+japan aerospace exploration agency 2021-02-03 104684391 way å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本 amenity research_institute 0.534103782224402 日本 jp Asia Eastern Asia
+department of internal medicine 2021-02-03 302545893 way å°<8f>å<9d>‚内科クリニック, 11, å°<8f>立野通り 金沢湯涌ç¦<8f>光線, å®<9d>町, 金沢市, 石å·<9d>県, 920-8638, 日本 amenity doctors 0.001 日本 jp Asia Eastern Asia
+sakurada 2021-02-03 123818427 way 桜田門, å†…å €é€šã‚Š, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本 historic city_gate 0.29350420583069 日本 jp Asia Eastern Asia
+advanced science institute 2021-02-03 180150166 way 産æ¥æŠ€è¡“ç·<8f>å<90>ˆç ”究所;西事æ¥æ‰€, å¦åœ’西大通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0061, 日本 amenity research_institute 0.42962282009393 日本 jp Asia Eastern Asia
+toyota 2021-02-03 258878294 relation 豊田市, 愛知県, 日本 boundary administrative 0.4 日本 jp Asia Eastern Asia
+liberal democratic party 2021-02-03 122578456 way 自由民主会館, 23, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8910, 日本 office political_party 0.001 日本 jp Asia Eastern Asia
+ngo 2021-02-03 104188006 way ä¸éƒ¨å›½éš›ç©ºæ¸¯ã‚»ãƒ³ãƒˆãƒ¬ã‚¢, セントレアライン;ä¸éƒ¨å›½éš›ç©ºæ¸¯é€£çµ¡é<81>“è·¯, 常滑市, 愛知県, 479-0881, 日本 aeroway aerodrome 0.490333550285453 日本 jp Asia Eastern Asia
+jaxa 2021-02-03 104684391 way å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本 amenity research_institute 0.634103782224402 日本 jp Asia Eastern Asia
+democratic party of japan 2021-02-03 122578456 way 自由民主会館, 23, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8910, 日本 office political_party 0.001 日本 jp Asia Eastern Asia
+iie 2021-02-03 258639558 relation 伊江æ<9d>‘, 国é 郡, 沖縄県, 日本 boundary administrative 0.393638696954819 日本 jp Asia Eastern Asia
+yokohama city university 2021-02-03 110892089 way 横浜市立大å¦, æ<9d>±è¥¿è‡ªç”±é€šè·¯ 西å<81>´éšŽæ®µ, 柳町, 金沢区, 横浜市, 神奈å·<9d>県, 231-0017, 日本 amenity university 0.443549060892257 日本 jp Asia Eastern Asia
+hiroshima university 2021-02-03 6038414 node Hiroshima Universityã€€åºƒå³¶å¤§å¦ æ<9d>±åºƒå³¶ã‚ャンパス, 出会ã<81>„ã<81>®é<81>“, 西æ<9d>¡ä¸‹è¦‹, æ<9d>±åºƒå³¶å¸‚, 広島県, 739-0047, 日本 amenity university 0.702899469290669 日本 jp Asia Eastern Asia
+tohoku 2021-02-03 258878374 relation æ<9d>±åŒ—町, 上北郡, é<9d>’森県, 日本 boundary administrative 0.402513658204824 日本 jp Asia Eastern Asia
+nagoya university 2021-02-03 124098830 way å<90><8d>å<8f>¤å±‹å¤§å¦, 四谷通 (山手グリーンãƒãƒ¼ãƒ‰ï¼‰, 四谷通, å<8d>ƒç¨®åŒº, å<90><8d>å<8f>¤å±‹å¸‚, 愛知県, 464-8601, 日本 amenity university 0.519298300330669 日本 jp Asia Eastern Asia
+japan aerospace and exploration agency 2021-02-03 104684391 way å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本 amenity research_institute 0.534103782224402 日本 jp Asia Eastern Asia
+yuan 2021-02-03 297445876 node 原, 原å<81>œè»Šå ´ç·š, 沼津市, é<9d>™å²¡çœŒ, 410-0312, 日本 railway station 0.364463378933884 日本 jp Asia Eastern Asia
+mathematical society 2021-02-03 64702547 node 日本数å¦ä¼š, 8, 蔵å‰<8d>橋通り, å<8f>°æ<9d>±äºŒä¸<81>ç›®, å<8f>°æ<9d>±åŒº, æ<9d>±äº¬éƒ½, 110-0006, 日本 office association 0.001 日本 jp Asia Eastern Asia
+idex 2021-02-03 158633198 way Cosmo, 二ä¸é€šã‚Š, 高麗町, 鹿å…<90>島市, 鹿å…<90>島県, 892-8677, 日本 amenity fuel 0.001 日本 jp Asia Eastern Asia
+kyoto university hospital 2021-02-03 1318672 node 京都大å¦, æ<9d>±å¤§è·¯é€š;京都市é<81>“181å<8f>·äº¬éƒ½ç’°çŠ¶ç·š, è<81>–è·é™¢å±±çŽ‹ç”º, 左京区, 京都市, 京都府, 606-8391, 日本 amenity university 0.57959701929309 日本 jp Asia Eastern Asia
+japan meteorological agency 2021-02-03 258888416 relation 気象åº<81>, å†…å €é€šã‚Š, 大手町1, 大手町, 神田, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0004, 日本 building public 0.528920419784088 日本 jp Asia Eastern Asia
+riken brain science institute 2021-02-03 151778643 way 脳科å¦ç·<8f>å<90>ˆç ”究センター æ<9d>±æ£Ÿ, 新座ãƒ<90>イパス, 和光市, 埼玉県, 351-0106, 日本 building yes 0.001 日本 jp Asia Eastern Asia
+national graduate institute for policy studies 2021-02-03 114338072 way 政ç–ç ”ç©¶å¤§å¦é™¢å¤§å¦, å…本木トンãƒ<8d>ル, å…本木七ä¸<81>ç›®, å…本木, 麻布, 港区, æ<9d>±äº¬éƒ½, 106-0033, 日本 amenity university 0.400318800773851 日本 jp Asia Eastern Asia
+akatsuki 2021-02-03 46404960 node æš<81>, 甲賀市, 滋賀県, 528-0012, 日本 place neighbourhood 0.25 日本 jp Asia Eastern Asia
+tokushima university 2021-02-03 37840846 node 大å¦å‰<8d>, å<90>‰é‡Žå·<9d>ãƒ<90>イパス, 徳島市, 徳島県, 770-8571, 日本 highway bus_stop 0.001 日本 jp Asia Eastern Asia
+isi 2021-02-03 259196818 relation 伊勢国, 三é‡<8d>県, 日本 boundary historic 0.525743277351004 日本 jp Asia Eastern Asia
+national institute for fusion science 2021-02-03 40010535 node National Institute for Fusion Science, 肥田下石線, 土å²<90>市, å²<90>阜県, 507-0021, 日本 amenity research_centre 0.501 日本 jp Asia Eastern Asia
+ito 2021-02-03 258663212 relation 伊æ<9d>±å¸‚, é<9d>™å²¡çœŒ, 日本 boundary administrative 0.460897541165665 日本 jp Asia Eastern Asia
+npc 2021-02-03 216467228 way NPC, æ<9d>±æ<9d>¾å±±å<81>œè»Šå ´ç·š, ç®å¼“町1, æ<9d>±æ<9d>¾å±±å¸‚, 埼玉県, 355-0014, 日本 amenity parking 0.101 日本 jp Asia Eastern Asia
+university of yamanashi 2021-02-03 158492717 way å¸<9d>京科å¦å¤§å¦æ<9d>±äº¬è¥¿ã‚ャンパス, ä¸å¤®è‡ªå‹•è»Šé<81>“, 上野原市, 山梨県, 日本 amenity university 0.428807256594898 日本 jp Asia Eastern Asia
+japan atomic energy agency 2021-02-03 220860551 way Japan Atomic Energy Agency, 765-1, ã<81>¯ã<81>ªã<81>¿ã<81>šã<81><8d>通り, æ<9d>±æµ·æ<9d>‘, é‚£ç<8f>‚郡, 茨城県, 319-1184, 日本 building yes 0.401 日本 jp Asia Eastern Asia
+meteorological agency 2021-02-03 258888416 relation 気象åº<81>, å†…å €é€šã‚Š, 大手町1, 大手町, 神田, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0004, 日本 building public 0.528920419784088 日本 jp Asia Eastern Asia
+meijo university 2021-02-03 128174721 way å<90><8d>城大å¦, 飯田街é<81>“, 天白区, å<90><8d>å<8f>¤å±‹å¸‚, 愛知県, 468-8503, 日本 amenity university 0.445726149027095 日本 jp Asia Eastern Asia
+japan patent office 2021-02-03 15012020 node 特許åº<81>, 3, å¤–å €é€šã‚Š, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8915, 日本 office government 0.412830331815194 日本 jp Asia Eastern Asia
+kyoto university 2021-02-03 1318672 node 京都大å¦, æ<9d>±å¤§è·¯é€š;京都市é<81>“181å<8f>·äº¬éƒ½ç’°çŠ¶ç·š, è<81>–è·é™¢å±±çŽ‹ç”º, 左京区, 京都市, 京都府, 606-8391, 日本 amenity university 0.57959701929309 日本 jp Asia Eastern Asia
+university of the ryukyus 2021-02-03 107343763 way ç<90>‰ç<90>ƒå¤§å¦, 宜野湾西原線, 内間, 西原町, ä¸é 郡, 沖縄県, 903-0121, 日本 amenity university 0.468090947740774 日本 jp Asia Eastern Asia
+tokai university in hiratsuka 2021-02-03 104165416 way æ<9d>±æµ·å¤§å¦ 湘å<8d>—ã‚ャンパス, 1, 北門通り, 平塚市, 神奈å·<9d>県, 259-1292, 日本 amenity university 0.001 日本 jp Asia Eastern Asia
+monju 2021-02-03 164574010 way ã‚‚ã‚“ã<81>˜ã‚…, 宮津養父線, å—æ<9d>‰æœ«, 宮津市, 京都府, 626-0001, 日本 building transportation 0.322405775434826 日本 jp Asia Eastern Asia
+trade and innovation 2021-02-03 65049975 node Trade Next Standard Innovation, 黒田庄多井田線, æ<9d>¿æ³¢ç”º, 西脇市, 兵庫県, 日本 shop car 0.301 日本 jp Asia Eastern Asia
+national institute for materials science in tsukuba 2021-02-03 118354285 way 物質・æ<9d><90>æ–™ç ”ç©¶æ©Ÿæ§‹, 1, ã<81>¤ã<81><8f>ã<81>°å…¬åœ’通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0047, 日本 office research 0.367391061753173 日本 jp Asia Eastern Asia
+fisheries agency 2021-02-03 14700372 node 水産åº<81>, 霞ケ関, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本 building public 0.001 日本 jp Asia Eastern Asia
+chuo university 2021-02-03 218424118 way ä¸å¤®å¤§å¦, 多摩モノレール通り, 八王å<90>市, æ<9d>±äº¬éƒ½, 191-8506, 日本 amenity university 0.540197762731253 日本 jp Asia Eastern Asia
+doi 2021-02-03 48804686 node 土居, 平野守å<8f>£ç·š, 大æž<9d>西町, é¦¬å ´ç”ºä¸‰ä¸<81>ç›®, 守å<8f>£å¸‚, 大阪府, 570-0038, 日本 railway station 0.338296402069185 日本 jp Asia Eastern Asia
+ministry of foreign affairs 2021-02-03 14859293 node 外務çœ<81>, 霞ヶ関å<9d>‚, 霞ヶ関2, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本 building public 0.545769418466942 日本 jp Asia Eastern Asia
+sapporo medical university 2021-02-03 129721276 way æœå¹ŒåŒ»ç§‘大å¦, ç¦<8f>ä½<8f>桑園通, å<8d>—1æ<9d>¡è¥¿9, ä¸å¤®åŒº, æœå¹Œå¸‚, 石狩振興局, 北海é<81>“, 060-8556, 日本 amenity university 0.406681943714513 日本 jp Asia Eastern Asia
+university of tokyo 2021-02-03 95061621 way æ<9d>±äº¬å¤§å¦ æŸ<8f>ã‚ャンパス, å¦èž<8d>å<90>ˆã<81>®é<81>“, æŸ<8f>市, å<8d>ƒè‘‰çœŒ, 277-8583, 日本 amenity university 0.001 日本 jp Asia Eastern Asia
+azabu university 2021-02-03 129610650 way 麻布大å¦, 矢部ã<81>µã‚Œã<81>‚ã<81>„地下é<81>“, ä¸å¤®åŒº, 相模原市, 神奈å·<9d>県, 229-0032, 日本 amenity university 0.415142283922981 日本 jp Asia Eastern Asia
+sdo 2021-02-03 108898337 way ä½<90>渡空港, 両津広域農é<81>“, 秋津, ä½<90>渡市, 新潟県, 952-0006, 日本 aeroway aerodrome 0.40710035943812 日本 jp Asia Eastern Asia
+institute of space and astronautical science 2021-02-03 115578298 way 宇宙科å¦ç ”究所 (Institute of Space and Astronautical Science), 銀河北通り, ä¸å¤®åŒº, 相模原市, 神奈å·<9d>県, 252-0234, 日本 office research 0.601 日本 jp Asia Eastern Asia
+shen neng 2021-02-03 83114350 node 神能,輪æ¥, 日高å·<9d>島線, å<9d>‚戸市, 埼玉県, 350-2222, 日本 shop bicycle 0.001 日本 jp Asia Eastern Asia
+japanese communist party 2021-02-03 26533301 node 日本共産党ä¸å¤®å§”員会, 7, 明治通り, å<8d>ƒé§„ヶ谷四ä¸<81>ç›®, 渋谷区, æ<9d>±äº¬éƒ½, 151-8586, 日本 office political_party 0.001 日本 jp Asia Eastern Asia
+nagasaki university 2021-02-03 110381378 way 長崎大å¦, 県é<81>“113å<8f>·ç·š, 長崎市, 長崎県, 850-8685, 日本 amenity university 0.466329902238883 日本 jp Asia Eastern Asia
+saitama university 2021-02-03 139990167 way 埼玉大å¦, ã<81>•ã<81>„ã<81>Ÿã<81>¾é´»å·£ç·š, 桜区, ã<81>•ã<81>„ã<81>Ÿã<81>¾å¸‚, 埼玉県, 338-0835, 日本 amenity university 0.001 日本 jp Asia Eastern Asia
+policy exchange 2021-02-03 75361678 node POLICY, 柴å<8f>ˆè¡—é<81>“, 江戸å·<9d>区, æ<9d>±äº¬éƒ½, 133-0051, 日本 office company 0.101 日本 jp Asia Eastern Asia
+national science and technology library 2021-02-03 130023176 way ç<90>†ç³»å›³æ›¸é¤¨, ä¹<9d>大ゲートブリッジ, 西区, ç¦<8f>岡市, ç¦<8f>岡県, 819−0395, 日本 amenity library 0.001 日本 jp Asia Eastern Asia
+tokyo institute of technology 2021-02-03 258519927 relation æ<9d>±äº¬å·¥æ¥å¤§å¦ 大岡山ã‚ャンパス, 轟橋, 目黒区, æ<9d>±äº¬éƒ½, 158, 日本 amenity university 0.508521601885091 日本 jp Asia Eastern Asia
+chiba institute of technology 2021-02-03 104275451 way å<8d>ƒè‘‰å·¥æ¥å¤§å¦, ã<81>¾ã‚<8d>ã<81>«ã<81>ˆé€šã‚Š, 津田沼2, 習志野市, å<8d>ƒè‘‰çœŒ, 274-0825, 日本 amenity university 0.442477975994532 日本 jp Asia Eastern Asia
+oita university 2021-02-03 120859745 way 大分大å¦æ—¦é‡ŽåŽŸã‚ャンパス, 国é<81>“10å<8f>·, 大分市, 大分県, 870-0854, 日本 amenity university 0.001 日本 jp Asia Eastern Asia
+carbon institute 2021-02-03 144485403 way カーボンニュートラル・エãƒ<8d>ãƒ«ã‚®ãƒ¼å›½éš›ç ”ç©¶æ‰€ 第1ç ”ç©¶æ£Ÿ, 桜井太郎丸線, 西区, ç¦<8f>岡市, ç¦<8f>岡県, 819-0382, 日本 building university 0.001 日本 jp Asia Eastern Asia
+astronautical science 2021-02-03 115578298 way 宇宙科å¦ç ”究所 (Institute of Space and Astronautical Science), 銀河北通り, ä¸å¤®åŒº, 相模原市, 神奈å·<9d>県, 252-0234, 日本 office research 0.201 日本 jp Asia Eastern Asia
+council for science and technology 2021-02-03 14641777 node ç·<8f>å<90>ˆç§‘å¦æŠ€è¡“会è°, å…本木通り, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本 building public 0.001 日本 jp Asia Eastern Asia
+kurume university 2021-02-03 173775202 way 久留米大å¦ï¼ˆåŒ»å¦éƒ¨ï¼‰, 県é<81>“17å<8f>·åŒ»å¤§é€šã‚Š, 城å<8d>—町, 久留米市, ç¦<8f>岡県, 830-0011, 日本 amenity university 0.446874063573656 日本 jp Asia Eastern Asia
+national council for science and technology 2021-02-03 14641777 node ç·<8f>å<90>ˆç§‘å¦æŠ€è¡“会è°, å…本木通り, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本 building public 0.001 日本 jp Asia Eastern Asia
+hirosaki university 2021-02-03 173133861 way 弘å‰<8d>大å¦, 石å·<9d>土手町線, 富田3, 富野町, 弘å‰<8d>市, é<9d>’森県, 036-8186, 日本 amenity university 0.444601849346538 日本 jp Asia Eastern Asia
+ministry of justice 2021-02-03 60332920 node 法務çœ<81>, 桜田通り, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本 office government 0.492769930727232 日本 jp Asia Eastern Asia
+house of representatives 2021-02-03 60617052 node 衆è°é™¢, 1, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0014, 日本 office government 0.570873380707553 日本 jp Asia Eastern Asia
+aga 2021-02-03 258597957 relation 阿賀町, æ<9d>±è’²åŽŸéƒ¡, 新潟県, 日本 boundary administrative 0.438650451987068 日本 jp Asia Eastern Asia
+nect 2021-02-03 79692993 node salon Lie-nect, 上尾白岡線, 伊奈町, 北足立郡, 埼玉県, 362-0806, 日本 shop hairdresser 0.101 日本 jp Asia Eastern Asia
+nature astronomy 2021-02-03 183168113 way ã<81>¡ã<81>¯ã‚„星ã<81>¨è‡ªç„¶ã<81>®ãƒŸãƒ¥ãƒ¼ã‚¸ã‚¢ãƒ , 金剛山é<81>Šæ©é<81>“, å<8d>ƒæ—©èµ¤é˜ªæ<9d>‘, å<8d>—河内郡, 大阪府, 5850051, 日本 tourism museum 0.001 日本 jp Asia Eastern Asia
+xiap 2021-02-03 132243075 way 地下P入路, ç ‚å±±ç”º, ä¸åŒº, 浜æ<9d>¾å¸‚, é<9d>™å²¡çœŒ, 430-0926, 日本 highway service 0.075 日本 jp Asia Eastern Asia
+hitachi 2021-02-03 258516604 relation 日立市, 茨城県, 日本 boundary administrative 0.474027116064219 日本 jp Asia Eastern Asia
+national institute for environmental studies 2021-02-03 118729145 way å›½ç«‹ç’°å¢ƒç ”ç©¶æ‰€, å¦åœ’西大通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0053, 日本 amenity research_institute 0.385200970199076 日本 jp Asia Eastern Asia
+food safety 2021-02-03 13545663 node 夢庵, 3, 新横浜元石å·<9d>ç·š, è<8d><8f>田西二ä¸<81>ç›®, é<9d>’葉区, 横浜市, 神奈å·<9d>県, 231-0017, 日本 amenity restaurant 0.001 日本 jp Asia Eastern Asia
+oist 2021-02-03 169799491 way 沖縄科å¦æŠ€è¡“大å¦é™¢å¤§å¦, 国é<81>“58å<8f>·, 谷茶, æ<81>©ç´<8d>æ<9d>‘, 国é 郡, 沖縄県, 904-0495, 日本 amenity college 0.422968236493861 日本 jp Asia Eastern Asia
+chiba university 2021-02-03 133433420 way å<8d>ƒè‘‰å¤§å¦, 文教通り, æ<9d>¾æ³¢2, 緑町1, 稲毛区, å<8d>ƒè‘‰å¸‚, å<8d>ƒè‘‰çœŒ, 2600033, 日本 amenity university 0.495611571950763 日本 jp Asia Eastern Asia
+wakayama university 2021-02-03 127282447 way å’ŒæŒå±±å¤§å¦, 1ã‚ãƒå<9d>‚, æ „è°·, å’ŒæŒå±±å¸‚, å’ŒæŒå±±çœŒ, 640-8511, 日本 amenity university 0.001 日本 jp Asia Eastern Asia
+waseda university 2021-02-03 194562447 way æ—©ç¨²ç”°å¤§å¦ åŒ—ä¹<9d>å·žã‚ャンパス, 2-2, 有毛引野線, è‹¥æ<9d>¾åŒº, 北ä¹<9d>州市, ç¦<8f>岡県, 808-0135, 日本 amenity university 0.001 日本 jp Asia Eastern Asia
+komatsu 2021-02-03 258757265 relation å°<8f>æ<9d>¾å¸‚, 石å·<9d>県, 日本 boundary administrative 0.462070869758741 日本 jp Asia Eastern Asia
+fukushima daiichi 2021-02-03 114047090 way ç¦<8f>島第一 原å<90>力発電所, 大熊町, å<8f>Œè‘‰éƒ¡, ç¦<8f>島県, 日本 landuse industrial 0.479852659697918 日本 jp Asia Eastern Asia
+science council of japan 2021-02-03 125087351 way 日本å¦è¡“会è°, 319, å…本木七ä¸<81>ç›®, å…本木, 麻布, 港区, æ<9d>±äº¬éƒ½, 106-0033, 日本 building yes 0.44541340693117 日本 jp Asia Eastern Asia
+itochu 2021-02-03 164136286 way ITOCHU, ã<81>¾ã‚<81>ã<81> 大通り;金沢田鶴浜線, 広岡1, 広岡, 金沢市, 石å·<9d>県, 920-0031, 日本 building yes 0.101 日本 jp Asia Eastern Asia
+okinawa institute of science and technology 2021-02-03 169799491 way 沖縄科å¦æŠ€è¡“大å¦é™¢å¤§å¦, 国é<81>“58å<8f>·, 谷茶, æ<81>©ç´<8d>æ<9d>‘, 国é 郡, 沖縄県, 904-0495, 日本 amenity college 0.422968236493861 日本 jp Asia Eastern Asia
+nuclear regulation authority 2021-02-03 51874808 node 原å<90>力è¦<8f>制委員会, 9, 御組å<9d>‚, å…本木一ä¸<81>ç›®, å…本木, 麻布, 港区, æ<9d>±äº¬éƒ½, 106-8487, 日本 office government 0.001 日本 jp Asia Eastern Asia
+shinshu university 2021-02-03 58242149 node Shinshu University, 国é<81>“292å<8f>·, å¹³ç©<8f>, 山ノ内町, 下高井郡, 長野県, 381-0401, 日本 highway bus_stop 0.201 日本 jp Asia Eastern Asia
+times 2021-02-03 135747411 way タイムズ, 御æˆ<90>町, å°<8f>町1, 鎌倉市, 神奈å·<9d>県, 日本 landuse construction 0.343190432299382 日本 jp Asia Eastern Asia
+osaka city university 2021-02-03 22182825 node 市立大å¦å‰<8d>, Mediacenter, ä½<8f>å<90>‰åŒº, 大阪市, 大阪府, 558-0022, 日本 highway bus_stop 0.001 日本 jp Asia Eastern Asia
+center for materials science 2021-02-03 140270004 way ナノマテリアルテクノãƒã‚¸ãƒ¼ã‚»ãƒ³ã‚¿ãƒ¼ (Center for Nano Materials and Technology), 石å·<9d>県é<81>“55å<8f>·å°<8f>æ<9d>¾è¾°å<8f>£ç·š, æ—å<8f>°, 能美市, 石å·<9d>県, 923-1206, 日本 building university 0.301 日本 jp Asia Eastern Asia
+national aerospace laboratory 2021-02-03 788177 node èˆªç©ºå®‡å®™æŠ€è¡“ç ”ç©¶æ‰€, 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 181-8555, 日本 highway traffic_signals 0.001 日本 jp Asia Eastern Asia
+university of tsukuba 2021-02-03 134217312 way ç‘波大å¦, ã<81>™ã<81>šã<81>‹ã<81>‘通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 303-0006, 日本 amenity university 0.540351531466865 日本 jp Asia Eastern Asia
+atomic energy agency 2021-02-03 220860551 way Japan Atomic Energy Agency, 765-1, ã<81>¯ã<81>ªã<81>¿ã<81>šã<81><8d>通り, æ<9d>±æµ·æ<9d>‘, é‚£ç<8f>‚郡, 茨城県, 319-1184, 日本 building yes 0.301 日本 jp Asia Eastern Asia
+merck & company 2021-02-03 218371594 way Merck, ã<81>„ã‚<8f>ã<81><8d>市, ç¦<8f>島県, 日本 landuse industrial 0.3 日本 jp Asia Eastern Asia
+tokyo university of agriculture 2021-02-03 104451530 way æ<9d>±äº¬è¾²æ¥å¤§å¦, å<8d>ƒæ³é€šã‚Š, çµŒå ‚4, 船橋, 世田谷区, æ<9d>±äº¬éƒ½, 156-0054, 日本 amenity university 0.476564468003337 日本 jp Asia Eastern Asia
+nuclear safety commission 2021-02-03 14941318 node 原å<90>力安全委員会, 三年å<9d>‚, 霞ヶ関3, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本 building public 0.001 日本 jp Asia Eastern Asia
+the times 2021-02-03 135747411 way タイムズ, 御æˆ<90>町, å°<8f>町1, 鎌倉市, 神奈å·<9d>県, 日本 landuse construction 0.343190432299382 日本 jp Asia Eastern Asia
+university of hokkaido 2021-02-03 128417717 way 北海é<81>“大å¦, 環状通, 北14æ<9d>¡æ<9d>±7, æ<9d>±åŒº, æœå¹Œå¸‚, 石狩振興局, 北海é<81>“, 060-0808, 日本 amenity university 0.525438377157725 日本 jp Asia Eastern Asia
+red cross hospital 2021-02-03 45442138 node 赤å<8d><81>å—病院å‰<8d>, æ<9d>¾å±±å¸‚é<81>“ 鮒屋町è·å›½ç¥žç¤¾å‰<8d>ç·š, 平和通一ä¸<81>ç›®, 西一万町, æ<9d>¾å±±å¸‚, 愛媛県, 790-0825, 日本 railway tram_stop 0.267719150556049 日本 jp Asia Eastern Asia
+kyushu university 2021-02-03 147876936 way ä¹<9d>州看è·ç¦<8f>祉大å¦ï¼ˆçœ‹è·ç¦<8f>祉å¦éƒ¨ï¼‰, 玉å<90><8d>ãƒ<90>イパス, 玉å<90><8d>市, 熊本県, 865-0005, 日本 amenity university 0.417582068811379 日本 jp Asia Eastern Asia
+tokyo electric power company 2021-02-03 121819030 way æ<9d>±äº¬é›»åŠ›æ¸‹è°·æ”¯ç¤¾, ファイアー通り, 神å<8d>—一ä¸<81>ç›®, 渋谷区, æ<9d>±äº¬éƒ½, 150-8334, 日本 building yes 0.001 日本 jp Asia Eastern Asia
+liberal party 2021-02-03 122578456 way 自由民主会館, 23, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-8910, 日本 office political_party 0.001 日本 jp Asia Eastern Asia
+kitasato university 2021-02-03 77251155 node åŒ—é‡Œå¤§å¦ ç<8d>£åŒ»å¦éƒ¨, 大å¦é€šã‚Š, 稲生町, å<8d><81>和田市, é<9d>’森県, 034-0031, 日本 amenity college 0.001 日本 jp Asia Eastern Asia
+mext 2021-02-03 50358605 node 文部科å¦çœ<81>, 桜田通り, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本 office government 0.541445598310702 日本 jp Asia Eastern Asia
+keio 2021-02-03 226108428 way Keio Line, 国際通り, 西新宿一ä¸<81>ç›®, 新宿区, æ<9d>±äº¬éƒ½, 160-0023, 日本 shop mall 0.101 日本 jp Asia Eastern Asia
+department of physiology 2021-02-03 50185221 node Department of Physiology, Wakayama Medical University School of Medicine, ä¸å¤®é€šã‚Š, å’ŒæŒå±±å¸‚, å’ŒæŒå±±çœŒ, 640-8511, 日本 amenity school 0.301 日本 jp Asia Eastern Asia
+merck 2021-02-03 218371594 way Merck, ã<81>„ã‚<8f>ã<81><8d>市, ç¦<8f>島県, 日本 landuse industrial 0.3 日本 jp Asia Eastern Asia
+kawasaki 2021-02-03 258763819 relation å·<9d>崎市, 神奈å·<9d>県, 日本 boundary administrative 0.579153673816489 日本 jp Asia Eastern Asia
+laboratory of radioisotope complex 2021-02-03 111776378 way R.I ç·<8f>å<90>ˆ 実験室, ã‚„ã<81>™ã‚‰ã<81>Žã<81>®é<81>“, 北å°<8f>路町, 内ä¾<8d>原町, 奈良市, 奈良県, 6308271, 日本 building university 0.001 日本 jp Asia Eastern Asia
+national institute for materials science 2021-02-03 118354285 way 物質・æ<9d><90>æ–™ç ”ç©¶æ©Ÿæ§‹, 1, ã<81>¤ã<81><8f>ã<81>°å…¬åœ’通り, ã<81>¤ã<81><8f>ã<81>°å¸‚, 茨城県, 305-0047, 日本 office research 0.367391061753173 日本 jp Asia Eastern Asia
+keio university 2021-02-03 117198676 way 慶應義塾日å<90>‰ã‚ャンパス, 綱島街é<81>“, 港北区, 横浜市, 神奈å·<9d>県, 231-0017, 日本 amenity university 0.579652848044229 日本 jp Asia Eastern Asia
+university of kyoto 2021-02-03 128750307 way äº¬éƒ½å¤§å¦ åŒ—éƒ¨æ§‹å†…, 志賀越é<81>“, 北白å·<9d>ä¹…ä¿<9d>田町, 左京区, 京都市, 京都府, 606-8276, 日本 amenity university 0.57959701929309 日本 jp Asia Eastern Asia
+bandai 2021-02-03 258916292 relation ç£<90>梯町, 耶麻郡, ç¦<8f>島県, 969-3301, 日本 boundary administrative 0.408093117536752 日本 jp Asia Eastern Asia
+ministry of the environment 2021-02-03 123742322 way 環境çœ<81>, ç¥<9d>田通り, 霞ヶ関1, 霞ヶ関, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0013, 日本 amenity public_building 0.508986391392961 日本 jp Asia Eastern Asia
+university museum of the university of tokyo 2021-02-03 122005976 way æ<9d>±äº¬å¤§å¦ç·<8f>å<90>ˆç ”究å<8d>šç‰©é¤¨, æ£èµ¤é€šã‚Š, 本郷五ä¸<81>ç›®, 文京区, æ<9d>±äº¬éƒ½, 113-0033, 日本 tourism museum 0.323710213530857 日本 jp Asia Eastern Asia
+national cerebral and cardiovascular center 2021-02-03 196010585 way å›½ç«‹å¾ªç’°å™¨ç—…ç ”ç©¶ã‚»ãƒ³ã‚¿ãƒ¼, 1, 豊ä¸å²¸éƒ¨ç·š, 岸部新町, å<90>¹ç”°å¸‚, 大阪府, 564-8565, 日本 amenity hospital 0.001 日本 jp Asia Eastern Asia
+jamstec 2021-02-03 15031015 node æµ·æ´‹ç ”ç©¶é–‹ç™ºæ©Ÿæ§‹, テストコース(GRANDRIVE), æ¨ªé ˆè³€å¸‚, 神奈å·<9d>県, 238-8550, 日本 amenity public_building 0.001 日本 jp Asia Eastern Asia
+denka 2021-02-03 216092175 way Denka, 糸éšå·<9d>市, 新潟県, 日本 landuse industrial 0.3 日本 jp Asia Eastern Asia
+hokkaido university 2021-02-03 128417717 way 北海é<81>“大å¦, 環状通, 北14æ<9d>¡æ<9d>±7, æ<9d>±åŒº, æœå¹Œå¸‚, 石狩振興局, 北海é<81>“, 060-0808, 日本 amenity university 0.525438377157725 日本 jp Asia Eastern Asia
+toyohashi university of technology 2021-02-03 108255102 way 豊橋技術科å¦å¤§å¦, å°<8f>æ<9d>¾åŽŸå°<8f>æ± ç·š, 天伯町, 豊橋市, 愛知県, 441-8115, 日本 amenity university 0.411679724670082 日本 jp Asia Eastern Asia
+aerospace exploration agency 2021-02-03 104684391 way å®‡å®™èˆªç©ºç ”ç©¶é–‹ç™ºæ©Ÿæ§‹ (JAXA), 三鷹通り æ¦è”µé‡Žèª¿å¸ƒç·š, 調布市, æ<9d>±äº¬éƒ½, 182-0012, 日本 amenity research_institute 0.534103782224402 日本 jp Asia Eastern Asia
+us house of representatives 2021-02-03 60617052 node 衆è°é™¢, 1, 国é<81>“246å<8f>·, 永田町1, 永田町, å<8d>ƒä»£ç”°åŒº, æ<9d>±äº¬éƒ½, 100-0014, 日本 office government 0.570873380707553 日本 jp Asia Eastern Asia
+tokyo metropolitan assembly 2021-02-03 940456 node è°äº‹å ‚å<8d>—, å<8d>—通り, 西新宿二ä¸<81>ç›®, 新宿区, æ<9d>±äº¬éƒ½, 163-8001, 日本 highway traffic_signals 0.001 日本 jp Asia Eastern Asia
+riken brain institute 2021-02-03 151778643 way 脳科å¦ç·<8f>å<90>ˆç ”究センター æ<9d>±æ£Ÿ, 新座ãƒ<90>イパス, 和光市, 埼玉県, 351-0106, 日本 building yes 0.001 日本 jp Asia Eastern Asia
+japan proton accelerator research complex 2021-02-03 42542030 node JPARC, 国é<81>“245å<8f>·, æ<9d>±æµ·æ<9d>‘, é‚£ç<8f>‚郡, 茨城県, 〒319-1112, 日本 landuse industrial 0.001 日本 jp Asia Eastern Asia
+cooperative research center 2021-02-03 207174922 way 百周年記念館(産å¦é€£æ<90>ºæŽ¨é€²æ©Ÿæ§‹ï¼‰, 秋田八郎潟線, 手形山崎町, 秋田市, 秋田県, 010-0864, 日本 building university 0.001 日本 jp Asia Eastern Asia
+japan 2021-02-03 258446007 relation 日本 boundary administrative 0.871013326546246 日本 jp Asia Eastern Asia
+juntendo university 2021-02-03 126277004 way é †å¤©å ‚å¤§å¦ï¼ˆåŒ»å¦éƒ¨ï¼‰, æ²¹å<9d>‚, 本郷二ä¸<81>ç›®, 文京区, æ<9d>±äº¬éƒ½, 113-8431, 日本 amenity university 0.001 日本 jp Asia Eastern Asia
+nara 2021-02-03 258244510 relation 奈良県, 日本 boundary administrative 0.611235608420169 日本 jp Asia Eastern Asia
+tohoku university 2021-02-03 49999020 node Tohoku University, 1, é<8d>›å†¶å±‹å‰<8d>ä¸<81>, ä¸å¤®å››ä¸<81>ç›®, é<9d>’葉区, ä»™å<8f>°å¸‚, 宮城県, 980-8577, 日本 amenity school 0.201 日本 jp Asia Eastern Asia
+nihon 2021-02-03 258446007 relation 日本 boundary administrative 0.871013326546246 日本 jp Asia Eastern Asia
+tokyo university of agriculture and technology 2021-02-03 129699576 way æ<9d>±äº¬è¾²å·¥å¤§å¦, 下山谷通り, ä¸ç”º, å°<8f>金井市, æ<9d>±äº¬éƒ½, 184-0012, 日本 amenity university 0.001 日本 jp Asia Eastern Asia
+kenya medical research institute 2021-02-03 202184361 way Kenya Medical Research Institute, Kisumu-Busia Road, Kisumu, Nyanza, 40100, Kenya office research 0.401 Kenya ke Africa Eastern Africa
+glaxosmithkline 2021-02-03 256812958 way Glaxo Smithkline, Mbotela, Central Business District, Nairobi, Kenya landuse industrial 0.4 Kenya ke Africa Eastern Africa
+kenya wildlife service 2021-02-03 168205921 way Kenya Wildlife Service, Kisumu, Nyanza, Kenya landuse commercial 0.5 Kenya ke Africa Eastern Africa
+jomo kenyatta university of agriculture and technology 2021-02-03 168715829 way Jomo Kenyatta University of Agriculture and Technology, Lavington, Nairobi, Kenya landuse residential 0.9 Kenya ke Africa Eastern Africa
+kenya 2021-02-03 258031172 relation Kenya boundary administrative 0.826488598383626 Kenya ke Africa Eastern Africa
+international centre of insect physiology and ecology 2021-02-03 193624949 way International Centre of Insect Physiology and Ecology (ICIPE) Field Station, Ukunda-Ramisi Road, Kona Ya Chale, Kwale, Coastal Kenya, 80400, Kenya building industrial 0.701 Kenya ke Africa Eastern Africa
+international livestock research institute 2021-02-03 154926034 way International Livestock Research Institute, C61, Nairobi, P.O. BOX 30709, Kenya office educational_institution 0.401 Kenya ke Africa Eastern Africa
+world agroforestry centre 2021-02-03 259495866 relation World Agroforestry Center, ICRAF Road, Gigiri, Nairobi, 00800, Kenya building yes 0.512795139465266 Kenya ke Africa Eastern Africa
+university of nairobi 2021-02-03 66537019 node University of Nairobi(Kabete Campus), Kapenguria Road, Nairobi, P.O. BOX 30709, Kenya amenity university 0.301 Kenya ke Africa Eastern Africa
+us court of appeals 2021-02-03 116083341 way Court of Appeals, Fort Jesus Road, Mombasa, Coastal Kenya, 80100, Kenya amenity courthouse 0.401 Kenya ke Africa Eastern Africa
+sino-africa joint research centre 2021-02-03 177716862 way Sino-Africa Joint Research Centre, Juja, Kiambu, Central Kenya, Kenya landuse construction 0.7 Kenya ke Africa Eastern Africa
+facebook 2021-02-03 258236555 way Facebook, Kawangware, Nairobi, Kenya landuse recreation_ground 0.3 Kenya ke Africa Eastern Africa
+pomc 2021-02-03 144576177 way POMC Compassion International, Kajiado, Kenya landuse commercial 0.3 Kenya ke Africa Eastern Africa
+verity 2021-02-03 163539434 way Verity, Nyeri, Central Kenya, 10100, Kenya highway residential 0.2 Kenya ke Africa Eastern Africa
+angelina jolie 2021-02-03 185368038 way Angelina Jolie Primary School, E1351, Turkana, Kenya amenity school 0.201 Kenya ke Africa Eastern Africa
+mount kenya safari club 2021-02-03 15683008 node Mount Kenya Safari Club, D488, Nyeri, Central Kenya, 10400, Kenya tourism hotel 0.401 Kenya ke Africa Eastern Africa
+kyrgyzstan 2021-02-03 257857355 relation КыргызÑ<81>тан boundary administrative 0.699471525334594 КыргызÑ<81>тан kg Asia Central Asia
+public prosecutor's office 2021-02-03 104759616 way Прокуратура, Бишкек, КыргызÑ<81>тан landuse construction 0.2 КыргызÑ<81>тан kg Asia Central Asia
+marine le pen 2021-02-03 16734904 node Marine, ផ្លូវ ១០៤, សង្កាáž<8f>់វáž<8f>្áž<8f>ភ្នំ, áž<81>ណ្ឌដូនពáŸ<81>ញ, រាជធានីភ្នំពáŸ<81>ញ, 120211, ព្រះរាជាណាចក្រ​កម្ពុជា amenity bar 0.101 ព្រះរាជាណាចក្រ​កម្ពុជា kh Asia South-Eastern Asia
+morakot 2021-02-03 150353783 way កោះពស់, ក្រុងព្រះសីហនុ, áž<81>áŸ<81>áž<8f>្áž<8f>ព្រះសីហនុ, ព្រះរាជាណាចក្រ​កម្ពុជា place island 0.325 ព្រះរាជាណាចក្រ​កម្ពុជា kh Asia South-Eastern Asia
+cdri 2021-02-03 53298902 node CDRI, ផ្លូវ ៣១៥, សង្កាáž<8f>់បឹងកក់ទី ២, áž<81>ណ្ឌទួលគោក, រាជធានីភ្នំពáŸ<81>ញ, 120408, ព្រះរាជាណាចក្រ​កម្ពុជា office educational_institution 0.101 ព្រះរាជាណាចក្រ​កម្ពុជា kh Asia South-Eastern Asia
+cambodia 2021-02-03 257250265 relation ព្រះរាជាណាចក្រ​កម្ពុជា boundary administrative 0.695583245164628 ព្រះរាជាណាចក្រ​កម្ពុជា kh Asia South-Eastern Asia
+kiribati 2021-02-03 258555103 relation Kiribati boundary administrative 0.718215660119049 Kiribati ki Oceania Micronesia
+ki 2021-02-03 258555103 relation Kiribati boundary administrative 0.718215660119049 Kiribati ki Oceania Micronesia
+central pacific 2021-02-03 195202169 way Central Pacific, Main Road, Nawerewere, Tarawa Te Inainano, Kiribati shop seafood 0.201 Kiribati ki Oceania Micronesia
+university of the west indies 2021-02-03 207615978 way University Of The West Indies, Horsfords Road, Irish Town, Port Zante, Basseterre, Saint George Basseterre, Saint Kitts, 07162, Saint Kitts and Nevis amenity university 0.501 Saint Kitts and Nevis kn Americas Caribbean
+kim chaek university of technology 2021-02-03 117123664 way 김책공업종합대학, ì˜<81>광거리, 중구ì—, 외성ë<8f>™, í<8f>‰ì–‘ì‹œ, ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ amenity university 0.340053860433783 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ kp Asia Eastern Asia
+pyongyang university of science and technology 2021-02-03 45781187 node í<8f>‰ì–‘ê³¼í•™ê¸°ìˆ ëŒ€í•™, AH1, ë<9d>½ëž‘구ì—, í<8f>‰ì–‘, í<8f>‰ì–‘ì‹œ, ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ amenity university 0.292441551930616 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ kp Asia Eastern Asia
+kim il-sung university 2021-02-03 258684511 relation ê¹€ì<9d>¼ì„±ì¢…합대학, ë ¤ëª…ê±°ë¦¬, 대성구ì—, í<8f>‰ì–‘, í<8f>‰ì–‘ì‹œ, ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ amenity university 0.42474743961288 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ kp Asia Eastern Asia
+north korea 2021-02-03 257555920 relation ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ boundary administrative 0.712625561293871 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ kp Asia Eastern Asia
+democratic people's republic of korea 2021-02-03 257555920 relation ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ boundary administrative 0.712625561293871 ì¡°ì„ ë¯¼ì£¼ì£¼ì<9d>˜ì<9d>¸ë¯¼ê³µí™”êµ kp Asia Eastern Asia
+chosun ilbo 2021-02-03 145965192 way ì¡°ì„ ì<9d>¼ë³´ë¯¸ìˆ ê´€, 세종대로21길, 소공ë<8f>™, 중구, 서울, 04519, ëŒ€í•œë¯¼êµ tourism gallery 0.441531223132585 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+korea university 2021-02-03 66060178 node ê³ ë ¤ëŒ€, 안암로, 종암ë<8f>™, 성ë¶<81>구, 서울, 02800, ëŒ€í•œë¯¼êµ railway station 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+election commission 2021-02-03 229109140 way 세종특별ìž<90>치시 ì„ ê±°ê´€ë¦¬ìœ„ì›<90>회, 남세종로, 보람ë<8f>™, 세종, 30150, ëŒ€í•œë¯¼êµ office government 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+university of ulsan college of medicine 2021-02-03 200588646 way 울산대학êµ<90> ì<9d>˜ê³¼ëŒ€í•™, 88, 올림픽로43길, Pungnap 2(i)-dong, 송파구, 서울, 05505, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+institute for environment and health 2021-02-03 229907799 way 세종시보건환경연구ì›<90>, 12, ì„œë¶<81>부2ë¡œ, 조치ì›<90>ì„œë¶<81>부지구 (본 지구는 ì˜ˆì •/공사 중ì<9d>´ë¯€ë¡œ 변경ë<90> 수 있ì<9d>Œ), 조치ì›<90>ì<9d><8d>, 세종, 30015, ëŒ€í•œë¯¼êµ office government 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+national institute of ecology 2021-02-03 248455668 way êµë¦½ìƒ<9d>태ì›<90>, 금강로, 송내리, 서천군, 33657, ëŒ€í•œë¯¼êµ leisure garden 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+jeju national university 2021-02-03 11306936 node ì œì£¼êµ<90>대, ì<9d>¼ì£¼ë<8f>™ë¡œ, ê±´ìž…ë<8f>™, ì œì£¼ì‹œ, 63293, ëŒ€í•œë¯¼êµ junction yes 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+ewha womans university 2021-02-03 259075058 relation ì<9d>´í™”ì—¬ìž<90>대학êµ<90>, 52, ì<9d>´í™”여대길, ì‹ ì´Œë<8f>™, 서대문구, 서울, 03760, ëŒ€í•œë¯¼êµ amenity university 0.47254535964387 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+korea institute of nuclear safety 2021-02-03 198459956 way í•œêµì›<90>ìž<90>ë ¥ì•ˆì „ê¸°ìˆ ì›<90>, 온천ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, ëŒ€í•œë¯¼êµ landuse commercial 0.2 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+hanyang university 2021-02-03 66564765 node 한양대, 206, 왕ì‹ë¦¬ë¡œ, 사근ë<8f>™, 성ë<8f>™êµ¬, 서울, 04763, ëŒ€í•œë¯¼êµ railway station 0.370185956704757 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+hanaro 2021-02-03 117966939 way 하나로, 대ë<8f>™ë¦¬, 거창군, ê²½ìƒ<81>남ë<8f>„, ëŒ€í•œë¯¼êµ landuse residential 0.2 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+korea institute of geoscience 2021-02-03 224621385 way Korea Institute of Geoscience and Mineral Resources, 과학로, 온천2ë<8f>™, ì‹ ì„±ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 34141, ëŒ€í•œë¯¼êµ amenity research_institute 0.401 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+gwangju institute of science and technology 2021-02-03 197084062 way ê´‘ì£¼ê³¼í•™ê¸°ìˆ ì›<90>, 123, 첨단과기로, 광산구, 광주, 61005, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+postech 2021-02-03 259443543 relation í<8f>¬í•ê³µê³¼ëŒ€í•™êµ<90>, 77, ì²ì•”ë¡œ, 효곡ë<8f>™, 남구, í<8f>¬í•ì‹œ, ê²½ìƒ<81>ë¶<81>ë<8f>„, 37673, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+seoul national university of science and technology 2021-02-03 178768152 way ì„œìš¸ê³¼í•™ê¸°ìˆ ëŒ€í•™êµ<90>, ë…¸ì›<90>ë¡œ, 공릉2ë<8f>™, 서울, 01816, ëŒ€í•œë¯¼êµ amenity university 0.375700293936422 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+pusan national university in busan 2021-02-03 196919997 way 부산대학êµ<90>, 금강로335번길, ìž¥ì „1ë<8f>™, ìž¥ì „ë<8f>™, ê¸ˆì •êµ¬, 부산, 46282, ëŒ€í•œë¯¼êµ amenity university 0.439740442442793 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+korea advanced institute of science and technology 2021-02-03 107053417 way í•œêµê³¼í•™ê¸°ìˆ ì›<90>, 291, 대학로, 온천2ë<8f>™, 온천ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 34141, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+kookmin university 2021-02-03 129642584 way êµë¯¼ëŒ€í•™êµ<90>, ë³´êµë¬¸ë¡œ29길, ì •ë¦‰3ë<8f>™, 성ë¶<81>구, 서울, 02707, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+ministry of oceans and fisheries 2021-02-03 53551582 node 해양수산부(5ë<8f>™), 94, 다솜2ë¡œ, 어진ë<8f>™, ë<8f>„ë‹´ë<8f>™, 세종, 30110, ëŒ€í•œë¯¼êµ office government 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+sungkyunkwan 2021-02-03 107069637 way ì„±ê· ê´€ëŒ€í•™êµ<90> ì<9d>¸ë¬¸ì‚¬íšŒê³¼í•™ìº í<8d>¼ìŠ¤, 25-2, ì„±ê· ê´€ë¡œ, 혜화ë<8f>™, 종로구, 명륜1ê°€, 서울, 03063, ëŒ€í•œë¯¼êµ amenity university 0.483507677970318 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+ulsan national institute of science and technology 2021-02-03 130579694 way ìš¸ì‚°ê³¼í•™ê¸°ìˆ ì›<90>, ìœ ë‹ˆìŠ¤íŠ¸ê¸¸, 울주군, 울산, 44926, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+dgist 2021-02-03 54759661 node êµì œê´€, 현í’<8d>ë¡œ47길, ìœ ê°€ì<9d><8d>, 달성군, 대구, 43015, ëŒ€í•œë¯¼êµ tourism hotel 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+sungkyunkwan university 2021-02-03 66580260 node ì„±ê· ê´€ëŒ€, 화산로, 장안구, 수ì›<90>ì‹œ, 16360, ëŒ€í•œë¯¼êµ railway stop 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+korea atomic energy research institute 2021-02-03 238115633 way í•œêµì›<90>ìž<90>ë ¥ì—°êµ¬ì›<90>, ì‹ ì„±ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, ëŒ€í•œë¯¼êµ landuse military 0.2 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+korea 2021-02-03 258235947 relation ëŒ€í•œë¯¼êµ boundary administrative 0.802419592147396 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+gachon university 2021-02-03 69928613 node 가천대, 성남대로, ìˆ˜ì •êµ¬, 수진ë<8f>™, 13110, ëŒ€í•œë¯¼êµ railway station 0.350501936383412 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+south korea 2021-02-03 258235947 relation ëŒ€í•œë¯¼êµ boundary administrative 0.802419592147396 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+pohang university of science and technology 2021-02-03 259443543 relation í<8f>¬í•ê³µê³¼ëŒ€í•™êµ<90>, 77, ì²ì•”ë¡œ, 효곡ë<8f>™, 남구, í<8f>¬í•ì‹œ, ê²½ìƒ<81>ë¶<81>ë<8f>„, 37673, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+hallym university 2021-02-03 163203242 way 한림대학êµ<90>, 성심로, 춘천시, ê°•ì›<90>ë<8f>„, 24294, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+us-korea institute 2021-02-03 221159658 way í•œêµí•´ì–‘수산연수ì›<90>, 367, í•´ì–‘ë¡œ, ë<8f>™ì‚¼2ë<8f>™, ë<8f>™ì‚¼ë<8f>™, ì˜<81>ë<8f>„구, 부산, 49111, ëŒ€í•œë¯¼êµ office government 0.328369791841981 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+green climate fund 2021-02-03 52465250 node Green Climate Fund, 175, 아트센터대로, 송ë<8f>„2ë<8f>™, 송ë<8f>„ë<8f>™, 연수구, ì<9d>¸ì²œ, 22004, ëŒ€í•œë¯¼êµ office government 0.557277503353622 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+yonsei university 2021-02-03 302696400 node ìº í<8d>¼ìŠ¤íƒ€ìš´, 지하66, 송ë<8f>„êµì œëŒ€ë¡œ, 송ë<8f>„1ë<8f>™, 송ë<8f>„ë<8f>™, 연수구, ì<9d>¸ì²œ, 21990, ëŒ€í•œë¯¼êµ railway station 0.317964956585921 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+sbs 2021-02-03 61070534 node SBS, 161, 목ë<8f>™ì„œë¡œ, 목1ë<8f>™, 양천구, 서울, ì˜¤ì •êµ¬, 08006, ëŒ€í•œë¯¼êµ amenity studio 0.692747798796741 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+busan 2021-02-03 258387761 relation 부산, ëŒ€í•œë¯¼êµ boundary administrative 0.621986409641008 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+snu 2021-02-03 259528448 relation 서울대학êµ<90> ê´€ì•…ìº í<8d>¼ìŠ¤, 1, 관악로, ê±´ì˜<81>아파트, ì²ë£¡ë<8f>™, 관악구, 서울, 08826, ëŒ€í•œë¯¼êµ amenity university 0.549669564596858 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+institute for basic science 2021-02-03 195637674 way Institute for Basic Science, 대ë<8d>•ëŒ€ë¡œ512번길, ì‹ ì„±ë<8f>™, ìœ ì„±êµ¬, ëŒ€ì „, 34125, ëŒ€í•œë¯¼êµ amenity research_institute 0.401 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+ls cable 2021-02-03 207764001 way LSì „ì„ ì‚¬ì›<90>아파트, ì‹ í<8f>‰ë<8f>™, 구미시, ê²½ìƒ<81>ë¶<81>ë<8f>„, ëŒ€í•œë¯¼êµ landuse residential 0.3 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+seoul national university 2021-02-03 3079877 node 서울대학êµ<90>, 서호ë<8f>™ë¡œ, ê¶Œì„ êµ¬, 수ì›<90>ì‹œ, 16614, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+korea institute of ocean science and technology 2021-02-03 175306429 way í•œêµí•´ì–‘ê³¼í•™ê¸°ìˆ ì›<90>, ìƒ<81>ë¡<9d>구, 안산시, 경기ë<8f>„, ëŒ€í•œë¯¼êµ landuse industrial 0.2 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+gcf 2021-02-03 52465250 node Green Climate Fund, 175, 아트센터대로, 송ë<8f>„2ë<8f>™, 송ë<8f>„ë<8f>™, 연수구, ì<9d>¸ì²œ, 22004, ëŒ€í•œë¯¼êµ office government 0.257277503353622 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+korea development institute 2021-02-03 72869447 node ë¶<81>한개발연구소, 28, í<9d>¬ìš°ì •ë¡œ5길, í•©ì •ë<8f>™, 마í<8f>¬êµ¬, 서울, ì˜¤ì •êµ¬, 04019, ëŒ€í•œë¯¼êµ office research 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+international vaccine institute 2021-02-03 190407343 way êµì œë°±ì‹ 연구소, 1, 관악로, ê±´ì˜<81>아파트, ì²ë£¡ë<8f>™, 관악구, 서울, 08826, ëŒ€í•œë¯¼êµ office research 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+kyungpook national university 2021-02-03 145552795 way êµë¦½ê²½ë¶<81>대학êµ<90>, 대현로9길, 대현ë<8f>™, ë¶<81>구, 대구, 41573, ëŒ€í•œë¯¼êµ amenity university 0.001 ëŒ€í•œë¯¼êµ kr Asia Eastern Asia
+us national institute 2021-02-03 193165956 way The National Institute, 3, شارع 15, قطعة 10, الÙ<81>ØÙŠØيل, الأØمدي, الاØمدي, 53302, الكويت office yes 0.201 الكويت kw Asia Western Asia
+kuwait 2021-02-03 257947174 relation الكويت boundary administrative 0.695601802153665 الكويت kw Asia Western Asia
+iit 2021-02-03 112248819 way Ð<90>Ñ<8f>Ñ‚Ñ<81>кое, ДениÑ<81>овÑ<81>кий район, КоÑ<81>танайÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, ҚазақÑ<81>тан place village 0.292975169111391 ҚазақÑ<81>тан kz Asia Central Asia
+kazakhstan 2021-02-03 258456913 relation ҚазақÑ<81>тан boundary administrative 0.762519577338093 ҚазақÑ<81>тан kz Asia Central Asia
+republic of kazakhstan 2021-02-03 258456913 relation ҚазақÑ<81>тан boundary administrative 0.762519577338093 ҚазақÑ<81>тан kz Asia Central Asia
+mgh 2021-02-03 62523570 node MGH, ПанфиловÑ<81>кий район, Ð<90>лматинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, ҚазақÑ<81>тан mountain_pass yes 0.35 ҚазақÑ<81>тан kz Asia Central Asia
+noaa 2021-02-03 47618740 node ນາ, ເມືàºàº‡à»€àºŠà»‚ປນ, ສະຫວັນນະເຂດ, ປະເທດລາວ place village 0.275 ປະເທດລາວ la Asia South-Eastern Asia
+department of meteorology and hydrology 2021-02-03 21008314 node Department of Meteorology and Hydrology, Avenue Souphanouvong, ໜàºàº‡àº›àº²à»ƒàº™, ວຽງຈັນ, ສີໂຄດຕະບàºàº‡, ນະຄàºàº™àº«àº¼àº§àº‡àº§àº½àº‡àºˆàº±àº™, 6441, ປະເທດລາວ building office 0.501 ປະເທດລາວ la Asia South-Eastern Asia
+justice department 2021-02-03 26715485 node Justice Department, 16, ເພàº<8d>ໃຫມ່, ເມືàºàº‡àº¥àº°àº¡àº²àº¡, ເຊàº<81>àºàº‡, 151, ປະເທດລາວ amenity public_building 0.201 ປະເທດລາວ la Asia South-Eastern Asia
+aapa 2021-02-03 53572459 node ຈິງ, ເມືàºàº‡àº<81>ະລຶມ, ເຊàº<81>àºàº‡, ປະເທດລາວ place village 0.275 ປະເທດລາວ la Asia South-Eastern Asia
+international union for conservation of nature 2021-02-03 46296307 node International Union for Conservation of Nature, ຮ່àºàº¡ 8, ສີບຸນເຮືàºàº‡, ວຽງຈັນ, ເມືàºàº‡àºˆàº±àº™àº—ະບູລີ, ນະຄàºàº™àº«àº¼àº§àº‡àº§àº½àº‡àºˆàº±àº™, 01009, ປະເທດລາວ office ngo 0.601 ປະເທດລາວ la Asia South-Eastern Asia
+omb 2021-02-03 54244449 node ດູ່, ເມືàºàº‡àº®àº¸àº™, àºàº¸àº”ົມໄຊ, ປະເທດລາວ place village 0.275 ປະເທດລາວ la Asia South-Eastern Asia
+prison law office 2021-02-03 252411118 way ຄຸໄໃຫມ່ຄຸໄໃຫມ່, ຖະຫນົ່ນໄປຫາບ້ານເàº<81>ິນ, ເàº<81>ີນໃຕ້, ທຸລະຄົມ, ວຽງຈັນ, ປະເທດລາວ amenity prison 0.001 ປະເທດລາວ la Asia South-Eastern Asia
+ministry of public security 2021-02-03 200397894 way Ministry of Public Security, Chemin Nongbone, ບ້ານàº<9d>າàº<8d>, ວຽງຈັນ, ເມືàºàº‡àºˆàº±àº™àº—ະບູລີ, ນະຄàºàº™àº«àº¼àº§àº‡àº§àº½àº‡àºˆàº±àº™, 01003, ປະເທດລາວ amenity police 0.401 ປະເທດລາວ la Asia South-Eastern Asia
+apec 2021-02-03 71190099 node Apec, Old Souk Hasroun, Øصرون, قضاء بشرّي, Ù…ØاÙ<81>ظة الشمال, 1377, لبنان amenity fuel 0.101 لبنان lb Asia Western Asia
+lebanon 2021-02-03 258407440 relation لبنان boundary administrative 0.733805379704602 لبنان lb Asia Western Asia
+american university of beirut 2021-02-03 95275637 way الجامعة الأمريكية Ù<81>ÙŠ بيروت, شارع 76, الØمرا, الØمراء, رأس بيروت, بيروت, Ù…ØاÙ<81>ظة بيروت, 2033 9105, لبنان amenity university 0.486153860067244 لبنان lb Asia Western Asia
+un environment programme 2021-02-03 48669497 node Global Environment Facility Small Grants Programmme United nations Development Programme (GEF SGP UNDP), Desir Avenue, L'anse Road, Sans Souci, Castries, 1487, Saint Lucia office yes 0.301 Saint Lucia lc Americas Caribbean
+fountain medical development 2021-02-03 187420482 way American International Medical University, Beausejour Main Road, Beausejour NHC Phase 2, Acacia Heights, Beausejour, Gros Islet, LCO1 101, Saint Lucia amenity university 0.287641222780259 Saint Lucia lc Americas Caribbean
+global environment facility 2021-02-03 48669497 node Global Environment Facility Small Grants Programmme United nations Development Programme (GEF SGP UNDP), Desir Avenue, L'anse Road, Sans Souci, Castries, 1487, Saint Lucia office yes 0.301 Saint Lucia lc Americas Caribbean
+town 2021-02-03 70258427 node Town, Soufriere, ST. LUCIA, Saint Lucia place suburb 0.375 Saint Lucia lc Americas Caribbean
+district general hospital 2021-02-03 43623408 node District General Hospital, Thalvupadu Mannar Road, Toddaveli, மனà¯<8d>னாரà¯<8d> மாவடà¯<8d>டமà¯<8d>, வட மாகாணமà¯<8d>, 41000, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை amenity hospital 0.367710111330712 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+ucsc 2021-02-03 183525981 way UCSC, 35, Reid Avenue, Independace Squre, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை building yes 0.101 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+international water management institute 2021-02-03 204762144 way International Water Management Institute, Sunil Mawatha, Palam Thuna Junction, Pelawatte, බස්නà·<8f>හිර පළà·<8f>à¶, 10120, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை office ngo 0.401 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+iucn 2021-02-03 197240496 way IUCN, Rajapaksha Mawatha, TownHall, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை amenity office 0.101 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+university of ruhuna 2021-02-03 44083620 node University Of Ruhuna, New Tangalle Road, මà·<8f>à¶à¶», Devinuwara, මà·<8f>à¶à¶» දිස්à¶à·Šâ€<8d>රික්කය, දකුණු පළà·<8f>à¶, 81160, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை amenity university 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+national science foundation 2021-02-03 189156816 way National Science Foundation, Vidya Road, Independace Squre, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை office research 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+itn 2021-02-03 139273914 way Independent Television Network – ITN, Wickramasinghe Pura Road, Jayawadanagama, Thalangama South, Thalawathugoda, බස්නà·<8f>හිර පළà·<8f>à¶, 10116, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை amenity public_building 0.101 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+national aquatic resources research and development agency 2021-02-03 72133325 node The National Aquatic Resources Research and Development Agency, Nara Road, Crow Island, Mattakkuliya, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00150, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை office Research_and_product_development 0.701 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+department of geography 2021-02-03 147802012 way Department of Geography, Wijerama Junction, Gangodawila South, Delkanda, බස්නà·<8f>හිර පළà·<8f>à¶, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை natural grassland 0.5 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+sri lanka 2021-02-03 258464964 relation à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை boundary administrative 0.730312094018578 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+us national herbarium 2021-02-03 138112413 way National Herbarium, River Drive, Kendakaduwa, Eriyagama, මහනුවර දිස්à¶à·Šâ€<8d>රික්කය, මධ්â€<8d>යම පළà·<8f>à¶, 20400, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை building yes 0.201 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+university grants commission 2021-02-03 48686537 node University Grants Commission, Ward Place, TownHall, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 800, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை office government 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+freedom party 2021-02-03 212085481 way Sri Lanka Freedom Party - Jaffna District, 4th Cross Street, Mixed Retail Residential, யாழà¯<8d>பà¯<8d>பாணமà¯<8d>, யாழà¯<8d>பà¯<8d>பாணமà¯<8d> மாவடà¯<8d>டமà¯<8d>, வட மாகாணமà¯<8d>, 7, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை office political_party 0.201 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+members of parliament 2021-02-03 232939503 way Parliament Members' Housing, Madiwela, à·<81>à·Šâ€<8d>රී ජයවර්ධනපුර කà·<9d>ට්ටේ, බස්නà·<8f>හිර පළà·<8f>à¶, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை landuse residential 0.4 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+ministry of health 2021-02-03 152298643 way Ministry of Health, 385, Deans Road, Suduwella, Maligawatte, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 800, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை office government 0.594028740055238 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+aaaaaa 2021-02-03 177636879 way aaaaaa, Kapithan Bandula Weerasingha Mawatha, Bendiyamulla, ගම්පහ, බස්නà·<8f>හිර පළà·<8f>à¶, 63.A.63, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை building residential 0.111 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+hri 2021-02-03 135662687 way Mattala Rajapaksa International Airport, Airport Road, Maththala, හම්බන්à¶à·œà¶§ දිස්à¶à·Šâ€<8d>රික්කය, දකුණු පළà·<8f>à¶, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை aeroway aerodrome 0.326239076957718 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+us national science foundation 2021-02-03 189156816 way National Science Foundation, Vidya Road, Independace Squre, Cinnamon Gardens, Colombo, බස්නà·<8f>හිර පළà·<8f>à¶, 00700, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை office research 0.301 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+individual house 2021-02-03 199672414 way Individual house, Village road, Pasyala, බස්නà·<8f>හිර පළà·<8f>à¶, 033, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை building house 0.201 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+national institute of infectious diseases 2021-02-03 205249633 way National Institute of Infectious Diseases, Andihena Road, IDH (Gothatuwa), Atalgoda, Kotikawaththa, බස්නà·<8f>හිර පළà·<8f>à¶, 10600, à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை amenity hospital 0.501 à·<81>à·Šâ€<8d>රී ලංකà·<8f>à·€ இலஙà¯<8d>கை lk Asia Southern Asia
+liber 2021-02-03 257865924 relation Liberia boundary administrative 0.76493857339783 Liberia lr Africa Western Africa
+us department of state 2021-02-03 203675491 way Mitigating Local Dispute In Liberia (MLDL) US department Of State, Saclepea Road, Gbalagbein, Zone 2, Garr-Bain, Nimba County, Liberia man_made yes 0.401 Liberia lr Africa Western Africa
+people's party 2021-02-03 57756179 node United People's Party Office, Baltimore Boulevard, Borworor Quarrer Community (E, Barwror Quarter, Gbarnga, Zone 3, Jorquelleh, Bong County, Liberia office political_party 0.301 Liberia lr Africa Western Africa
+liberia 2021-02-03 257865924 relation Liberia boundary administrative 0.76493857339783 Liberia lr Africa Western Africa
+last mile health 2021-02-03 197374476 way Last Mile Health, Dweh Street, Niao, Zone 5, Tchien, Grand Gedeh County, Liberia office ngo 0.301 Liberia lr Africa Western Africa
+fda 2021-02-03 259031793 relation FDA, Zone 6, Tchien, Grand Gedeh County, Liberia boundary administrative 0.35 Liberia lr Africa Western Africa
+partners in health 2021-02-03 73765026 node Partners in Health, Tubman Boulevard, Peace Island (Congo Town), Congo Town, Monrovia, Greater Monrovia, Montserrado County, 00231, Liberia office ngo 0.301 Liberia lr Africa Western Africa
+lesotho 2021-02-03 258275126 relation Lesotho boundary administrative 0.743099528975159 Lesotho ls Africa Southern Africa
+appeal court 2021-02-03 167262882 way Appeal Court, Nightingale Road, White City, Maseru, Maseru District, 100, Lesotho amenity courthouse 0.201 Lesotho ls Africa Southern Africa
+maoa 2021-02-03 175399852 way Proposed Maoa-Mafubelu Community Council, Ha Mahala, Lithotaneng, Leribe District, Lesotho landuse construction 0.3 Lesotho ls Africa Southern Africa
+vu university 2021-02-03 259014111 relation Vilniaus universitetas, Simono Daukanto aikÅ¡tÄ—, Senamiestis, SenamiesÄ<8d>io seniÅ«nija, Vilnius, Vilniaus miesto savivaldybÄ—, Vilniaus apskritis, Lietuva amenity university 0.557377358917248 Lietuva lt Europe Northern Europe
+nida 2021-02-03 190180 node Nida, Neringa, Neringos savivaldybÄ—, KlaipÄ—dos apskritis, 93121, Lietuva place suburb 0.49975765213835 Lietuva lt Europe Northern Europe
+lithuania 2021-02-03 258088012 relation Lietuva boundary administrative 0.755558712203811 Lietuva lt Europe Northern Europe
+vilnius university 2021-02-03 259014111 relation Vilniaus universitetas, Simono Daukanto aikÅ¡tÄ—, Senamiestis, SenamiesÄ<8d>io seniÅ«nija, Vilnius, Vilniaus miesto savivaldybÄ—, Vilniaus apskritis, Lietuva amenity university 0.657377358917248 Lietuva lt Europe Northern Europe
+skoda 2021-02-03 258707357 relation Skuodas, Skuodo miesto seniūnija, Skuodo rajono savivaldybė, Klaipėdos apskritis, Lietuva boundary administrative 0.443410405267134 Lietuva lt Europe Northern Europe
+university of luxembourg 2021-02-03 186892046 way Université du Luxembourg - Campus Limpertsberg, Rue Frantz Clément, Limpertsberg, Luxembourg, Canton Luxembourg, 1913, Lëtzebuerg amenity university 0.101 Lëtzebuerg lu Europe Western Europe
+european court of auditors 2021-02-03 178152493 way European Court of Auditors, 12, Rue Alcide de Gasperi, Quartier Européen Nord, Kirchberg, Luxembourg, Canton Luxembourg, 1615, Lëtzebuerg office government 0.881520550885057 Lëtzebuerg lu Europe Western Europe
+luxembourg 2021-02-03 258680582 relation Lëtzebuerg boundary administrative 0.72827867579404 Lëtzebuerg lu Europe Western Europe
+mie university 2021-02-03 229451045 way Maison de l'Innovation, Avenue des Hauts-Fourneaux, Belval, Esch-sur-Alzette, Canton Esch-sur-Alzette, 4362, Lëtzebuerg building yes 0.001 Lëtzebuerg lu Europe Western Europe
+european investment bank 2021-02-03 259404813 relation European Investment Bank, Boulevard Konrad Adenauer, Quartier Européen Nord, Kirchberg, Luxembourg, Canton Luxembourg, 1115, Lëtzebuerg building office 0.301 Lëtzebuerg lu Europe Western Europe
+european court of justice 2021-02-03 137569328 way Ministère des affaires étrangères & européennes, 9, Rue du Palais de Justice, Ville-Haute, Luxembourg, Canton Luxembourg, 1841, Lëtzebuerg office government 0.472275390676979 Lëtzebuerg lu Europe Western Europe
+ministry of economy 2021-02-03 17156350 node Latvijas Republikas Ekonomikas ministrija, 55, Brīvības iela, Centrs, Rīga, Vidzeme, LV-1010, Latvija office government 0.24352463088163 Latvija lv Europe Northern Europe
+latvia 2021-02-03 257910781 relation Latvija boundary administrative 0.744567200497597 Latvija lv Europe Northern Europe
+ukri 2021-02-03 259569629 relation Ukri, Auces novads, Zemgale, Latvija boundary administrative 0.4 Latvija lv Europe Northern Europe
+national library of science and technology 2021-02-03 193077551 way المكتبة الوطنية للعلوم والتقنية, طريق تاجوراء الوسط, طرابلس, سوق الجمعة, طرابلس, ليبيا amenity library 0.001 ليبيا ly Africa Northern Africa
+new hope fertility clinic 2021-02-03 245123183 way عيادة الامل للخصبة, شارع الخليج العربي, الØدائق, بنغازي, 10001, ليبيا amenity hospital 0.001 ليبيا ly Africa Northern Africa
+environmental computer science 2021-02-03 77766672 node مراقبة Øماية البيئة من التلوث, طريق المنطقه الاولي, مدينة البريقة, الواØات, ليبيا tourism artwork 0.001 ليبيا ly Africa Northern Africa
+atlas 2021-02-03 58180936 node Atlas Mountains, Toubkal ⵜⵓⴱⵇⴰâµ<8d> توبقال, caïdat de’Ouzioua, cercle de Taliouine, Province de Taroudant ⵜⴰⵙⴳⴰ âµ<8f> ⵜⴰⵔⵓⴷⴰâµ<8f>ⵜ إقليم تارودانت, Souss-Massa ⵙⵓⵙⵙ-ⵎⴰⵙⵙⴰ سوس-ماسة, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب natural mountain_range 0.622636990621202 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب ma Africa Northern Africa
+school of oriental 2021-02-03 78918893 node مجموع مدارس ابن الخطيب, RN2, Hajrat el Halouf ⵃⵊⵕⵜ âµ<8d>ⵃâµ<8d>âµ<8d>ⵓⴼ Øجرة الØلوÙ<81>, Aïchoun ⵄⵉⵛⵓâµ<8f> عيشون, Aghbal أغبال, caïdat d'Aghbal قيادة أغبال, Cercle d'Ahfir دائرة Ø£ØÙ<81>ير, Province de Berkane إقليم بركان, Oriental ⵜⴰâµ<8f>ⴳⵎⵓⴹⵜ الشرقية, 63202, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب amenity school 0.101 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب ma Africa Northern Africa
+ecole polytechnique 2021-02-03 172816013 way Ecole Polytechnique, Boulevard de Bouskoura, Anfa Préfecture, Casablanca ⵜⵉⴳⵎⵉ ⵜⵓⵎâµ<8d>ⵉâµ<8d>ⵜ الدار البيضاء, arrondissement de Hay Hassani مقاطعة الØÙŠ الØسني, Pachalik de Casablanca, Préfecture de Casablanca عمالة الدار البيضاء, Casablanca-Settat ⵜⵉⴳⵎⵉ ⵜⵓⵎâµ<8d>ⵉâµ<8d>ⵜ-ⵙⵟⵟⴰⵜ الدار البيضاء-سطات, 20200, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب building university 0.201 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب ma Africa Northern Africa
+bureau of international cooperation 2021-02-03 151396673 way Bureau International de la Coopération Décentralisée - Figuig المكتب الدولي التعاون اللامركزي لمدينة Ù<81>كيك, Boulevard Hassan II شارع الØسن الثاني, Quartier Administratif الØÙŠ الإداري, Figuig ⵉⴼⵉⵢⵢⵉⵢ Ù<81>كيك, Pachalik de Figuig, Province de Figuig إقليم الناظور, Oriental ⵜⴰâµ<8f>ⴳⵎⵓⴹⵜ الشرقية, 61002, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب office ngo 0.201 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب ma Africa Northern Africa
+amyris 2021-02-03 44222289 node Amyris, Rue Anissone, Riad ⵔⵉⵢⴰⴷ الرياض, Agdal Riyad أكدال الرياض, Rabat ⵔⴱⴰⵟ الرباط, Préfecture de Rabat عمالة الرباط, Rabat-Salé-Kénitra ⵔⴱⴰⵟ-âµ™âµ<8d>â´°-ⵇâµ<8f>ⵉⵟⵔⴰ الرباط-سلا-القنيطرة, 1100, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب amenity pharmacy 0.101 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب ma Africa Northern Africa
+institute pasteur 2021-02-03 36249968 node Institute Pasteur, Avenue Hadj Mohamed Tazi, Marshan مرشان, Tanger طنجة, arrondissement de Tanger-Medina طنجة المدينة, pachalik de Tanger طنجة, Préfecture de Tanger-Assilah عمالة طنجة-أصيلة, Tanger-Tétouan-Al Hoceima ⵟⴰâµ<8f>ⵊ-ⵟⵉⵜⴰⵡⵉâµ<8f>-âµ<8d>ⵃⵓⵙⵉⵎⴰ طنجة تطوان الØسيمة, 90005, Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب office educational_institution 0.201 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب ma Africa Northern Africa
+morocco 2021-02-03 258802367 relation Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب boundary administrative 0.781074717986943 Maroc / âµ<8d>ⵎⵖⵔⵉⴱ / المغرب ma Africa Northern Africa
+monaco 2021-02-03 257226999 relation Monaco boundary land_area 0.789644598497058 Monaco mc Europe Western Europe
+republic of moldova 2021-02-03 258078872 relation Moldova boundary administrative 0.810647543596845 Moldova md Europe Eastern Europe
+moldova state university 2021-02-03 96416496 way Universitatea de Stat din Moldova, 60, Strada Alexei Mateevici, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2009, Moldova amenity university 0.511834385728338 Moldova md Europe Eastern Europe
+usc 2021-02-03 259256589 relation Universitatea de Stat „Bogdan Petriceicu HaÈ™deuâ€<9d> din Cahul, 1, PiaÈ›a IndependenÈ›ei, Centru, Cahul, Raionul Cahul, Moldova amenity college 0.256321943137092 Moldova md Europe Eastern Europe
+technical university of moldova 2021-02-03 259221802 relation Universitatea Tehnică a Moldovei, Bulevardul Cuza-Vodă, Toamna de Aur, Chișinău, Sectorul Botanica, Municipiul Chișinău, 2032, Moldova amenity university 0.412408728172101 Moldova md Europe Eastern Europe
+social democratic party 2021-02-03 75621414 node Partidul Social Democrat, Strada Ghioceilor, Buiucanii Vechi, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2008, Moldova office political_party 0.101 Moldova md Europe Eastern Europe
+transparency international 2021-02-03 80688236 node Transparency International, 98, Strada 31 August 1989, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2004, Moldova office association 0.201 Moldova md Europe Eastern Europe
+moldova 2021-02-03 258078872 relation Moldova boundary administrative 0.810647543596845 Moldova md Europe Eastern Europe
+constitutional court 2021-02-03 216698368 way Curtea Constituțională, 28, Strada Alexandru Lăpușneanu, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2004, Moldova office government 0.370639694209592 Moldova md Europe Eastern Europe
+culture and research 2021-02-03 76263818 node Ministerul Educației, Culturii și Cercetării, 1, Piața Marea Adunare Națională, Chișinău, Sectorul Buiucani, Municipiul Chișinău, MD-2033, Moldova office government 0.001 Moldova md Europe Eastern Europe
+strp 2021-02-03 6436011 node Strp, Opština Kotor, 85338, Crna Gora / Црна Гора place village 0.442954744060451 Crna Gora / Црна Гора me Europe Southern Europe
+university of montenegro 2021-02-03 300314506 way Sportski i kulturni centar Univerziteta Crne Gore, 1, Studentska, Kruševac, Podgorica, Glavni grad Podgorica, 81000, Crna Gora / Црна Гора office yes 0.001 Crna Gora / Црна Гора me Europe Southern Europe
+brca 2021-02-03 259536883 relation Brca, Opština Bar, Crna Gora / Црна Гора boundary administrative 0.442480646342894 Crna Gora / Црна Гора me Europe Southern Europe
+conservation international 2021-02-03 68745674 node Conservation International, N 7, Mahamanina, Antsororokavo, Tanana Ambany, Fianarantsoa, District de Fianarantsoa, Matsiatra Ambony, Province de Fianarantsoa, 301, Madagasikara office ngo 0.201 Madagasikara mg Africa Eastern Africa
+sofia 2021-02-03 50765789 node Sofia, Province de Mahajanga, Madagasikara place state 0.65 Madagasikara mg Africa Eastern Africa
+university of antananarivo 2021-02-03 247271163 way IT University, N 7, Andoharanofotsy, Antananarivo, Analamanga, Province d’Antananarivo, 102, Madagasikara amenity university 0.301 Madagasikara mg Africa Eastern Africa
+madagascar 2021-02-03 258058840 relation Madagasikara boundary administrative 0.710032185300668 Madagasikara mg Africa Eastern Africa
+marshall islands 2021-02-03 2735253 node Marshall Islands, Ṃajeḷ place archipelago 0.826224991072023 Ṃajeḷ mh Oceania Micronesia
+methodius university 2021-02-03 91653738 way Универзитет „Св. Кирил и Методиј“, 9, Булевар Гоце Делчев, Маџир Маало, Центар, Скопје, Општина Центар, Град Скопје, СкопÑ<81>ки СР, 1000, Северна Македонија amenity university 0.445726149027095 Северна Македонија mk Europe Southern Europe
+macedonia 2021-02-03 258289965 relation Северна Македонија boundary administrative 0.700106436214969 Северна Македонија mk Europe Southern Europe
+european university 2021-02-03 99750914 way ЕвропÑ<81>ки уиверзитет, 68, Булевар Климент ОхридÑ<81>ки, Капиштец, Центар, Скопје, Општина Центар, Град Скопје, СкопÑ<81>ки СР, 1000, Северна Македонија building university 0.289139026272805 Северна Македонија mk Europe Southern Europe
+fema 2021-02-03 20841052 node Féma, Cercle d'Ansongo, Gao, Mali place hamlet 0.25 Mali ml Africa Western Africa
+mali 2021-02-03 258390630 relation Mali boundary administrative 0.790781088929414 Mali ml Africa Western Africa
+gao 2021-02-03 297990 node Gao, Cercle de Gao, Gao, Mali place city 0.585315627887998 Mali ml Africa Western Africa
+mpdl 2021-02-03 84054815 node ONG Mouvement pour la Paix MPDL, Route secondaire kita liberté, Liberté Darsalam, Kita, Kayes, Mali office ngo 0.101 Mali ml Africa Western Africa
+japan japan 2021-02-03 52812179 node Japan Japan, ပန်းဆá€á€¯á€¸á€<90>န်းလမ်း, ကျောက်á€<90>ံá€<90>ား, ရန်ကုန်, Western District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 11183, မြန်မာ amenity restaurant 0.201 မြန်မာ mm Asia South-Eastern Asia
+khwe 2021-02-03 56327123 node Ma Khwe, မá€á€¯á€¸á€™á€±á€¬á€€á€º, ဗန်းမော်á€<81>ရá€á€¯á€„်, ကá€<81>ျင်ပြည်နယ် (Kachin), မြန်မာ place village 0.375 မြန်မာ mm Asia South-Eastern Asia
+gwa 2021-02-03 259030031 relation ဂွမြá€á€¯á€·á€”ယ်, သံá€<90>ွဲá€<81>ရá€á€¯á€„, ရá€<81>á€á€¯á€„်ပြည်နယ် (Rakhine), 07182, မြန်မာ boundary administrative 0.283208261767925 မြန်မာ mm Asia South-Eastern Asia
+suny college 2021-02-03 73203724 node suny, 3, Chay-myit-pin, ပြင်ဦးလွင်, ပြင်ဦးလွင်á€<81>ရá€á€¯á€„်, ရှမ်းပြည်နယ်မြောက်ပá€á€¯á€„်း, မန္á€<90>လေးá€<90>á€á€¯á€„်း, 05082, မြန်မာ shop car_repair 0.111 မြန်မာ mm Asia South-Eastern Asia
+petronas 2021-02-03 176840009 way Petronas, ဗဟန်း, ရန်ကုန်, Western District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, မြန်မာ landuse commercial 0.3 မြန်မာ mm Asia South-Eastern Asia
+united nation 2021-02-03 211221297 way ကမ္ဘာ့ကုလသမဂ္ဂ United Nation, နá€<90>်မောက်လမ်း, á€<90>ာမွေ, ရန်ကုန်, Southern District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 00000, မြန်မာ building yes 0.201 မြန်မာ mm Asia South-Eastern Asia
+meteorological office 2021-02-03 165525254 way Meteorological Office, ကမ္ဘာအေးစေá€<90>ီလမ်း, မရမ်းကုန်း, Northern District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 11061, မြန်မာ building yes 0.201 မြန်မာ mm Asia South-Eastern Asia
+center for strategic and international studies 2021-02-03 59087016 node Center for Strategic and International Studies (CSIS Myanmar), ပြည်လမ်း, လှá€á€¯á€„်, Northern District, ရန်ကုန်á€<90>á€á€¯á€„်းဒေသကြီး, 1001, မြန်မာ amenity college 0.601 မြန်မာ mm Asia South-Eastern Asia
+burma 2021-02-03 257686006 relation မြန်မာ boundary administrative 0.70160293453831 မြန်မာ mm Asia South-Eastern Asia
+mongolia 2021-02-03 258374991 relation Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° boundary administrative 0.712716402748512 Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° mn Asia Eastern Asia
+unt 2021-02-03 15012021 node Уньт, Хутаг-Өндөр, Булган, Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° place hamlet 0.25 Монгол улÑ<81> á ®á ¤á ©á á ¤á ¯ á ¤á ¯á ¤á ° mn Asia Eastern Asia
+mauritania 2021-02-03 257903579 relation موريتانيا boundary administrative 0.667049491176254 موريتانيا mr Africa Western Africa
+court of justice 2021-02-03 123844812 way Court of Justice, Triq ir-Repubblika, Valletta, Xlokk, 1112, Malta tourism attraction 0.633256970094253 Malta mt Europe Southern Europe
+istc 2021-02-03 103649213 way ISTC, Hal Far, Birżebbuġa, Nofsinhar, BBG 2366, Malta amenity school 0.101 Malta mt Europe Southern Europe
+malta 2021-02-03 258431458 relation Malta boundary administrative 0.812750360639362 Malta mt Europe Southern Europe
+national museum of the archaeology 2021-02-03 98624313 way National Museum of Archaeology, Triq ir-Repubblika, Valletta, Xlokk, 1112, Malta tourism museum 0.753955066068524 Malta mt Europe Southern Europe
+mauritius 2021-02-03 258556432 relation Mauritius boundary administrative 0.769831293338391 Mauritius mu Africa Eastern Africa
+maldives 2021-02-03 258047730 relation Þ‹Þ¨ÞˆÞ¬Þ€Þ¨ÞƒÞ§Þ‡Þ°Þ–Þ¬ boundary administrative 0.650520652391712 Þ‹Þ¨ÞˆÞ¬Þ€Þ¨ÞƒÞ§Þ‡Þ°Þ–Þ¬ mv Asia Southern Asia
+agricultural research for development 2021-02-03 162111456 way Centre for Agricultural Research and Development, S125, Mitundu, Lilongwe, Central Region, Malawi building yes 0.401 Malawi mw Africa Eastern Africa
+john church 2021-02-03 70627801 node John, Mulanje, Southern Region, Malawi place village 0.375 Malawi mw Africa Eastern Africa
+national research programme 2021-02-03 203971970 way Malawi-Liverpool-Wellcome Trust Clinical Research Programme, Kenyatta Drive, Limbe, Blantyre, Southern Region, Malawi building yes 0.201 Malawi mw Africa Eastern Africa
+malawi-liverpool-wellcome trust clinical research programme 2021-02-03 203971970 way Malawi-Liverpool-Wellcome Trust Clinical Research Programme, Kenyatta Drive, Limbe, Blantyre, Southern Region, Malawi building yes 0.701 Malawi mw Africa Eastern Africa
+malawi 2021-02-03 258015492 relation Malawi boundary administrative 0.760119250884759 Malawi mw Africa Eastern Africa
+food and nutrition sciences 2021-02-03 163124289 way Nutrition and Food Sciences Department, S125, Mitundu, Lilongwe, Central Region, Malawi building school 0.401 Malawi mw Africa Eastern Africa
+pds 2021-02-03 126696505 way Aeropuerto Intl. de Piedras Negras, Libramiento Venustiano Carranza, Colonia Venustiano Carranza, Nava, Coahuila de Zaragoza, 26090, México aeroway aerodrome 0.305439512435045 México mx Americas Central America
+ursus maritimus 2021-02-03 258279792 relation Polar bear, Panoramica 1a. Sección, Guadalajara, Jalisco, México landuse enclosure 0.2 México mx Americas Central America
+paseo de la reforma 2021-02-03 206203911 way Paseo de la Reforma, Matamoros, Municipio de Matamoros, Tamaulipas, México leisure park 0.55 México mx Americas Central America
+petróleos mexicanos 2021-02-03 198944140 way Petróleos Mexicanos, Encarnación de DÃaz, Jalisco, México highway residential 0.3 México mx Americas Central America
+ucu 2021-02-03 258828316 relation Ucú, Yucatán, 97357, México boundary administrative 0.349448365439565 México mx Americas Central America
+salk 2021-02-03 82814111 node SALK, San Luis PotosÃ, Municipio de San Luis PotosÃ, San Luis PotosÃ, 78385, México place neighbourhood 0.35 México mx Americas Central America
+me 2021-02-03 257065613 relation México boundary administrative 0.839923932441765 México mx Americas Central America
+mexic 2021-02-03 257065613 relation México boundary administrative 0.839923932441765 México mx Americas Central America
+jumex 2021-02-03 256750870 way Jumex, Salinas Victoria, Nuevo León, México landuse industrial 0.3 México mx Americas Central America
+national autonomous university of mexico 2021-02-03 96671012 way Universidad Nacional Autónoma de México, Circuito Exterior, Ciudad Universitaria, Coyoacán, Ciudad de México, 04360, México amenity university 0.562409087444079 México mx Americas Central America
+ixtoc 2021-02-03 144903083 way Ixtoc, Municipio de Zacatecas, Zacatecas, 98050, México highway residential 0.2 México mx Americas Central America
+mexichem fluor 2021-02-03 83412633 node Mexichem Flúor, S.A. de C.V., Avenida Minerales, FRACCIONAMIENTO PUENTE SOL, San Luis PotosÃ, Municipio de San Luis PotosÃ, San Luis PotosÃ, 78398, México man_made works 0.101 México mx Americas Central America
+cimmyt 2021-02-03 185530203 way CIMMyT, San Sebastian, Metepec, Estado de México, México landuse farmland 0.3 México mx Americas Central America
+ciencia 2021-02-03 300995336 way Ciencia, Industrial Cuamatla, Cuautitlán Izcalli, Estado de México, 54730, México highway unclassified 0.2 México mx Americas Central America
+paranal 2021-02-03 64125022 node El Paranal, Compostela, México place village 0.375 México mx Americas Central America
+institute of america 2021-02-03 257995273 way Great Union Institute, 74, Calle Kramer, Atlántida, Coyoacán, Ciudad de México, 04370, México amenity school 0.101 México mx Americas Central America
+conacyt 2021-02-03 58576053 node CONACYT, Avenida Insurgentes Sur, Crédito constructor, Benito Juárez, Ciudad de México, 03940, México office government 0.101 México mx Americas Central America
+cañales de la fuente 2021-02-03 130437167 way Rió Chiquito, Morelia, Michoacán de Ocampo, 58010, México waterway canal 0.35 México mx Americas Central America
+pemex 2021-02-03 259232903 relation PEMEX, Tierra Blanca, Veracruz de Ignacio de la Llave, 95180, México boundary administrative 0.35 México mx Americas Central America
+agu 2021-02-03 258383817 relation Aguascalientes, México boundary administrative 0.651698731260612 México mx Americas Central America
+el mercurio 2021-02-03 258592407 relation Mercurio, Delegación Centro Histórico, Santiago de Querétaro, Municipio de Querétaro, Querétaro, 76040, México boundary administrative 0.45 México mx Americas Central America
+mexico 2021-02-03 257065613 relation México boundary administrative 0.839923932441765 México mx Americas Central America
+chiquita 2021-02-03 83170179 node La Chiquita, Escárcega, Campeche, 24350, México place village 0.375 México mx Americas Central America
+el niño 2021-02-03 20287493 node El Niño, Municipio de Tijuana, Baja California, 22254, México place village 0.475 México mx Americas Central America
+autonomous university of mexico state 2021-02-03 96671012 way Universidad Nacional Autónoma de México, Circuito Exterior, Ciudad Universitaria, Coyoacán, Ciudad de México, 04360, México amenity university 0.562409087444079 México mx Americas Central America
+cjs 2021-02-03 168991899 way Aeropuerto Intl. Abraham González, Calle Mariposas, Fraccionamiento Paseos del Alba, Ciudad Juárez, Municipio de Juárez, Chihuahua, 32695, México aeroway aerodrome 0.20962395537125 México mx Americas Central America
+cincia 2021-02-03 300995336 way Ciencia, Industrial Cuamatla, Cuautitlán Izcalli, Estado de México, 54730, México highway unclassified 0.1 México mx Americas Central America
+unam 2021-02-03 96671012 way Universidad Nacional Autónoma de México, Circuito Exterior, Ciudad Universitaria, Coyoacán, Ciudad de México, 04360, México amenity university 0.562409087444079 México mx Americas Central America
+micron 2021-02-03 170067917 way Micron, Muar, Johor, Malaysia landuse industrial 0.3 Malaysia my Asia South-Eastern Asia
+wmap 2021-02-03 638414 node Kluang Airstrip, 881 Army Aviation Regiment, Jalan Delima, Kluang, Johor, 86000, Malaysia aeroway aerodrome 0.217338060184506 Malaysia my Asia South-Eastern Asia
+niosh 2021-02-03 191530658 way National Institute of Safety and Health (NIOSH), Majlis Perbandaran Kajang, Selangor, Malaysia landuse commercial 0.3 Malaysia my Asia South-Eastern Asia
+rts 2021-02-03 133258714 way Johor Bahru–Singapore Rapid Transit System / Sistem Transit Aliran Johor Bahru–Singapura, Jalan Lingkaran Dalam, Johor Bahru, Iskandar Malaysia, Johor, 80730, Malaysia railway construction 0.373004776697036 Malaysia my Asia South-Eastern Asia
+nas council 2021-02-03 77986421 node NAS THE BARBERSHOP, Jalan Rantau Panjang, Kampung Rantau Panjang, Majlis Perbandaran Klang, Selangor, 42100, Malaysia shop hairdresser_supply 0.101 Malaysia my Asia South-Eastern Asia
+national institute of health 2021-02-03 195112165 way Institut Pengurusan Kesihatan, Jalan Abdullah, Bukit Bangsar, Brickfields, Kuala Lumpur, 59000, Malaysia amenity research_institute 0.001 Malaysia my Asia South-Eastern Asia
+ipo 2021-02-03 919320 node Ipoh, Perak, 30450, Malaysia place city 0.615222407384027 Malaysia my Asia South-Eastern Asia
+nipah 2021-02-03 181411960 way Nipah, Sabah, Malaysia landuse forest 0.3 Malaysia my Asia South-Eastern Asia
+national institute of occupational safety and health 2021-02-03 56964700 node Institut Keselamatan dan Kesihatan Pekerjaan Negara (NIOSH), Jalan Tun Abdul Razak, Ayer Keroh, Majlis Perbandaran Hang Tuah Jaya, Melaka Tengah, Melaka, 75450, Malaysia office government 0.101 Malaysia my Asia South-Eastern Asia
+national defence university of malaysia 2021-02-03 177354671 way Universiti Pertahanan Nasional Malaysia, Sungai Besi, Kuala Lumpur, 57000, Malaysia amenity university 0.453359579316511 Malaysia my Asia South-Eastern Asia
+executive council 2021-02-03 181186080 way Klang Executive Club, Majlis Perbandaran Klang, Selangor, Malaysia landuse commercial 0.3 Malaysia my Asia South-Eastern Asia
+zero hour 2021-02-03 54517763 node OYO 304 Zero Hour, 60, Changkat Bukit Bintang, Bukit Bintang, Kuala Lumpur, 50200, Malaysia tourism hotel 0.201 Malaysia my Asia South-Eastern Asia
+malaysia 2021-02-03 258625503 relation Malaysia boundary administrative 0.867487508874317 Malaysia my Asia South-Eastern Asia
+national science centre 2021-02-03 126784027 way Pusat Sains Negara, Lebuhraya Sprint, Bukit Kiara, Kuala Lumpur, 6000, Malaysia tourism museum 0.301403950541443 Malaysia my Asia South-Eastern Asia
+university of southampton 2021-02-03 136568212 way University of Southampton, 3, Persiaran Canselor 1, EduCity Iskandar Malaysia, Iskandar Puteri, Johor Bahru, Iskandar Malaysia, Johor, 79200, Malaysia amenity university 0.301 Malaysia my Asia South-Eastern Asia
+university malaysia sarawak 2021-02-03 77913241 node Open University Malaysia, Jalan Ibrahim Sultan, Johor Bahru, Iskandar Malaysia, Johor, 80300, Malaysia amenity university 0.201 Malaysia my Asia South-Eastern Asia
+mrsa 2021-02-03 247579802 way Malaysia Remote Sensing Agency, Mentakab, Temerloh, Pahang, Malaysia landuse industrial 0.2 Malaysia my Asia South-Eastern Asia
+nerc 2021-02-03 70807306 node NERC, Mersing, Johor, Malaysia leisure park 0.25 Malaysia my Asia South-Eastern Asia
+defence science institute 2021-02-03 201603752 way Institut Penyelidikan Sains dan Teknologi Pertahanan, Kajang 2, Majlis Perbandaran Kajang, Selangor, 43000, Malaysia landuse military 0.2 Malaysia my Asia South-Eastern Asia
+apl 2021-02-03 154933581 way Aeroporto Internacional de Nampula, N1, Cidade de Nampula, Meconta, Nampula, Moçambique aeroway aerodrome 0.302778707896871 Moçambique mz Africa Eastern Africa
+mozambique 2021-02-03 258405737 relation Moçambique boundary administrative 0.690869640042326 Moçambique mz Africa Eastern Africa
+university of namibia 2021-02-03 259061968 relation University of Namibia (UNAM), 340, Western Bypass, Academia, Windhoek, Khomas Region, 10021, Namibia amenity university 0.65609057542022 Namibia na NA NA
+namibia 2021-02-03 258181441 relation Namibia boundary administrative 0.787423386363076 Namibia na NA NA
+aap 2021-02-03 166056493 way Aap, Kunene Region, Namibia waterway river 0.375 Namibia na NA NA
+security commission 2021-02-03 176798699 way Social Security Commission, Social Security Commission Street, Evululuko, Oshakati, Oshana Region, Namibia building yes 0.201 Namibia na NA NA
+sciences en marche 2021-02-03 247370552 way Faculté des Sciences Économiques et Juridiques (FSEJ), Rue du Malii, Baie d'Along, Kalley Sud, Niamey, 13053, Niger amenity university 0.201 Niger ne Africa Western Africa
+united nations economic commission for africa 2021-02-03 100693942 way Commission Economique de Nations Unis pour l'Afrique, Avenue du Fleuve Niger, Château 1, Plateau, Niamey, PO BOX 744, Niger office international_organization 0.201 Niger ne Africa Western Africa
+niger 2021-02-03 258196686 relation Niger boundary administrative 0.762187691693021 Niger ne Africa Western Africa
+court of auditors 2021-02-03 40892781 node Cour de Compte, Avenue des Ministères, Kombo, Niamey, 227, Niger amenity courthouse 0.001 Niger ne Africa Western Africa
+global health program 2021-02-03 72262246 node USAID Global Health Supply Chain Program, Rue KK - 37, Ambassades, Yantala Bas, Niamey, 12519, Niger office ngo 0.301 Niger ne Africa Western Africa
+akari 2021-02-03 3928427 node Akari, Tchirozérine, Agadez, Niger place village 0.375 Niger ne Africa Western Africa
+ecole normale supérieure 2021-02-03 150675686 way École Normale Supérieure, Nogaré, Niamey, Niger landuse residential 0.4 Niger ne Africa Western Africa
+ipsp 2021-02-03 84198776 node IPSP KONNI, N 1, Birni N'Konni, Tahoua, Niger amenity school 0.101 Niger ne Africa Western Africa
+acmad 2021-02-03 48915388 node ACMAD, Avenue des Ministères, Kombo, Niamey, 227, Niger office telecommunication 0.101 Niger ne Africa Western Africa
+national primary health care development agency 2021-02-03 63408220 node National Primary Health Care Development Agency, Murtala Muhammed Way, Yamma 2, Muhammadu Dikko Stadium, Katsina, Nigeria amenity hospital 0.601 Nigeria ng Africa Western Africa
+living proof 2021-02-03 214035104 way Living-Proof Church Street, Ijaiye, Coker, Ifako/Ijaye, 100282, Nigeria highway residential 0.3 Nigeria ng Africa Western Africa
+redeemer's university 2021-02-03 82335474 node Redeemers University, Ede, Akoda Road, Ede South, Osun, 232121, Nigeria amenity college 0.301 Nigeria ng Africa Western Africa
+bank of industry 2021-02-03 251858983 way Bank of Industry, Oba Adesida Road, Akure, Akure South, Ondo, P.M.B 704, Nigeria amenity bank 0.301 Nigeria ng Africa Western Africa
+ncdc 2021-02-03 54956799 node NCDC, Solomon Lar Way, Jabi, Abuja, Municipal Area Council, Federal Capital Territory, 900108, Nigeria office government 0.101 Nigeria ng Africa Western Africa
+tüba 2021-02-03 258538002 relation Tuba, Jere, Borno, Nigeria boundary administrative 0.35 Nigeria ng Africa Western Africa
+zenith bank 2021-02-03 217118303 way Zenith Bank, Lairdstown, Lokoja, Kogi, Nigeria landuse commercial 0.4 Nigeria ng Africa Western Africa
+ut health 2021-02-03 252874587 way health, Ganye - Jimeta Federal Road, Kubi, Jada, Adamawa, Nigeria amenity hospital 0.111 Nigeria ng Africa Western Africa
+gwas 2021-02-03 4173335 node Kurmin Gwas, Kwaturu, Kachia, Kaduna, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+iita 2021-02-03 210080586 way IITA, Oluana, Akinyele, Oyo, Nigeria landuse research 0.3 Nigeria ng Africa Western Africa
+federal university of bahia 2021-02-03 212660417 way Wudil - Potiskum Federal Road, Sabon Gari Arewa, Sabon Gari Lga Quarter, Sabon Gari, Wudil, Kano, Nigeria highway primary 0.2 Nigeria ng Africa Western Africa
+open technology fund 2021-02-03 301111077 way Petroleum Technology Development Fund, Memorial Drive, Wuse II, Abuja, Municipal Area Council, Federal Capital Territory, 223140, Nigeria office government 0.201 Nigeria ng Africa Western Africa
+aba 2021-02-03 4302273 node Aba, Aba South, Abia, Nigeria place city 0.51986117350753 Nigeria ng Africa Western Africa
+peta 2021-02-03 258544920 relation Peta, Kwaya Kusar, Borno, Nigeria boundary administrative 0.45 Nigeria ng Africa Western Africa
+audi 2021-02-03 4112614 node Audi, Arak, Sanga, Kaduna, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+emu 2021-02-03 4192015 node Emu, Lokoja, Kogi, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+rivers 2021-02-03 258774669 relation Rivers, Nigeria boundary administrative 0.589155408370537 Nigeria ng Africa Western Africa
+kigam 2021-02-03 4191125 node Kigam, Dankolo, Sakaba, Kebbi, Nigeria place hamlet 0.35 Nigeria ng Africa Western Africa
+ukip 2021-02-03 4135824 node Ukip, Odukpani, Cross River, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+asor 2021-02-03 4143033 node Asor, Vandeikya, Benue, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+egu 2021-02-03 4155158 node Egue, Ogoja, Cross River, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+nigeria 2021-02-03 258179403 relation Nigeria boundary administrative 0.837817167052956 Nigeria ng Africa Western Africa
+obafemi awolowo university 2021-02-03 65154644 node Obafemi Awolowo University, Road 1, Ife, Ife Central, Osun, Nigeria amenity university 0.675561325671519 Nigeria ng Africa Western Africa
+iddo 2021-02-03 4158848 node Iddo, Ijumu, Kogi, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+ukaea 2021-02-03 4061173 node Ukaa, Lafia, Nasarawa, Nigeria place village 0.275 Nigeria ng Africa Western Africa
+gwu 2021-02-03 4216886 node Gwu, Guma, Benue, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+sheba 2021-02-03 4292823 node Sheba, Fufore, Adamawa, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+cipm 2021-02-03 215607744 way CIPM, Agidingbi, Ikeja, Nigeria landuse commercial 0.3 Nigeria ng Africa Western Africa
+european union council 2021-02-03 61840071 node Delegation of the European Union to Nigeria and ECOWAS, European Union Crescent, Abuja, Municipal Area Council, Federal Capital Territory, 900281, Nigeria office diplomatic 0.301 Nigeria ng Africa Western Africa
+imo 2021-02-03 258539785 relation Imo, Nigeria boundary administrative 0.578975498982342 Nigeria ng Africa Western Africa
+itar 2021-02-03 4164628 node Itar, Ushongo, Benue, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+ussa 2021-02-03 4138452 node Ussa, Rafi, Niger, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+agi 2021-02-03 4166597 node Agi, Ushongo, Benue, Nigeria place village 0.375 Nigeria ng Africa Western Africa
+unan 2021-02-03 258777799 relation Universidad Nacional Autónoma de Nicaragua (UNAN), Sector UNAN Managua, Distrito I, Managua (Municipio), Departamento de Managua, 14172, Nicaragua boundary administrative 0.405003945962319 Nicaragua ni Americas Central America
+international center for tropical agriculture 2021-02-03 23992977 node CIAT - Centro Internacional de Agricultura Tropical, Calle La Extramadura, Los Robles, Distrito I, Managua (Municipio), Departamento de Managua, 14002, Nicaragua office ngo 0.101 Nicaragua ni Americas Central America
+nih vrc 2021-02-03 68159851 node Motoshop VRC, Pista Pedro JoaquÃn Chamorro, Barrio Santa Rosa, Santa Rosa, Distrito IV, Managua (Municipio), Departamento de Managua, 11095, Nicaragua shop motorcycle 0.101 Nicaragua ni Americas Central America
+united nation's food and agriculture organization 2021-02-03 147031638 way FAO Representation, Via al Mirador, Mirador Norte, Mirador Norte Santo Domingo, Distrito I, Managua (Municipio), Departamento de Managua, 14236, Nicaragua office yes 0.101 Nicaragua ni Americas Central America
+united nations food and agriculture organization 2021-02-03 147031638 way FAO Representation, Via al Mirador, Mirador Norte, Mirador Norte Santo Domingo, Distrito I, Managua (Municipio), Departamento de Managua, 14236, Nicaragua office yes 0.001 Nicaragua ni Americas Central America
+nicaragua 2021-02-03 258223262 relation Nicaragua boundary administrative 0.795002067004934 Nicaragua ni Americas Central America
+delft university of technology 2021-02-03 138201041 way Technische Universiteit Delft, Mijnbouwstraat, Wippolder, Delft, Zuid-Holland, Nederland, 2628, Nederland amenity university 0.604534284533579 Nederland nl Europe Western Europe
+university of groningen 2021-02-03 258652656 relation Academiegebouw, Broerstraat, Binnenstad-noord, Centrum, Groningen, Nederland, 9712GJ, Nederland building university 0.349182950422608 Nederland nl Europe Western Europe
+leiden university medical centre 2021-02-03 257776634 relation Leiden, Zuid-Holland, Nederland boundary administrative 0.719246276766776 Nederland nl Europe Western Europe
+university of utrecht 2021-02-03 103062889 way University College Utrecht 'Babel', 7, Campusplein, Rijnsweerd, Utrecht, Nederland, 3584ED, Nederland amenity university 0.471596680569804 Nederland nl Europe Western Europe
+international bar association 2021-02-03 300605690 node International Bar Association, Nassaulaan, Willemspark, Centrum, Den Haag, Zuid-Holland, Nederland, 2514JT, Nederland office association 0.301 Nederland nl Europe Western Europe
+university medical center utrecht 2021-02-03 237959191 way Universitair Medisch Centrum Utrecht, Lundlaan, Utrecht, Nederland, 3584EA, Nederland amenity hospital 0.413179143195807 Nederland nl Europe Western Europe
+tilburg university 2021-02-03 99323909 way Tilburg University, Universiteitslaan, West, Tilburg, Noord-Brabant, Nederland, 5037AB, Nederland amenity university 0.626171455933285 Nederland nl Europe Western Europe
+vu university amsterdam 2021-02-03 94052906 way Vrije Universiteit, Campusplein, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland amenity university 0.576914729576358 Nederland nl Europe Western Europe
+netherlands 2021-02-03 258635389 relation Nederland boundary administrative 0.829416895369094 Nederland nl Europe Western Europe
+smos 2021-02-03 86360011 way Derk Smoeslaan, Sluitersveld, Almelo, Overijssel, Nederland, 7603SX, Nederland highway residential 0.1 Nederland nl Europe Western Europe
+ema 2021-02-03 302037271 node European Medicines Agency, 6, Domenico Scarlattilaan, Drentepark, Zuid, Amsterdam, Noord-Holland, Nederland, 1083HS, Nederland office government 0.49651736792561 Nederland nl Europe Western Europe
+x-tek systems 2021-02-03 153550698 way Aerotek / Tek Systems, Maria Montessorilaan, Rokkeveen, Zoetermeer, Zuid-Holland, Nederland, 2719DB, Nederland building yes 0.201 Nederland nl Europe Western Europe
+max planck institute for psycholinguistics 2021-02-03 157832152 way Max Planck Institute for Psycholinguistics, Comeniuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525XD, Nederland office research 0.828369791841981 Nederland nl Europe Western Europe
+wageningen university 2021-02-03 235168671 way Wageningen University & Research, Bornsesteeg, Wageningen, Gelderland, Nederland, 6708PE, Nederland amenity university 0.285440647712364 Nederland nl Europe Western Europe
+university of amsterdam 2021-02-03 130755668 way Amsterdam University College, Science Park, Oost, Amsterdam, Noord-Holland, Nederland, 1098 XG, Nederland office educational_institution 0.458218474293395 Nederland nl Europe Western Europe
+ams 2021-02-03 95519693 way Luchthaven Schiphol, Badhoevedorp, Haarlemmermeer, Noord-Holland, Nederland aeroway aerodrome 0.53820282267208 Nederland nl Europe Western Europe
+acta 2021-02-03 96616441 way ACTA, 3004, Gustav Mahlerlaan, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland, 1081LA, Nederland amenity college 0.290508362962683 Nederland nl Europe Western Europe
+cosine 2021-02-03 46849085 node Cosine, 36, Oosteinde, Warmond, Teylingen, Zuid-Holland, Nederland, 2361HE, Nederland office company 0.101 Nederland nl Europe Western Europe
+erasmus university 2021-02-03 153576820 way Erasmus University College, 1A, Nieuwemarkt, Stadsdriehoek, Centrum, Rotterdam, Zuid-Holland, Nederland, 3011HP, Nederland building university 0.201 Nederland nl Europe Western Europe
+twente 2021-02-03 46292871 node Twente, Saasveld, Dinkelland, Overijssel, Nederland, 7597KL, Nederland place region 0.546214416898128 Nederland nl Europe Western Europe
+america 2021-02-03 258614443 relation America, Horst aan de Maas, Limburg, Nederland boundary administrative 0.429260878198397 Nederland nl Europe Western Europe
+sab 2021-02-03 121229693 way Juancho E. Yrausquin Airport, The Road, Zions Hill, Saba, Nederland aeroway aerodrome 0.44859234613195 Nederland nl Europe Western Europe
+eindhoven university of technology 2021-02-03 86000613 way Technische Universiteit Eindhoven, 2, De Rondom, Centrum, Eindhoven, Noord-Brabant, Nederland, 5600MB, Nederland amenity university 0.550731319596144 Nederland nl Europe Western Europe
+netherlands cancer institute 2021-02-03 790330 node Antoni van Leeuwenhoek, 121, Plesmanlaan, Park Haagseweg, Amsterdam, Noord-Holland, Nederland, 1066CX, Nederland amenity hospital 0.250254845255209 Nederland nl Europe Western Europe
+university medical center groningen 2021-02-03 183063420 way Universitair Medisch Centrum Groningen, 1, Hanzeplein, UMCG, Centrum, Groningen, Nederland, 9713GZ, Nederland amenity hospital 0.4277684953714 Nederland nl Europe Western Europe
+radboud university nijmegen 2021-02-03 85314411 way Radboud Universiteit, Erasmuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525 EX, Nederland amenity university 0.652553099500867 Nederland nl Europe Western Europe
+european medicines agency 2021-02-03 302037271 node European Medicines Agency, 6, Domenico Scarlattilaan, Drentepark, Zuid, Amsterdam, Noord-Holland, Nederland, 1083HS, Nederland office government 0.79651736792561 Nederland nl Europe Western Europe
+greenpeace international 2021-02-03 27171707 node Greenpeace International, 5, Ottho Heldringstraat, Westlandgracht, Nieuw-West, Amsterdam, Noord-Holland, Nederland, 1066AZ, Nederland office ngo 0.722713711460203 Nederland nl Europe Western Europe
+university of twente 2021-02-03 164997651 way ITC - Faculty of Geo-Information Science and Earth Observation, 99, Hengelosestraat, Schuttersveld, Enschede, Overijssel, Nederland, 7514, Nederland amenity university 0.330361546636441 Nederland nl Europe Western Europe
+radboud university in nijmegen 2021-02-03 85314411 way Radboud Universiteit, Erasmuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525 EX, Nederland amenity university 0.652553099500867 Nederland nl Europe Western Europe
+vrije universiteit amsterdam 2021-02-03 258889678 relation VU Hoofdgebouw, 1105, De Boelelaan, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland, 1081 HV, Nederland amenity university 0.101 Nederland nl Europe Western Europe
+bosch 2021-02-03 258171058 relation 's-Hertogenbosch, Noord-Brabant, Nederland boundary administrative 0.667476382537589 Nederland nl Europe Western Europe
+university of leiden 2021-02-03 259157980 relation Universiteit Leiden, Einsteinweg, Leiden Bio Science Park, Leiden, Zuid-Holland, Nederland, 2333CE, Nederland amenity university 0.688163620893378 Nederland nl Europe Western Europe
+state administration of traditional chinese medicine 2021-02-03 46941197 node Traditional Chinese Medicine, Bos en Lommerweg, Landlust, West, Amsterdam, Noord-Holland, Nederland, 1055DL, Nederland amenity pharmacy 0.301 Nederland nl Europe Western Europe
+royal netherlands meteorological institute in de bilt 2021-02-03 103104578 way 297, KNMI, De Bilt, Utrecht, Nederland, 3731GA, Nederland landuse commercial 0.4 Nederland nl Europe Western Europe
+radboud university 2021-02-03 85314411 way Radboud Universiteit, Erasmuslaan, Heijendaal, Nijmegen-Midden, Nijmegen, Gelderland, Nederland, 6525 EX, Nederland amenity university 0.552553099500867 Nederland nl Europe Western Europe
+european space research and technology centre 2021-02-03 296384894 way European Space Research and Technology Centre, Noordwijk, Zuid-Holland, Nederland, 2201AZ, Nederland landuse commercial 1.01579756663961 Nederland nl Europe Western Europe
+utrecht university 2021-02-03 61984253 node UU4U, Leuvenplein, Utrecht, Nederland, 3584LA, Nederland tourism information 0.101 Nederland nl Europe Western Europe
+tesla motors 2021-02-03 32789620 node Tesla Motors, 29, Pieter Cornelisz. Hooftstraat, Museumkwartier, Amsterdam, Noord-Holland, Nederland, 1071BM, Nederland shop car 0.703999921130091 Nederland nl Europe Western Europe
+european research area 2021-02-03 296384894 way European Space Research and Technology Centre, Noordwijk, Zuid-Holland, Nederland, 2201AZ, Nederland landuse commercial 0.615797566639606 Nederland nl Europe Western Europe
+joint institute for vlbi 2021-02-03 53796048 node Joint Institute for VLBI ERIC, Oude Hoogeveensedijk, Lhee, Dwingeloo, Westerveld, Drenthe, Nederland, 7991, Nederland office research 0.401 Nederland nl Europe Western Europe
+nederland 2021-02-03 258635389 relation Nederland boundary administrative 0.929416895369094 Nederland nl Europe Western Europe
+national institute for subatomic physics 2021-02-03 105695325 way Nationaal instituut voor subatomaire fysica, 105, Science Park, Oost, Amsterdam, Noord-Holland, Nederland, 1098XG, Nederland office research 0.242327847659036 Nederland nl Europe Western Europe
+erasmus mc 2021-02-03 45362830 node Erasmus MC, 230, 's-Gravendijkwal, Dijkzigt, Centrum, Rotterdam, Zuid-Holland, Nederland, 3015CE, Nederland place house 0.553558714867367 Nederland nl Europe Western Europe
+dunkin' donuts 2021-02-03 186353233 way Dunkin' Donuts, Amstelpassage, Centrum, Amsterdam, Noord-Holland, Nederland, 1012AB, Nederland amenity fast_food 0.660723093272883 Nederland nl Europe Western Europe
+centocor 2021-02-03 158634721 way Centocor, Einsteinweg, Leiden Bio Science Park, Leiden, Zuid-Holland, Nederland, 2333CD, Nederland building commercial 0.101 Nederland nl Europe Western Europe
+royal netherlands meteorological institute 2021-02-03 103104578 way 297, KNMI, De Bilt, Utrecht, Nederland, 3731GA, Nederland landuse commercial 0.2 Nederland nl Europe Western Europe
+leiden university 2021-02-03 259157980 relation Universiteit Leiden, Einsteinweg, Leiden Bio Science Park, Leiden, Zuid-Holland, Nederland, 2333CE, Nederland amenity university 0.688163620893378 Nederland nl Europe Western Europe
+wageningen university and research centre 2021-02-03 235168671 way Wageningen University & Research, Bornsesteeg, Wageningen, Gelderland, Nederland, 6708PE, Nederland amenity university 0.485440647712364 Nederland nl Europe Western Europe
+nib 2021-02-03 28452921 node NIBC Bank, 4, Carnegieplein, Zeeheldenkwartier, Centrum, Den Haag, Zuid-Holland, Nederland, 2517KJ, Nederland amenity bank 0.422734482343971 Nederland nl Europe Western Europe
+utrecht 2021-02-03 258519257 relation Utrecht, Nederland boundary administrative 0.729439910682055 Nederland nl Europe Western Europe
+university of delft 2021-02-03 138201041 way Technische Universiteit Delft, Mijnbouwstraat, Wippolder, Delft, Zuid-Holland, Nederland, 2628, Nederland amenity university 0.604534284533579 Nederland nl Europe Western Europe
+hague university of applied sciences 2021-02-03 172073582 way Haagse Hogeschool, 75, Johanna Westerdijkplein, Schipperskwartier, Laak, Den Haag, Zuid-Holland, Nederland, 2521EN, Nederland amenity college 0.325616522175778 Nederland nl Europe Western Europe
+best 2021-02-03 258000671 relation Best, Oirschot, Noord-Brabant, Nederland boundary administrative 0.556605514662107 Nederland nl Europe Western Europe
+european patent office 2021-02-03 99793708 way European Patent Office, Rijswijk, Zuid-Holland, Nederland landuse commercial 0.5 Nederland nl Europe Western Europe
+wageningen university and research 2021-02-03 235168671 way Wageningen University & Research, Bornsesteeg, Wageningen, Gelderland, Nederland, 6708PE, Nederland amenity university 0.485440647712364 Nederland nl Europe Western Europe
+aeolus 2021-02-03 144931633 way Aeolus, Westlandseweg, Vlaardingen, Zuid-Holland, Nederland, 3134JC, Nederland man_made windmill 0.26265143530573 Nederland nl Europe Western Europe
+kws 2021-02-03 124014428 way KWS, Botlek Rotterdam, Rotterdam, Zuid-Holland, Nederland landuse industrial 0.3 Nederland nl Europe Western Europe
+tno 2021-02-03 95537231 way TNO, Rijswijk, Zuid-Holland, Nederland, 2288GJ, Nederland landuse industrial 0.3 Nederland nl Europe Western Europe
+opcw 2021-02-03 82494868 node OPCW, 32, Johan de Wittlaan, Zorgvliet, Den Haag, Zuid-Holland, Nederland, 2517JR, Nederland place house 0.536046957362672 Nederland nl Europe Western Europe
+ambix 2021-02-03 54117879 node BENU Apotheek Ambix, 1a, Chopinstraat, Bunschoten-Spakenburg, Bunschoten, Utrecht, Nederland, 3752HR, Nederland amenity pharmacy 0.101 Nederland nl Europe Western Europe
+vrij nederland 2021-02-03 212385 node Vrij, Siebengewald, Bergen, Limburg, Nederland, 5853, Nederland place hamlet 0.45 Nederland nl Europe Western Europe
+synlogic 2021-02-03 52272358 node Synlogic, 1H, Branderweg, Westenholte, Zwolle, Overijssel, Nederland, 8042PD, Nederland office it 0.101 Nederland nl Europe Western Europe
+milky way 2021-02-03 155504451 way Melkweg, Lijnbaansgracht, Centrum, Amsterdam, Noord-Holland, Nederland, 1017PH, Nederland amenity theatre 0.413510524610342 Nederland nl Europe Western Europe
+international red cross and red crescent movement 2021-02-03 30304696 node Rode Kruis Ede, 30C, Klinkenbergerweg, Ede, Gelderland, Nederland, 6711MK, Nederland office ngo 0.688190127552538 Nederland nl Europe Western Europe
+medicines agency 2021-02-03 302037271 node European Medicines Agency, 6, Domenico Scarlattilaan, Drentepark, Zuid, Amsterdam, Noord-Holland, Nederland, 1083HS, Nederland office government 0.69651736792561 Nederland nl Europe Western Europe
+university of maastricht 2021-02-03 31891847 node University College Maastricht, De Bosquetplein, Maastricht-Centrum, Maastricht, Limburg, Nederland, 6211, Nederland amenity university 0.494548847777872 Nederland nl Europe Western Europe
+estec 2021-02-03 296384894 way European Space Research and Technology Centre, Noordwijk, Zuid-Holland, Nederland, 2201AZ, Nederland landuse commercial 0.415797566639606 Nederland nl Europe Western Europe
+leiden university medical center 2021-02-03 257776634 relation Leiden, Zuid-Holland, Nederland boundary administrative 0.719246276766776 Nederland nl Europe Western Europe
+vrije university 2021-02-03 94052906 way Vrije Universiteit, Campusplein, Zuidas Knowledge District, Zuid, Amsterdam, Noord-Holland, Nederland amenity university 0.576914729576358 Nederland nl Europe Western Europe
+iccat 2021-02-03 85440166 way Ingøya, Ingøy, Måsøy, Troms og Finnmark, Norge place island 0.26358119422997 Norge no Europe Northern Europe
+microsoft 2021-02-03 64154406 node Microsoft Development Center Norway, 2, Torggata, Hammersborg, St. Hanshaugen, Oslo, 0181, Norge office company 0.485675067916633 Norge no Europe Northern Europe
+bloomberg 2021-02-03 57874557 node Bloomberg, Stranda, Møre og Romsdal, Norge waterway waterfall 0.35 Norge no Europe Northern Europe
+oslo university hospital 2021-02-03 182954962 way Oslo universitetssykehus (Rikshospitalet), Sognsvannsveien, Gaustad, Nordre Aker, Oslo, 0372, Norge amenity hospital 0.599096455305557 Norge no Europe Northern Europe
+university of oslo's natural history museum 2021-02-03 84983285 way Botanisk hage, 1, Sars' gate, Sofienberg, Grünerløkka, Oslo, 0562, Norge tourism attraction 0.628069876897978 Norge no Europe Northern Europe
+institute of marine research 2021-02-03 134912435 way Havforskningsinstituttet, Nordnesgaten, Nordnes, Skuteviken, Bergenhus, Bergen, Vestland, 5005, Norge building office 0.324352223496241 Norge no Europe Northern Europe
+bi norwegian business school 2021-02-03 125421139 way Norwegian Air Shuttle, 3, Oksenøyveien, Fornebu, Bærum, Viken, 1366, Norge office company 0.59515363245564 Norge no Europe Northern Europe
+oslo metropolitan university 2021-02-03 257701514 way OsloMet – storbyuniversitetet, Falbes gate, Pilestredet park, St. Hanshaugen, Oslo, 0170, Norge amenity university 0.451332014915526 Norge no Europe Northern Europe
+norwegian institute of public health 2021-02-03 52153314 node Folkehelseinstituttet, Lovisenberggata, Lovisenberg, St. Hanshaugen, Oslo, 0456, Norge office government 0.001 Norge no Europe Northern Europe
+sputnik v 2021-02-03 126372392 way Sputnikveien, Kjellberg, Sandefjord, Vestfold og Telemark, 3224, Norge highway residential 0.3 Norge no Europe Northern Europe
+university of tromsø 2021-02-03 95993572 way Universitetet i Tromsø - Norges arktiske universitet, Gimlevegen, Breivika, Tromsø, Troms og Finnmark, 9019, Norge amenity university 0.534301779265404 Norge no Europe Northern Europe
+vae 2021-02-03 258997285 relation Vae, Gamvik, Troms og Finnmark, Norge natural water 0.3 Norge no Europe Northern Europe
+norway 2021-02-03 258434833 relation Norge boundary administrative 0.814696521978471 Norge no Europe Northern Europe
+eit 2021-02-03 23054719 node Eiet, Flesberg, Viken, Norge place farm 0.2 Norge no Europe Northern Europe
+university of oslo 2021-02-03 259041314 relation Universitetet i Oslo, Behrens’ gate, Briskeby, Frogner, Oslo, 0257, Norge amenity university 0.687044419782976 Norge no Europe Northern Europe
+fed 2021-02-03 53796092 node Fed, Sirdal, Agder, Norge place farm 0.3 Norge no Europe Northern Europe
+university of nottingham's school of biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+engineering fracture mechanics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international journal of surgery 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alaska supreme court 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sabin center for climate change law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scienceopen 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of sustainability and technology policy at murdoch university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federation of australian scientific and technological societies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wwf international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+toronto science policy network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of toronto mississauga 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulbenkian science institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for climate risk and opportunity management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us district court for the district of columbia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+solyndra of fremont 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nanosolar 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french institute for development research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new energy finance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ottawa hospital research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lux research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+interacademy panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+axios review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national climatological databank 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agency for science technology and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peruvian amazon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+southern african science service centre for climate and land management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unfcc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of statistics and information 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for amazonian scientific innovation at wake forest 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peruvian amazon research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international standard archival description 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+polar continental shelf program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york university medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of pennsylvania medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national commission for aerospace research and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vexag international workshop 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+orangutan foundation international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+innovative genomics institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+magiq technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research affairs at children's hospital boston 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national science advisory board for biosecurity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of oxford's wildlife conservation research unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marjan centre for the study of conflict & conservation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world society for the protection of animals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+la 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+san council of south africa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+regional aquatics monitoring program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alfred wegener institute for polar and marine research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+state council for nature conservation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+james martin 21st century school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+socio-environmental institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian institute of environment and renewable natural resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national council for research and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+xl catlin seaview survey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+libertarian party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal holloway, university of london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american astronomical society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american association for public opinion research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global wildlife conservation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+abdus salam international centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mtb/rif 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+staff disciplinary board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+disciplinary board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+utility solutions group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+salton sea authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international journal of oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard-smithsonian center for astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard pilgrim health care 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national oceanic and atmospheric administration's cooperative institute for climate and satellites 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard pilgrim 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for marine microbiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of british columbia fisheries centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian parliament 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pacific salmon commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national health and medical research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+affymetrix 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chesapeake bay program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of maryland's chesapeake biological laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+blue plains advanced wastewater treatment plant 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+reproducibility project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cambridge analytica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of ovarian research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rossiyskaya gazeta 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+translational medicine division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for microbial ecology and genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national university of distance learning 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national key laboratory of medical immunology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+radiation studies board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+magenta therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for ornithology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eth bioenergia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian renewable energy company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+george church of harvard medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us army medical research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for conservation biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+menafrivac 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african elephant coalition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for research on adaptive nanostructures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society for reproductive medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+spitzer space telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international emissions trading association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ukrainian association of reproductive medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+allied democratic forces 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+africa carbon forum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+xishuangbanna tropical botanical garden 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who world mental health survey consortium j. am 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+soas china institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swiss federal institute of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google life sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+paris institute of geophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tsunami research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california geological survey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese science publishing and media 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+korea ocean research & development institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+moderna therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beijing national laboratory for molecular sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of allergy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia centre for excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+san raffaele telethon institute for gene therapy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stockholm environment institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swedish research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research policy institute at lund university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science and public policy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+usgs volcano hazards program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tech inquiry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre of excellence for coral reef studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world register of marine species 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federation of young scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+autonomous university of madrid 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+redwood coast watersheds alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for geophysics and volcanology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international continental scientific drilling program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german science foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kite pharma of santa monica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rbc capital markets 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+real time system for detection of deforestation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+imazon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pebble bed modular reactor 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pbmr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jülich research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+warren p. knowles professor of law & bioethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+james madison program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+petrie-flom center for health law policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national academies' human embryonic stem cell research advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council on bioethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+obama executive order 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+circuit court of appeals for the district of columbia circuit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science philanthropy alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kavli foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pathway genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national cancer institute at the national institutes of health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european biological rhythms society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ebrs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for undersea science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+louisiana universities marine consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yalu aboriginal corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+northern hemisphere 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us naval research laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astrophysical journal letters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american physical society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+psl research university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national academy of engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese ministry of education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nanjing agricultural university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of social sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of mammalogy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard university center for the environment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google mail 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mozilla online 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mozilla corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international fertilizer development centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of nottingham medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+george institute for international health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford university herbaria 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of maryland's horn point laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+schistosomiasis control initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+synaptic leap 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ukraine international airlines 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ontario cancer institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature chemical biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national cancer moonshot 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research institute and natural history museum of senckenberg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+immunotherapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genomic data commons 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+forum for biotechnology and food security 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for scientific values 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research centre for plant biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for quantum computation and communication technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biotech news 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house of lords science and technology committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coalition for gm free india 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+social science electronic publishing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+austrian academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+horizon quantum computing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of washington's national primate research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international renewable energy agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+breast cancer laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+integrated vessel tracking decision support tool 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for cetacean research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sea shepherd conservation society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shonan maru 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of south florida college of marine science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for communicable diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european grid infrastructure federated cloud 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british journal of psychiatry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mail & guardian 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african biotechnology stakeholders forum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national agricultural research laboratories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+waitlist zero 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national banana research programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hercules chemical company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jinggangshan university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american astronomical society's division for planetary science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese national health commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of optics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global preparedness monitoring board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+acta crystallographica section e 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research ethics and integrity program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jinggangshang university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of science technology and society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pierre louis institute of epidemiology and public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american astronomical society's division for planetary sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+urologic oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arctic oscillation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rapid response research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european project for ice coring 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for alternatives to animal testing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+synthetic genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international committee on taxonomy of viruses 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+social psychological and personality science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+restriction of chemicals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pacific research group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+einstein college of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+san diego zoo global 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bloomberg news 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american college of veterinary internal medicine forum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aratana therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us geological survey's national wildlife health center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national engineering research center for the emergence drugs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tucson gem 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnr institute for neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+raptorex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal environment agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clean air action group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hungarian academy of science's institute of materials and environmental chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+academy's research institute for soils science and agricultural chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intergovernmental panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+berkeley's museum of vertebrate zoology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for synthetic biology and innovation at imperial college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university-national oceanographic laboratory system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laser interferometer gravitational-wave observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international center for agricultural research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulf's flower garden banks national marine sanctuary 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+florida atlantic university's harbor branch oceanographic institute in fort pierce 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global rust reference center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+copernicus atmosphere monitoring service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of pennsylvania's institute for translational medicine and therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science translational medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+itmat 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientific research publishing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for the management of medical technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of modern physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientific research's journal of biophysical chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientific research journal psychology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+systematic entomology lab 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biophysical chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+springer india 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of versailles saint quentin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+whitehead institute for biomedical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+greenpeace china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of north carolina school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+school of civil and construction engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+collider detector 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us food and drug association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african physical society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house committee on science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hepap 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih's office for portfolio analysis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+goddard institute for space studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+herschel space observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+animal defenders international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national climatic data center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+terravision exploration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+protein sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for digital archaeology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ma'arra mosaic museum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+competitive enterprise institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pharmaventures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+regional development agencies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+katz, marshall & banks 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johnson & johnson pharmaceutical research & development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neurologix 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+santa cruz biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+santa cruz biotech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sequenom 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy and resources institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us federal emergency management agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american physiological society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy and sustainable development analysis centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+planetary defense coordination office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+darwin biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council of canadian academies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+working group on himalayan glaciology of the international commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world glacier monitoring service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carnegie institution for science in stanford 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian council of research integrity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+prevention and public health fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lcross 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+granite capital international group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+epa's office of air and radiation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+white house council on environmental quality 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european scientific working group on influenza 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shanghai institute of materia medica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+palomar transient factory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+james s. mcdonnell foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coalition for national science funding 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+health protection agency of pavia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+osf preprints 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tcga 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+egfr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of texas m. d. anderson cancer center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+glioblastoma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mapk 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national cancer institute's neuro oncology branch 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for technology innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yale project on climate change communication 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+turkish council of higher education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+twilight zone ocean network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of university councils 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nordic cochrane centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+archives of internal medicine and annals of internal medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kurdistan workers' party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council of science editors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tehran university to ayatollah khamenei 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human rights foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+turkish higher education board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+j. craig venter institute's global ocean sampling expedition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of geophysical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuffield council on bioethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for science diplomacy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+latin american school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for genetic engineering and biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+finlay institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+csic institute of public goods 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of british columbia's fisheries centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cuban academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences wuhan institute of virology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for health and clinical excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cancer voices australia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+abpi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ldeo 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of health economics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+grantham foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stanford law school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for science policy research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+school of earth and atmospheric sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science-metrix 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientometrics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iter council working group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ipcc working group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+u.s. national academies of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+time magazine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+attestation commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+civil movement for support of bulgarian science and education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gsi helmholtz centre for heavy ion research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research funds 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for environmental protection and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for molecular biology and biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fall meeting of the american geophysical union 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ragon institute of massachusetts general hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of emerging infections 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us chemical safety board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+james martin center for nonproliferation studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+foundation for strategic research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+school of medicine at washington university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hfcs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+saga investments 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world meteorological organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for quality and efficiency in health care 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house energy and commerce committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intergovernmental panel on climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pink bollworm rearing facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of michigan law school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mayo collaborative services v. prometheus laboratories, inc. 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+2013 association for molecular pathology v. myriad genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geological society of america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean research & conservation association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of ocean exploration and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bureau of ocean energy management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+netherlands national institute for public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+board of land and natural resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced international joint stock company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+solazyme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bioglobe 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international commission on missing persons 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of environmental toxicology and chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dalla lana school of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of pretoria's genomics research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world energy outlook 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japan international research center for agricultural sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+civil protection agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european centre for training and research in earthquake engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+plos genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+san diego school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of american universities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research excellence framework 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stfc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+trinity partners 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tarveda therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+onex corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulf ecology division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wicell research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national stem cell bank 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wicell 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international consortium of investigative journalists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for public integrity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biotechnology industry organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese neuroscience society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+public patent foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of university technology managers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national office for technology acquisition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for genome sciences and policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+secretary's advisory committee on genetics, health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+maryland trump 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marshall space flight center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+solar dynamics observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national oceanic and atmospheric administration's space environment center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vanderbilt university school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+school of informatics and computing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+borneo nature foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+massachusetts institution of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technical review panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+great lakes bioenergy research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national development and reform commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american economic review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us association for women in science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+usda-ars bee biology and systematics laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gcrf 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of michigan medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+physical review physics education research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+time-space reference systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+burnham institute for medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aaas science policy fellow 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of north carolina chapel hill center for aids research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nobel prize committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cellular dynamics international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alliance for regenerative medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tanzania academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national oceanic and atmospheric administration's coral reef watch 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aruna biomedical 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+edcarn 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japanese cancer association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+antarctic ocean alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+george mason center for climate communication 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american association for cancer research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yale project on climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+erwin schrödinger institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gilead sciences of foster city 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hiv vaccine trials network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+visiopharm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national toxicology program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pennington biomedical research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department for business, energy and industrial strategy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+boston health care for the homeless program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national academy of sciences decadal survey of astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+orbiting carbon observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of energy's office of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us global change research program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy frontier research centers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+james webb space telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+space studies board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean observatories initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+glxp 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced research projects agency-energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zimbabwe academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+observer research foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federation of archaeological managers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical research council of zimbabwe 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zimbabwe young academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz institute of marine sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wuhan university of bioengineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+small research grant 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+museum of eastern carpathians 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international human epigenome consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world ocean atlas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human genome project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+roadmap epigenomics program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international cancer genome consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+norris comprehensive cancer center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aosis publishing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+salk institute for biological studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ucl great ormond street institute of child health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stern review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+barcode of life 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+defense meteorological satellite program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american chemistry council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa goddard space center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for environmental health sciences in research triangle park 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa astrobiology research fellow 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+benefit people and society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+commonwealth scientific and industrial research organisation's health and biosecurity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us bureau of ocean energy management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lucella biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sesame scientific advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian council of agricultural research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian network for climate change assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations' intergovernmental panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nixon peabody 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global policy research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+foundation for biotechnology awareness and education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agricultural research cooperation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for research resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ncrr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stamina foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for translational medicine and therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+solstice mission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pew environment group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international union for conservation of nature red list 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+february us department of energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nicolaus copernicus astronomical center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lund observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mediterranean agronomic institute of bari 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk medicines and healthcare regulatory agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mhra 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kaiser wilhelm institute for physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quaternary international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+north hessian society of prehistory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural history museum schloss bertholdsburg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us arctic research commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hamburg university of applied sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+elon musk of spacex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dutch ministry of education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for war documentation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tauri group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science and technology argentina 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+virgin galactic 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french agricultural research centre for international development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human research program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins university school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zapata swamp captive breeding farm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa deep space network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+boeing aerospace 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+suborbital research program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cambridge university hospitals nhs foundation trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for interdisciplinary computational and dynamical analysis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national union of students 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for experimental medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yerevan physics institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian institute for theoretical astrophysics in toronto 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+avogadro project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+the george institute for international health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mclaughlin-rotman center for global health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association for computing machinery 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african network for drugs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ge healthcare of chalfont st giles 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+novocell of san diego 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard stem cell institute for research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of virginia school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british columbia centre for aquatic health sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+haitian mines and energy bureau 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+voilà foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european competitiveness council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research center borstel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+free university of berlin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iter organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french national centre for scientific research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ion pgm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european council of ministers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eighth framework programme of research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seismological society of america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal society of canada 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for molecular cell biology and genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+highwire press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google books 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+okeanos explorer 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mit alliance for research and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+free university of brussels 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+critical assessment of genome interpretation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+t.h. chan school of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+the american psychiatric association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+statistical manual of mental disorders 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of science,technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british ecological society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+morningside group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new england journal of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us small business innovation research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+maharashtra hybrid seeds company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institut de physique du globe 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+numonyx of rolle 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council of advisors on science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california climate science and solutions institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+john muir institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+monsanto biotech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genetic engineering approval committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us centers for disease prevention and control 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for climate services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal society journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk strategic defence and security review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cancer research uk cambridge institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint medical command 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+philosophical transactions of the royal society b 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+partnership for biomedical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of water resources and hydropower research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stanford university school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mitsubishi h-iia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+prodigy biosystems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hudsonalpha institute for biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hudsonalpha institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+children's cancer institute australia for medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pompeu fabra university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oecd science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lilly asian ventures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cancer genome atlas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum photovoltaics group at imperial college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+albert einstein college of medicine of yeshiva university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cyberspace administration of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french society of developmental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amazonian tall tower observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford nanopore technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+libel reform campaign 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australasian virology society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hust-suzhou institute for brainsmatics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+plos biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+atmospheric chemistry and physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+optical society of america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house appropriations subcommittee on energy and water development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intellia therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for climate economics and policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+operation warp speed 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mrc network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint institute for laboratory astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hong kong university's school of chinese medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genomics and bioinformatics research unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese association of traditional chinese medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us department of agriculture's agricultural research service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+digital life summit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national health and nutrition examination 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american chemical council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national climatic data center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arivale 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+large high altitude air shower observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+atomic energy of canada limited 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mit energy conference 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+un intergovernmental panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international journal of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of washington's institute for health metrics and evaluation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+asian cancer research group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mertz glacier 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+omrf 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bloomberg new energy finance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international conference on high energy physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tass russian news agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ge hitachi nuclear energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of sciences and technology of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bloomberg nef 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+patent public advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fifth ministerial conference on environment and health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stanford eugenics history project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnrs centre for cognitive neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human fertilisation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for immunisation research and surveillance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chilean navy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tor vergata university of rome 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swiss mummy project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+supreme council of antiquities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ptwc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german research centre for geosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute laue-langevin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+americans for medical advancement 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dryden research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eli eric 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+holtzbrinck group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins kimmel cancer center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cabell's international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world university rankings 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sternberg museum in hays 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ireg observatory on academic rankings and excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consortium for higher education and research performance assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swiss state secretariat for education and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japanese high energy accelerator research organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heritage innovation preservation institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+africa regional certification commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute on aging's laboratory of neurosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+argos therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association for assessment and accreditation of laboratory animal care 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leatherback trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal register 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vienna science and technology fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuclear posture review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national nuclear security administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean sciences meeting 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of global ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human genome diversity project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research council's institute of cognitive sciences and technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british chiropractic association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cryogenic underground observatory for rare events 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us department of energy and national science foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bittorrent 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+academy of military sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amyris biotechnologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for a new american security 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oie reference laboratory for rabies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hubble space telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international census of marine microbes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck society's fritz haber institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulf of maine research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clinical trials cooperative group program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cambridge healthtech institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+meningitis vaccine project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us equal employment opportunity commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united campus workers of georgia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dendreon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of pittsburgh school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york university's langone medical center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+celldex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international center for lightning research and testing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french league for the protection of birds 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+crispr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk bioindustry association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brian sciences unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+academy of motion picture arts and sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+editas medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sangamo biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oklahoma corporation commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who collaborating centre for reference and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih fogarty international center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for the study of reproduction 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mrc national institute of medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wentworth group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+organisation for the prohibition of chemical weapons 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+north-east pacific time-series 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+moon express of cape canaveral 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international space exploration coordination group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eutr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+christian abee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european parliament intergroup 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lunar palace 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for health equity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal institute for risk assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+welfare and conservation of animals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uganda national academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jrc's institute for health and consumer protection 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arab gulf states institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientists for palestine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coin sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for global health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alaska regional research vessel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african network for drugs and diagnostics innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+berry consultants 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heliophysics division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+target malaria 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+robert koch institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+people yale 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of science and technology and department of biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+latin american council of social sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aids programme of research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national seismological service of mexico 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european geosciences union 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bangladesh rural advancement committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+abdul latif jameel poverty action lab 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deep space climate observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gairdner foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dscovr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+anatomy and genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for safe medication practices in horsham 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+imperial college london's grantham institute for climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alpha magnetic spectrometer 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+duke university's margolis center for health policy in durham 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of vertebrate paleontology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china cdc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal tyrrell museum of palaeontology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+met office's london volcanic ash advisory centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate and atmosphere department of the norwegian institute for air research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stony brook cancer center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rotem sorek 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+met office's facility for airborne atmospheric measurements 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rock art institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of toulouse-jean jaurès 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+emile cartailhac prehistoric art research and study center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research roaming gm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of toulouse-paul sabatier 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lurie children's hospital and northwestern university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian nuclear science and technology organisation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iltoo pharma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ksar akil 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+campaign for science and engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard university press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal new zealand air force 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+commission for the geological map of the world 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ross island wind farm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+policy cures research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+st petersburg university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ioffe physico-technical institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york air national guard 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+congolese ministry of health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ras institute of molecular genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+congolese national biomedical research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+newlink genetics of ames 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+antarctic support contract 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national cancer institute of canada 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french national assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+terrestrial ecosystem research network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ecological research network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american federation for aging research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute on aging 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+michalski hüttermann & partner 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nia-sponsored interventions testing program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+convention on international trade in endangered species 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china academy of chinese medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national natural science foundation of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ras institute for nuclear research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ras institute for information transmission problems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mectizan donation program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+merck institute for therapeutic research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clack paper 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clean energy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carnegie institution for science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+accountability in research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african population and health research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society for microbiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of internet researchers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for scientific and technological research of san 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+banner alzheimer's institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mexican national academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum technology flagship 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for the science of light 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk national quantum technologies programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for integrated quantum science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of paris south 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astroparticle physics european consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google translate 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+allen institute for artificial intelligence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us district court of the district of columbia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical products agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+penn vet working dog centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of universities for research in astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+covid advisory board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bioindustry association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kavli institute for astronomy and astrophysics at peking university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human frontier science program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hfsp 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian institutes of health research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural sciences and engineering research council of canada 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+afghan taliban 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wharton risk center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+board of scientific counselors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+status of women in astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nserc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian foundation for climate and atmospheric sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+social sciences and humanities research council of canada 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for vaccine development and global health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate change authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pacific institute for climate solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university hospital for psychiatry zurich 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+group of eight 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute of molecular plant physiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arabidopsis information resource 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+plant genome research program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+division of molecular and cellular biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+georgetown university's climate center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nicholas institute for environmental policy solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+paris-saclay institute of neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate and clean energy program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+interacademy council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal university of rio grande do norte 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for molecular medicine finland 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of nice sophia antipolis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cotec foundation for innovation in madrid 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+people's solidarity for participatory democracy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+st lawrence river institute of environmental sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global crop diversity trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us energy department's office of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for health and welfare 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global alliance for vaccines 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+norwegian academy of science and letters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fusion power associates 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+convention on international trade in endangered species of wild fauna 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard open access project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mithril capital management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american enterprise institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research council of the swiss national science foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+buzzfeed news 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+respondent 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california observatories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+newclimate institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate science centers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for international climate and environmental research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of molecular and clinical ophthalmology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research institute for mathematical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biodigitalvalley 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american college of cardiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leerink partners 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sex differences and implications for translational neuroscience research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us institute of medicine's forum on neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of neurochemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature geoscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+reduction of animals in research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+polish academy of sciences' institute of physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chandra x-ray observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of washington school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hodge jones & allen solicitors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for astrophysics and space science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us department of defense's defense advanced research projects agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+defense threat reduction agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for advancing translational sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hartebeeshoek radio astronomy observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+celldex therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+long term educational reform and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peking university's school of life sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tsinghua university's school of life sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+renmin ribao 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gbsi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of scientific and technical information of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international cell line authentication committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gavi alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international finance facility for immunisation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+essential medicines campaign 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of neurological disorders 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national center for biotechnology information 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astrophysical multimessenger observatory network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university college london's institute for sustainable resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+un intergovernmental panel on climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+smithsonian center for astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+teva pharmaceuticals industries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gruber foundation cosmology prize 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for biotechnology information 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinabio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national human genome research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+novo nordisk foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+higher education funding council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+great lakes fishery commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental defense fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of informetrics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for evolutionary anthropology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of archaeology and ethnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human connectome project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia university's lamont-doherty earth observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tdcs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british association for psychopharmacology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+physical sciences research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japan society for the promotion of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+são paulo state university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japan science and technology agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+epsrc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+haereticus environmental laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coral reef laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of paraíba valley 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+l'oréal's research & innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+catholic university of brasilia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+catholic university of dom bosco 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+focac 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mcti 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national council for scientific and technological development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national science and technology institutes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biosafety council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european molecular biology organization installation grant 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+evaluation of graduate education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian federal agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bosch research and technology center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of primatology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+attosecond science laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+optical infrared coordination network for astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+congressional budget office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federation of american societies for experimental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+generic pharmaceutical association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california's lick observatory on mount hamilton 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us society for neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esa coordination office for the scientific programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nyu) cancer institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national nanotechnology initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national knowledge network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environment research agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global forest resources assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of utah research foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+entomological society of america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of zhejiang university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for global tobacco control 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pew charitable trusts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+redfield consulting 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american cancer society cancer action network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+acta genetica sinica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rocky mountain tree-ring research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california initiative for advancing precision medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california blueprint for research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+foundation for applied molecular evolution 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for biomedical informatics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+public employees for environmental responsibility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national oceanographic and atmospheric administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+navdeep bains 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+economic and social research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for science, society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ecosystem services for poverty alleviation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+partnership group for science and engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biospheric sciences laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bionano interactions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for catastrophic loss reduction 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european strategy forum on research infrastructures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research infrastructures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european research area board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of universities and colleges of canada 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nrdio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kalahari minerals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japanese nuclear safety commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuclear energy steering committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+citizens' nuclear information center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for marine biodiversity and conservation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nagpra 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of michigan museum of anthropology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american association of physical anthropology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national nagpra 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iaph 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for american archaeology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cell therapy group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for biology of ageing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of southern california's longevity institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oncolytics biotech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arizona board of regents 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consultative group on international agriculture research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alamogordo primate facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+breakthrough science society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+southwest national primate research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cleantech group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us chimpanzee health improvement 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+three-north shelter forest program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international cellular medicine society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+first conference of ministers responsible for meteorology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american association of physical anthropologists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national bio-safety laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural environment research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+korea environment corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for prevention of preterm birth 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chilean society for cell biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fundación ciencia & vida 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council of scientific societies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for science communication 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+andrés bello university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese national astronomical observatories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national health and family planning commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+u.s. foundation response 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climateworks foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china building materials academy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+william and flora hewlett foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+asian cities climate change resilience network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental grantmakers association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute on drug abuse 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shaanxi provincial engineering and technology research center for shaanbei cashmere goats 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature's scientific reports 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guangzhou institutes of biomedicine and health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society for clinical investigation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+open-access publishing equity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rockefeller university press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scholarly publishing roundtable 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard's office for scholarly communication 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clean water institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of science and technology policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of american publishers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ostp 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford university press and nature publishing group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+berkeley global science institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+embo journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature publishing group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society for human genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' strategic priority program on space science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european food information council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+drosophila species stock center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+polytechnic university of marche 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oskar klein centre for cosmoparticle physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced research projects agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sloan school of management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house committee on appropriations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unum therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us nuclear posture review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+olympic winter games bid committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cayman trough 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ethiopian academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american wind energy association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+symyx technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+symyx 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+children's choir of île-de-france 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+faseb 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american association of university professors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of inspector general for the department of health and human services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint institute for nuclear research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+woods hole oceanographic institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national oceanographic and atmospheric administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cooperative institute for research in environmental sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+catholic university of louvain 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+london school of economics' grantham research institute on climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lisbon treaty 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eurogroup for animals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+understanding animal research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international centre for climate change and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global climate and energy initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+congress, press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global security at los alamos national laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+atmospheric dynamic mission aeolus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rapid climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laboratory of dynamic meteorology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+synthetic biology standards consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hitachi advanced research laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pierre simon laplace institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world premier international research centers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eligo bioscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council for science and technology policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international data rescue 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national science foundation gulfstream 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+friends of cancer research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical research council laboratory for molecular cell biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consultative group on international agricultural research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for agricultural research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+boldlygo institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+venice time machine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intelligence advanced research projects activity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of naval research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+origen power 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german federal criminal police office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+riken interdisciplinary theoretical and mathematical sciences program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+borneo futures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+school for advanced studies in social sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+organovo of san diego 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+presidential commission for the study of bioethical issues 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national science advisory board for biosecurity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of schools and programs of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senate judiciary committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house of representatives' judiciary committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+state council of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for innovation law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cape wind associates 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+massachusetts institute of technology's sloan school of management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vision sciences society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+weill cornell medicine institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british atmospheric data centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+troitsk institute of innovative and thermonuclear research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+howard hughes medical institute's janelia farm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hawaii institute of marine biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+operational environmental satellites 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international trade in endangered species of wild fauna 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of plant biologists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced camera for surveys 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+imperial cancer research fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+howard hughes medical institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+netherlands environmental assessment agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american journal of clinical nutrition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deutsch williams brooks derensis & holland 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy department's carbon dioxide information analysis center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+integrated carbon observation system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for scholarly publishing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+calnex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cdiac 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+martin luther university of halle-wittenberg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laboratory for climate sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+emissions database for global atmospheric research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international centre for trade and sustainable development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european patent forum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japan association of high energy physicists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hdp assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bioacademy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of electronic structure and laser 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deep underground science and engineering laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ross mpa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iarpa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cortical networks 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dokuz eylül university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of canadian universities for research in astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tmt international observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ucl's institute of child health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us energy information administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of industry and information technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global biodiversity outlook 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for marine research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shenzhen hepalink pharmaceutical company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of national marine sanctuaries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association of scientific 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coalition for responsible sharing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sony pictures entertainment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yunnan agricultural university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french polar institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china meteorological administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum circuits 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+high court of eastern denmark 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dcsd 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swiss federal institute of technology of lausanne 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+constellation observing system for meteorology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of civil affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kunming institute of botany 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+earthwatch institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+el niño/southern oscillation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shanghai mental health center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk nuclear industry association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for neurobiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of public and environmental affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china american psychoanalytic alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stanley center for psychiatric research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peking university institute of mental health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature mater 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national academy of engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international human epigenome consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global health group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of minnesota's center for infectious disease research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+support research integrity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seismological research letters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+duke university school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+volcano disaster assistance program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate investigations center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations intergovernmental panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hubble space telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+goddard spaceflight center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+flanders marine institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new haven as mirror worlds technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unsilo of aarhus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international health management associates 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for disease dynamics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+levin institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of chinese bioscientists in america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kavli institute for systems neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+acorda therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal danish academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for international earth science information network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world climate research programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international oceanographic commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+butantan institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+minerals management service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard's edmond j. safra center for ethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jinko solar 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+osi pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+un mission for ebola emergency response 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+68th world health assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kaiser family foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world health organization's international agency for research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+colorado state university libraries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national council for science, technology and technological innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+san ignacio de loyola university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new england anti-vivisection society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+london natural history museum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leavy, frank & delaney 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association for women in science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+korea food and drug administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rnl bio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+niust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of nuclear and energy research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+e. s. grant mental health hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rnl sunrise regenerative medical center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for neuroregeneration research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nobel committee for physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+influenza virus research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clemson university restoration institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+musashi-murayama 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international lunar network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chimerix of durham 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leerink swann & company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for health and unification studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian research centre for urban ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of urban ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+extremes sustainability research network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+novartis institutes for developing world medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house of representatives' energy & commerce committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medicines for malaria venture 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international cancer gene consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global carbon project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+smithsonian institution's sackler gallery 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ecohealth alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eisai pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of florida college of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of american prehistory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+forest products association of canada 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+northshore research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+forest products association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pew environment group's international boreal conservation campaign 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal society journals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian carbon program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cary institute of ecosystem studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national academies of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for immunotherapy of cancer 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international scientific committee for tuna 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+macarthur foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research institute of far seas fisheries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pacific bluefin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german institute for international and security affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+henri poincaré institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global lunar conference 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kimmel center for archaeological science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bgi americas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint research centres 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canada excellence research chairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+supercomputing centre of galicia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cornell university center for advanced computing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central pacific fisheries commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+epiphany biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biomolecular resources research infrastructure 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bnef 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+piramal healthcare solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iupac 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esa's space situational awareness programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa solar 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bear specialist group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cas research centre for eco-environmental sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european biomedical research association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swedish institute of space physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american school of oriental research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marine sciences institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+infectious disease society of america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ibm watson health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural sciences and engineering research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+integrating data for analysis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature biomedical engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shenzhen center for disease control and prevention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of american medical colleges 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+venter group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geneticist george church of harvard university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wikipedia science conference 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gravitational-wave observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iaea research reactor section 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientific method (cambridge univ 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international mouse phenotyping consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international center for research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of cambridge 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute on deafness 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alberta energy regulator 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk medical research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+glaxosmithkline 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technical university of dresden 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for global health & infectious diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+psychiatric genomics consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+charity equality challenge unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center of scientific research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california irvine school of medicine and school of law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+policy nuclear 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pubmed central and google 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stratospheric observatory for infrared astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+grinnell resurvey project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mendeley 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean giants program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national incident command's flow rate technical group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wilkinson microwave anisotropy probe 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+south africa's kwazulu-natal research institute for tuberculosis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biodiversity and ecosystem services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pubmed health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural machines 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esa ecological monographs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+duke canine cognition center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ditsong national museum of cultural history 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+asset owners disclosure project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian astronomy data centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+casa sollievo della sofferenza research hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for integrative and comparative biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astrophysical journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astrophysics journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+theoretical astrophysics center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national department of mineral production 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cretaceous research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gondwana research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard medical school's joslin diabetes center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uppsala university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences xishuangbanna tropical botanical garden 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for international climate research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+noaa arctic research program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tissue culture core facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lineberger comprehensive cancer center of the university of north carolina 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international journal of cancer 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+anglo-american press association of paris 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of texas medical branch 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international school for advanced studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences institute of zoology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international stem cell corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental dynamics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+daegu gyeongbuk institute of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian quantum center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+panchromatic hubble andromeda treasury 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geophysical research letters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carnegie mellon's robotics institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national agriculture and food research organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+binney street project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bates linear accelerator center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dhs domestic nuclear detection office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alexandria real estate equities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shenzhen international biotech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasonia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genetics society of america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+georgia department of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california institute for regenerative medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international society for stem cell research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+epa science advisory board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google ventures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eswi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+caribou biosciences of berkeley 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+editas medicine of cambridge 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk labour member of parliament 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bureau of investigative journalism 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+parliamentary assembly of the council of europe 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for infectious disease research and policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british medical journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+emergency committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+boston university school of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kumamoto sanctuary 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+soko tierschutz 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ifo center for the economics of education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian institute of technology madras 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us equal opportunity commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of halle-wittenberg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal university of rio de janeiro 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of regensburg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+manchester institute of innovation research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marine mammal commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+promotion of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+transatlantic trade and investment partnership 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vaquita express 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intercultural center for the study of deserts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science advisory board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european federation of pharmaceutical industries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+corrupt public health research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genetic alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association for american universities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+turning technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of public and land-grant universities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aplu 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal pell grant program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientists for labour 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german animal welfare federation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national association of student financial aid administrators 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian science congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national society of black physicists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association for cryptologic research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us right to know 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+democratic unionist party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+navigenics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+knome 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european science foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kintama research corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for axion 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+precision physics research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california digital library 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+donald w. reynolds foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international federation of pharmaceutical manufacturers and associations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intergovernmental science-policy platform on biodiversity and ecosystem services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wayne state university's institute of environmental health sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+devore & demarco 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tata trusts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jiangnan graphene research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of manchester's national graphene institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for microelectronics and microsystems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+israel science foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of utah school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk atomic energy authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+reproductive genetics institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental molecular sciences laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agency of quality assurance in education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+electronics takeback coalition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international commission on non-ionizing radiation protection 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chan zuckerberg biohub 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european parliament and council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal ministry of labour and social affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of electrical and electronics engineers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+forth institute of molecular biology and biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced cell technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cwts leiden ranking 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eighth framework programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+imbb 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+charlotte lozier institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations environment programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+general assembly of the united nations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cell signaling technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national nuclear security administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mount sinai health system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human heredity and health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gtc biotherapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+academia sinica institute of astronomy and astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york genome center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us bureau of labour statistics and wikipedia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+christian democratic union 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+care quality commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carnegie institution for science in stanford university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+itzhak fried of the university of california 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical hypotheses 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+inamori foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of washington's friday harbor laboratories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of hawaiian affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for geophysics and vulcanology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ge free new zealand 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+metropolitan autonomous university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of 'roma tre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pharming nv 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for agricultural research in nancy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german federal office of radiation protection 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+major risks committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us army training and doctrine command 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american anthropological association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american counterinsurgency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih national institute of general medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulf of mexico research initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quirin schiermeier trying 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+allen brain observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tectonophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+smithsonian institute's national museum of natural history 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for geographic medicine research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rosetta orbiter spectrometer for ion 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+med biotech laboratories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+solar system exploration research virtual institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+broad institute of harvard 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technology and innovation endowment fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ohsu knight cancer institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oswaldo cruz foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bentz whaley flessner 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of environmental health sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global research report africa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for economics and peace 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who's executive board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of malawi's college of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+data for health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford radiocarbon accelerator unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+exoplanet exploration program analysis group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+exoplanet characterization observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+palaeogeography 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of morphology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german research funding council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zimbabwe academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ligo scientific collaboration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of infectious disease and molecular medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of nephrology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+future meat technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of metrology research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medan institute of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bryan cave llp 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german national metrology institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+high energy accelerator research organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of indonesia in depok 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+forum of european neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+plant & animal genome 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+imaging platform 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for conservation biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+criminal justice information services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+morphotrak 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harte research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american institutes for research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulf of mexico studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+catalina sky survey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of southern mississippi's gulf coast research laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulf coast research laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genetic engineering appraisal committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of delhi's centre for genetic manipulation of crop plants 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+skeenawild conservation trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+silicon quantum computing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of arizona's lunar and planetary laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unsw centre for quantum computation and communication technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new frontiers program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vavilov institute of plant industry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deep space network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+conference of italian university rectors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wuzhen institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+all india institutes of medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientific advisory council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+korean federation for environmental movements 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guttmacher institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mit energy initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+program on energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of population genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+igib 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jean frézal centre of medical genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+queen mary university london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for policy research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of biological chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+inivata 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agency for evaluation of research and higher education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national alliance for life and health sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+novogene 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of cambridge's institute of astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+inter-academy panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international congress of mathematics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal science partners 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ion torrent 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian greens 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neurotechnology center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+howard hughes medical institute's janelia farm research campus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bbc news sound 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national archaeological museum in cagliari 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of nuclear physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+water task team 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for disease dynamics, economics & policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cihr institute of health services and policy research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for science and international security 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute of colloids and interfaces 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ancora pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american chemical society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seattle coronavirus assessment network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+foping nature reserve 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+keeling center for comparative medicine and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+metrologists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee on data for science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+blaise pascal university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european centre for geoscience research and education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+catholic university of leuven 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for development of advanced medicine for dementia in obu 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mario negri institute for pharmacological research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of new and renewable energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hess deep 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federation of european neuroscience societies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+italian association for huntington 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carnegie climate geoengineering governance initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+data environnement 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasu's institute of mathematics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ahrq 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for sustainable plant protection 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us department of energy's office of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of paris-south 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of science for orela 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for agricultural research basile caramia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geel electron linear accelerator 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pubmed commons 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stencila desktop 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuclear regulatory commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+solyndra 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+abraxis bioscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jaxa) institute of space 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian corporation of nanotechnologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york university school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean salinity mission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+patricia gruber foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japan renewable energy foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seita emori 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of human research protection 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association for the accreditation of human research protection programs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agency for healthcare research and quality 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+radiation budget instrument 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+impulsing paradigm change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+second institute of oceanography 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national natural science foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+integrated ocean drilling program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iodp 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate absolute radiance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+refractivity observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swedish medical products agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+codata 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consultative committee for units 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+doe's office of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+netherlands institute for radio astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+outer planets assessment group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coastal response research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mars science laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mars exploration program assessment group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for nuclear physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+airlines for america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seventh framework programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china mobile laboratory testing team 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european mobile laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih's scientific management review board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fastercures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+icemag 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+frontiers in psychology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+okinawa institute for science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indonesian research institute for biotechnology and bioindustry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+herald shoal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for space studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coordinated universal time 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of rome tre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cgpm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national agency for new technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of hematology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leiden observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research universal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+linear accelerator laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+culham centre for fusion energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yaguará panama 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kyoto university's primate research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+primate research ( kyoto university primate research institute disease control committee primate res 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fisheries research and development corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for foreign policy analysis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scholar rescue fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+archaeology museum of cantabria 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+children's cause for cancer advocacy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard university herbaria 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard t.h. chan school of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+autonomous university of campeche 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national oceanic and atmospheric administration's national marine fisheries service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harte institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science & policy exchange 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pennington biomedical research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canada research chairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sativex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fraunhofer society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gw pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of british columbia okanagan 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european association of research and technology organisations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of the basque country in bilbao 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+murchison radio-astronomy observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+great ormond street hospital institute of child health at university college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+molr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese groundwater science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national natural science foundation and china geological survey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of land and resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university college london's institute of child health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of science's institute of geology and geophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+falcon heavy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national snow and ice data center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google lunar xprize 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+discrete analysis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seventh framework programme for research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aeronautical research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for biodefense 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arena pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canaccord genuity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa swift 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+8th global summit of national bioethics advisory bodies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+foundation for the national institutes of health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih human microbiome project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+paracelsus medical university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international initiative for impact evaluation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+avandia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+datamonitor 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of maryland center for environmental science in solomons 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council for science and education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marcell experimental forest 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geophysical fluid dynamics laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biotechnology and biological sciences research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house committee on science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+policy sciences center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+graduate research fellowship program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research ethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international solar alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for developmental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research ethics service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+caddo nation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nigeria cdc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lgbq 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new phytologist 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for space research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+windpower monthly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jackson laboratory for genomic medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iss) research & development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national association for biomedical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum technologies programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum europe conference 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+apco worldwide 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us human microbiome project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nordic institute for theoretical physics in stockholm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dinosaur institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard injury control research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+green bank hydrogen telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seed media group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for space astrophysics and planetology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+macrauchenia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pathmark genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ogtr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+embryology authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chintan environmental research and action group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lancet oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world conference on research integrity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint analysis group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia university's kreitchman pet center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasawatch 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+louisiana sea grant college program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ecological society of america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint united nations programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bloomberg europe pharmaceutical index 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for international climate and energy policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kepler cheuvreux 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+momenta pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature and scientific american 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nrda 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural resource damage assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+menzies school of health research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sanford c. bernstein & co. 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulf coast research lab 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research libraries uk 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international aids society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genetic immunity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bioinformatics and systems engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+niaid 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national association of people 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wilson international center for scholars 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+engine biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lunar science forum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national astronomical observatory of japan 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of catalysis and petroleochemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+safety of medicines and health products 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of quebec trois-rivières 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tropospheric monitoring instrument 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint center for artificial photosynthesis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+caixin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+howard florey institute for brain research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jcap 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy innovation hubs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oscillation project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of ioannina 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+greek foundation for research and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laboratory of cellular and molecular neurobiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science and technology policy research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european parliament and council of ministers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+forth biomedical research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jilin agricultural university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lawrence livermore national laboratory's forensic science center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ohrp 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+woranso-mille 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leonids 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+allsky meteor surveillance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+organ preservation alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+structural genomics consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for severe weather research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of general medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+northeast structural genomics consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+targeted proteins research program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+osdd 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american psychological association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of laboratory animal welfare 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wuxi pharmatech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih office of extramural research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world heritage committee of the united nations educational 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+foundation for food and agriculture research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of child health and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national incident command 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cdm watch 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cognitive science society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for marine-earth exploration and engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih's division of program coordination 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+md anderson's keeling center for comparative medicine and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nankai trough 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+planning and strategic initiatives 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eta carinae 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for oneworld health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fsc development services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indonesian institute of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+behavioral pharmacology research unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of psychopharmacology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california museum of paleontology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+salk board of trustees 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american fisheries society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pacific fishery management council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hfea 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quaternary science reviews 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for reproduction and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+monash institute of medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+emory centre for ethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of occupational and environmental medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+queensland alliance for environmental health sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+doe office of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+regulatory authority for tissue and embryos 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global health security agenda 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european people's party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national nanotechnology initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+electric reliability coordinating council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ninth international congress of vertebrate morphology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ukcmri 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wellcome trust and cancer research uk 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mrc centre for inflammation research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mrc functional genomics unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hadal science and technology research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+college of medicine and veterinary medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who stop tb department 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fraunhofer institute for wind energy and energy system technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nagoya protocol 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+division of public health sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wake forest university school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for biosecurity of upmc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for quantum computing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european telecommunications standards institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agu board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dutch general intelligence and security service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mimetas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+organ-on-a-chip world congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+qikiqtani inuit association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human genetics commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mpi-biocyb 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nimal welfare federation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate justice programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature communications 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ecological society of america conference 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+egidio feruglio palaeontological museum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british go association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national oceanographic and atmospheric agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international union of pure 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cbc news 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who collaborating center on public health law and human rights at georgetown university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mapp biopharmaceutical 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of são paulo's museum of archaeology and ethnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us court of appeals for the federal circuit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+prometheus labs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ncle 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dagens nyheter 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european universities association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+transition military council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rapid support forces 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world privacy forum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french national radioactive waste management agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for science and environment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european repository development organisation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clermont-ferrand physics laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lynkeos technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rescuing biomedical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hungarian academy of sciences's institute for nuclear research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for new economic thinking 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk institute for public policy research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german centre for cardiovascular research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian venture company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european mobile laboratory project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mdi biological laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford nanopore 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sigma pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+frankfurt kurnit klein & selz 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+newcastle fertility centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chemistry and metallurgy research replacement 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us bureau of labor statistics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+interagency alternative technology assessment program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national plant genome initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tvm capital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aspen pharmacare 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us advanced research projects agency-energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alder hey children's nhs foundation trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian society for the advancement of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who) health emergencies programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental observation and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american journal of primatology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of research integrity at the national institutes of health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chronic fatigue and immune dysfunction syndrome association of america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of cambridge, university college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association for chronic fatigue syndrome/myalgic encephalomyelitis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+regenerative sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+isscr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+riken centre for developmental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sea turtle restoration project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint dark energy mission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian academy of science's institute of bioorganic chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+space interferometry mission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gene biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+skoltech center for translational biomedicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dinama 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+argentinian national university of la plata 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marine-earth science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wageningen agricultural university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute of quantum optics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+near-earth object camera 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+long range research aircraft 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pamphilos 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental health committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced maui optical and space surveillance technologies conference 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+london institute of space policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint space operations center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european society of human genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+debasis sengupta 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sg biofuels of encinitas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aquabounty technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for genomic regulation in barcelona 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california and nature publishing group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biomolecular archaeology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bernhard nocht institute for tropical medicine in hamburg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advisory committee on human radiation experiments and the national institutes of health's human embryo research panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international fertilizer industry association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+commonweath scientific and industrial research organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eötvös loránd research network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for cell engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for stem cell biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indiana university-purdue university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations sustainable development solutions network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+princeton university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alain aspect 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+antarctic marine living resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ccamlr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for sea fisheries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+public's health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marine environmental research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+general public license 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of roma tre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lifecare innovations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for developmental research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+noel kempff mercado natural history museum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+netherlands interdisciplinary demographic institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kitt peak national observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wuhan national laboratory of electronics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for proteomic 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international development cooperation agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kenya medical research institute–wellcome trust research programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for global health research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human longevity, inc. 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research mentoring network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tropical forest and climate initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california board of regents 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+blackpak of san francisco 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+san diego zoo institute for conservation research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+the five star movement 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard stem cell institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+epidiolex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arch coal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technical university of dortmund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+million veteran program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geisinger health system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+interagency working group on harmful algal blooms 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+interagency coordinating committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national toxicology program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national tertiary education union 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+foldrx 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+endocrine society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cambodia vulture conservation project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+infectious disease genomics and global health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of the american medical association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for integrated cell-material sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astronomical observatory of padua 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world energy congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+honolulu civil beat newspaper 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+norwegian institute for water research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+phoenix cardinals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gladstone institute of cardiovascular disease 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+netherlands institute of ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california to cambridge 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chicago bears nfl 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ball aerospace and technologies corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+parker solar probe 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+superior technical institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+planetary protection coordination office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ppco 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+white house office of science and technology policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international crime science conference 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shaw prize in astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nips twitter 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university-of-hawaii-built 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+digital reconstruction of axonal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa marshall space flight center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of neurological disorders 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marseille observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china clean energy research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+michigan memorial phoenix energy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural resource analysis center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us–china energy cooperation program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+software carpentry foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+helmholtz association of german research centers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peace research institute oslo 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+potsdam institute for climate impact research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+buck institute for age research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+life sciences of branford 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian housing development foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rfbr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+a. n. belozersky institute of physico-chemical biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american bird conservancy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+belozersky institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zhejiang university institute for social medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford nanopore of oxford 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' shanghai institute of plant physiology and ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of cote d'azur in nice 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+union of concerned scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of neurodegenerative disease at university college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for science in the public interest 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+court of appeals for the district of columbia circuit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of minnesota stem cell institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+avm biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+milbank quarterly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+plate boundary observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max born institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+veterinary medicine advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for veterinary medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vmac 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aquabounty 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+comparative medicine and animal resources centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of clinical oncologists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for devices and radiological health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shark specialist group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+statistics collaborative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of hawaii's institute for astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of clinical oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+general administration of press and publications 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of perinatology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+boston chemical data corp 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean biogeographic information system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+texas a&m university's harte research institute in corpus christi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shanghai institutes for biological sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese journal citation report 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yanan sun 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of genetics and genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+acta zoologica sinica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+noxxon pharma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' institute of zoology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bureau of ocean energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+higgs hunting 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+un convention on biological diversity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us department of energy's oak ridge national laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+koala ai technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee of concerned scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stanford university school of medicine in stanford 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+middle east studies association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+icahn institute for genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+louisiana state university museum of natural science in baton rouge 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for chemical toxicology research and pharmacokinetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pacific northwest national laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+smithsonian institution's museum conservation institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+blue ribbon commission on america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nustart energy development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us nuclear regulatory commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house science and technology committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' institute of neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+exelon corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz institute on ageing-fritz lipmann institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+desmog canada 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+berkeley geochronology center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+organization for economic co-operation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for science and technology studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+philosophical magazine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kavli institute for particle astrophysics and cosmology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beijing genomics institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human proteome organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+supreme arbitration court 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guam department of public health and social services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beijing proteome research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global polio eradication initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for atmospheric sciences in reading 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa goddard institute for space studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nmnh 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa-operated fermi gamma-ray space telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coulston foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international society for biological and environmental repositories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zymo research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us laser interferometer gravitational-wave observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national academies of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa advisory council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wfirst 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nansen initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research-doctorate programs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council of graduate schools 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national commission for scientific and technological research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of urology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+state university of campinas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hebei association of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian social democracy party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian development bank 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shark spotters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mrc centre for regenerative medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sangamo therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nobel foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy policy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american association for the study of liver diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute on alcohol abuse and alcoholism 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientific management review board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mitsubishi tanabe pharma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+icar central potato research station 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national organization on fetal alcohol syndrome 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+niaaa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american beverage institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alfred p. sloan foundation and foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kaist graduate school of science and technology policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+distilled spirits council of the united states 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+the university of north carolina school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+orbital sciences atk 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+spirit cave mummy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biotechnology journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esa's clean space 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+roadmap epigenomics project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national energy guarantee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american sociological association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+europe ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international life sciences institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal observatory of belgium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+group sunspot number 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international sunspot number 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tamil nadu pollution control board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jiangmen underground neutrino observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+csiro staff association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for science, technology and congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+social media and democracy research grants 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+phytoceutica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yale university school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+republican national convention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bracewell & giuliani 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house committee on oversight and government reform 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee on environment and public works 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bipartisan policy center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nobel committee for chemistry 2018 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+space policy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york university stern school of business 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+patient-centered outcomes research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heritage action for america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house committee on energy and commerce 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations university institute of advanced studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+massachusetts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technology strategy board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gustave roussy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vatican secret archives 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+newlink genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french institute for research in computer science and automation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joseph fourier university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of east anglia's climatic research unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnrs institute of plant molecular biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mstn 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal institute of physical and technical affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central design bureau for machine building 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international committee for weights and measures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japanese national institute of infectious diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french national trade union of scientific researchers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american physical society division of plasma physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for governance and sustainable development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biobricks foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research frontiers programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+obvious ventures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+twist bioscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for evolutionary biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for meteorology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal commission on environmental pollution 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+food and drug adminstration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+texas tech university health science center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee on carcinogenicity of chemicals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for european environmental policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+monterrey institute of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pan american games 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+optical institute graduate school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carbon engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amarakaeri indigenous reserve 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national amazonian university of madre de dios 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+islam for dummies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european university institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal energy regulatory commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dc circuit court 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wohlers associates 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nobel commitee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ludwig institute for cancer research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+radarsat constellation mission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fermi gamma-ray space telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa goddard space flight center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arecibo observatory as the world 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+verification research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+milken institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+basque centre for climate change in bilbao 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+space carbon observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+polish academy of sciences' mammal research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+herzberg institute of astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+data science journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global oceanographic data archaeology and rescue project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european academies' science advisory council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clalit research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sheppard mullin richter & hampton 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+decision resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+convergent science physical oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for economic and social research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+working party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biosimilar medicinal products 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee for medicinal products for human use 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+são paulo research foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnrs unit of neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+southern astrophysical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global environmental model 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african center of excellence for genomics of infectious diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+parliament's house of commons science and technology select committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+massachusetts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+justice and development party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+campaign for science & engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cas institute of neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+crop trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+monash university's biomedicine discovery institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of research, technology and higher education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dusel research association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+health research council of new zealand 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ionis pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sanford underground laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+izmir biomedicine and genome center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+catholic university of leuven (ku leuven 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us court of appeals for the district of columbia circuit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jodrell bank observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international centre for integrated mountain development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' institute of tibetan plateau research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+padua astronomical observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arid regions environmental and engineering research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ska organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of atmospheric sciences and climate 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk civil service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senckenberg world of biodiversity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+save the elephants 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of puerto rico 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+independence party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+protein data bank 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of immunization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international society for transgenic technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jenner institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ukrainian science club 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hmgc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department for business, innovation & skills 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+white house office of trade and manufacturing policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+higher education policy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+social science citation index 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fbi houston division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mental health center of west china hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences key laboratory of mental health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+greens party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science is vital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nanjing medical university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american psychiatric association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national coalition against censorship 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wyle laboratories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee on energy and commerce 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+league of conservation voters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese association for science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new dynamics of ageing programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute on aging 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of environment and forestry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical research council centre for regenerative medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research fortnight 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for statistics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nigerian academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science bulletin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+netherlands 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+severo ochoa centre for molecular biology in madrid 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ucl council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neurotech network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced science institute in saitama 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of general medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of environmental health sciences in research triangle park 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of allergy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+urban dynamics institute at oak ridge national laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientific publication information retrieval and evaluation system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research assessment exercise 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us precision medicine initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sidley austin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+helmholtz society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for diabetes research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yizhi liu of sun yat-sen university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german cancer research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+earth biogenome project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genomics institute of the novartis research foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gladstone institute of cardiovascular disease 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wikipedia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ncipc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national collaborative on gun violence research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heinrich heine university of düsseldorf 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations environment assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuclear energy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+engines and energy conversion laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national board of wildlife 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+conhecimento sem cortes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rnl life science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+space and technology committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consortium of social science associations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy and climate change committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department for energy and climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of child health and human development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal swedish academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kosciuszko science accord 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consortium for ocean leadership 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sirna therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+blue ribbon study panel on biodefense 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+people's court of nanshan district of shenzhen 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+inter-university center for terrorism studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gryphon scientific 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nsabb 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pew center on global climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+copenhagen accord 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+education policy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shahid beheshti university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+21st century cures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+software sustainability institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of new south wales' climate-change research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laboratory for molecular medicine at partners healthcare personalized medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hadassah-hebrew university medical center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical technology & practice patterns institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house of representatives committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for science and democracy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biophysical journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+simons center for geometry and physics at stony brook university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+acs chemical biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international wheat genome sequencing consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astrogenetix 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american astronautical society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biodesign institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+airborne snow observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+social science research network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+questrom school of business at boston university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+safer chemicals, healthy families 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ajol 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuclear suppliers group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national renewable energy action plan 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee on gender balance and diversity in research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+irena's innovation and technology center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of catanzaro magna graecia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international behavioral neuroscience society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of nursing research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+theoretical physics of condensed matter laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french office of research integrity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+molecular genetics and cardiac regeneration laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jaids 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+catholic climate covenant 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+independent advisory committee on applied climate assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of higher education and training 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american meterological society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science advances 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mellon foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institutional animal care 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of neuroinformatics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international crisis group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+higher education and science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+autism research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+computational life sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian central civil services rules 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+watson health cloud 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national association of ramón y cajal researchers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+complutense university of madrid 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+virus identification laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ragon institute for hiv 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us department of health and human services's office of research integrity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+altius institute for biomedical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tropical forest group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neural information processing systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+monash obesity and diabetes institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sagient research systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute on drug abuse 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+orexigen therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ybco 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alberta wilderness association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german cancer research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+atlantic plaza towers tenants association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+virtual physiological human network of excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global young academy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sanford-burnham medical research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cavu biotherapies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations office for disaster risk reduction 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of earth physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association of volcanology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+power development authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+macmillan publishers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mekentosj 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wyss institute for biologically inspired engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+outsell 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geological institute of hungary 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marine fisheries review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gran sasso national laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for the research and history of texts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unols) council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate change research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cgiar consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz institute of marine science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google images 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural science foundation of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+strategic planning committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pavement coatings technology council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cas) institute of genetics and developmental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+meiji institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cross-strait policy association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stawell underground physics laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+metrics of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kristianstad university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shanghai astronomical observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pacific decadal oscillation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bioinformatics institute of the agency for science, technology and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university museum of zoology, university of cambridge 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+loxo oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+polytechnic university of valencia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deepmind 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quebec research fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american go association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dutch institute for public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian institute of horticultural research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fermilab's physics advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national science foundation of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human intestinal tract 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for agricultural research in jouy en josas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tychonic 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+graduate school of science and technology policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of statistical sciences in research triangle park 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national renewable energy laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international student and scholar services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+psychencode consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sassan saatchi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for atmospheric research's high altitude observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+southern ocean carbon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+star collaboration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shanghai institute of applied physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tata institute for genetics and society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+flanders institute of biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasonia genome working group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house of representatives newt gingrich 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+linear collider board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+parker institute for cancer immunotherapy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+were santa cruz biotech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of connecticut school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amflora 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neon therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fermilab center for particle astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jonsson comprehensive cancer center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cornell university college of veterinary medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+civic alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee on human rights of the us national academies of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kemri-wellcome trust research programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for antimicrobial resistance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+crbn 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of quantum matter at hiroshima university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+spero therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fahlgren 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of melbourne's school of botany 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+durrell institute of conservation and ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+women's hospital heart and vascular center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sloan digital sky survey at apache point observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eeoc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+usgs earthquake hazards program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kandilli observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gfz german research centre for geosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+istanbul seismic risk mitigation and emergency preparedness project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leloir institute foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of agriculture and food chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google news lab 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american public health association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ttip 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global change & ecosystem services at conservation international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+simons foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+planktos 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arxiv.org 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human genomics program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+slow food international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american association of variable star observers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+academia sinica's genomics research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of würzburg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wellcome trust centre for neuroimaging at university college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+whereas labour 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientific women's academic network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+white house office of science and technology policy's joint committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian science congress association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+queensland health forensic and scientific services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal society of south africa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seattle flu study 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of energy and climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of pennsylvania school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unistellar 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science and technology innovation program at the woodrow wilson international center for scholars 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european research and innovation at university college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+campaign against torture 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+madmax 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+steac 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+celator pharmaceuticals of ewing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature nanotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for agriculture and bioscience international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national postdoctoral association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international commission for the conservation of atlantic tunas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national human rights commission of korea 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international society for scientometrics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for biotechnology in madrid 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aptimmune biologics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+legacy heritage fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+doe's pacific northwest national laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of texas, austin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+basel action network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+perseverance airlines 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of colorado school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih's office of strategic coordination 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swog cancer research network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian agricultural research corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european strategy for particle physics update 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european human brain project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cern council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of neurological disorders and stroke 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+breakthrough prize foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+space policy institute at george washington university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+breakthrough starshot 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of maryland's joint global change research institute in college park 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nsf division of biological infrastructure 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rockland immunochemicals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of ioannina school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american spinal injury association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+friedrich schiller university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intellectual property scholars conference in stanford 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cold spring harbor laboratory press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+asapbio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+novartis's institutes for biomedical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk universities purchasing consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+skin sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+weill cornell brain tumor center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese cdc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for coastal research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of cambridge, imperial college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ncig 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of mauna kea management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental risk management authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national conservatory of arts and crafts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vietnam academy of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ge free nz 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced immunization technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+covid-19 clinical research coalition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+covid-19 research coalition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iau general assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+collaborative approach to meta analysis and review of animal data 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deep fault drilling project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian animal health laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jcbfm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international centre for primate brain research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us eastern standard time 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national nurses united 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+north atlantic treaty organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ibcm 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+burke medical research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+exxon valdez oil spill trustee council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature geosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chuv university hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us-ireland research and development partnership 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association for molecular pathology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american college of medical genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deepmind health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of human genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+knowledge ecology international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us district court for the southern district of new york 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aclu first amendment working group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+soleil securities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+court of appeals for the federal circuit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mygn 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national scientific and technical research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national university of salta 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+school of history and sociology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global academy of young scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+good food institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ludwig-maximilians university of munich 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iniciativa amotocodie 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal society of biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unión de nativos ayoreos de paraguay 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global conference on agricultural research for development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+radiowave transmission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house of commons inquiry committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+salvador zubirán national institute of medical sciences and nutrition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mcdermott international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central european standard time 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+parliament for oxford west 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eu research division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+turkish aerospace industries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk natural environment research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+theodosius dobzhansky center for genome bioinformatics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+life science steering group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+metabolic syndrome and related disorders 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peerj 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for human evolution 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+optics and electronics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+high-altitude water cherenkov observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american medical association's council on science and public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+barnett shale 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heinrich heine university of d 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tianjin university of traditional chinese medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian environmental assessment agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pacific centre for environmental law and litigation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international brain observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gitwilgyoots first nations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african science academy development initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+directorate general for nature conservation and national parks 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of extramural research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us house committee on science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us treasury department's office of foreign assets control 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marine mammal institute of oregon state university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national marine mammal laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oceanic preservation society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean preservation society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal interagency solutions group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new south wales land and environment court 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ontario institute for cancer research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nhgri 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of molecular biology & biophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+electronic medical records and genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk research and innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute of experimental medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alliance of democratic forces 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council for higher education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sirtris pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of michigan geriatrics center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sirtris 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astrosat 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+state key laboratory of molecular oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human embryology and fertilisation authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for clinical precision medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zhejiang university-university of edinburgh institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+animal biotechnology innovation action plan 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international linear collider 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental research letters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+northern and southern hemisphere 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+long-baseline neutrino facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alliance for accelerating excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+commercial lunar payload services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+montreal neurological institute and hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+animal physiological ecology department 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us biomedical advanced research and development authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' national space science center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iclr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mdma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+florida institute for conservation science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum encryption and science satellite 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+infectious diseases' vaccine research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sputnik planitia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stockholm environmental institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+planetary response network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+census of marine life 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+maharashtra hybrid seed company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amazon tree diversity network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mediterranean institute for biodiversity and ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+liberal democrat member of parliament 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us army corps of engineers' cold regions research and engineering laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of plant genome research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arden ahnell 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+un environment assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for earth observation and digital earth 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of child health and human development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian space agency roscosmos 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of veterinary medicine hannover 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for global health science and security 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+parliament's committee on science and education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research centre on animal cognition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national oceanic and atmospheric administration's national climatic data center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carnegie institution for science's department of global ecology in stanford 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations general assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house armed services committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of rome tor vergata 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+surgisphere corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yangyang underground laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+monash energy materials and systems institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for underground physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for observation and modelling of earthquakes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal impact factor 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clarivate analytics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for quantum optics and quantum information 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for radioastronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+campaign for access to essential medicines 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biomedical and environmental research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wuhan municipal health commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national academies of science usa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nobel assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian institute for theoretical astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+antarctic climate and ecosystem cooperative research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national parks agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+drc ministry of health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lunar flashlight 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national optical-infrared astronomy research laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+duke university marine laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european strategy for particle physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+particles for justice 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+government revitalization unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nsf budget division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+auriane egal of the paris observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+thermo fisher scientific of waltham 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lunenfeld–tanenbaum research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sinergium biotech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+norwegian veterinary institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+norwegian institute for nature research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins university applied physics laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of biology paris-seine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dewpoint therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canada research chair 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lunenfeld-tanenbaum research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coalition for epidemic preparedness innovations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swiss federal institute of technology zurich 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for biophysical chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+subpolar north atlantic program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amazon institute of people 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us department of energy's joint genome institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical research council laboratory of molecular biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian democratic movement party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kentucky geological survey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature photonics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mtc forensics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gene editing technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for ethics in health care 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+radioactive drug research committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esa's european space research and technology centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bologna astronomical observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university college london's institute of cognitive neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national graduate research institute for policy studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+psychological science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science and environmental health network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california department of pesticide regulation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neural-processing research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seattle biomedical research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international commission on zoological nomenclature 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wuhan university of technology's international school of materials science and engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gene therapy catapult 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shardna life science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+italian data protection authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tiziana life sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for non-timber resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ecology and island conservation group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+katrina brandon of conservation international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international gamma-ray astrophysics laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sudbury neutrino observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian society for clinical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association of animal behavior consultants 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cdsco 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pohang accelerator laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+motojima 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuclear science and technology organisation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian council on animal care 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+duke institute for brain sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+frontiers media 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian science academy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+verenium corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+netherlands organisation for scientific research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+frontiers research foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+system for publication and evaluation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vsnu 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mars society australia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+norwegian research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+disruptive technologies program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ecole nationale supérieure de chimie de montpellier 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+thuringian state observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institutes of allergy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for drug evaluation and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for drug development science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biomarkers consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+earthcube 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+côte d'azur observatory in nice 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neural correlate society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+massachusetts institute of technology's haystack observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ligo laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nalco energy services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of rome la sapienza 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian labor party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee for the universities of palestine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+skolkovo institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arc centre of excellence for coral reef studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international symposium on biomolecular archaeology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indonesian democratic party of struggle 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+commonwealth fusion systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+grfp 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british medical association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+qimr berghofer medical research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+general automation lab technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical academic staff committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature commun 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+inaf astronomical observatory of capdiomonte 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international agency for research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international journal of epidemiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of imaging producers and equipment suppliers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+frontline research excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of metrological research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+helicos biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuclear research and consultancy group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pedro kourí tropical medicine institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+caltech msw 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gamaleya research institute of epidemiology and microbiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human microbiome jumpstart reference strains consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jcvi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hvri 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for scientific research in nice 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for macroecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scholarly publishing and academic resources coalition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of earth physics of paris 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of the gene technology regulator 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human betterment foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+boldly go institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geohazards international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kwazulu-natal research institute for tuberculosis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins center for tuberculosis research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french national higher institute of aeronautics and space 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hhmi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+borlaug global rust initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international maize and wheat improvement centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chan zuckerberg initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for mass spectrometry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german centre for neurodegenerative diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of minnesota, twin cities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hefei national laboratory for physical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+omics group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coalition against childhood cancer 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international conference on quantum communication 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unclos 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biotechnology innovation organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+walther schücking institute of international law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of southampton's institute of maritime law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pacific northwest seismic network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european union clinical trials register 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fisheries and aquaculture policy and resources division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french alternative energies and atomic energy commision 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint bioenergy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yokohama science frontier high school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for molecular biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+barcelona institute of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+klemens störtkuhl of ruhr university in bochum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+omega supplies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz institute for solid state 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british pharmacological society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+organization for economic cooperation and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american journal of human genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean observing and modeling group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national science foundation rapid response research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ceshe 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bdnf 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of psychiatry at king's college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih's tribal health research office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of research integrity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+first institute of oceanography 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+recombinant dna research advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human subject research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+physicians for human rights 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institutional review board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hfri 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aaup 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+active tectonics and seafloor mapping laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office for human research protections 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neural enhancement laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+argentinian institute of snow 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of environmental health sciences in research triangle park 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hudson institute for medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of genomics & integrative biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian society of genetic medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+recolzika 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sars international centre for marine molecular biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ras institute of cytology and genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american journal of botany 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global gas flaring reduction partnership 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genes genomes genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ludwig maximilians university of munich 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+riken nishina center for accelerator 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university college london's institute of neurology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of marine affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marie curie university - paris 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uppsala astronomical observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ecological society of australia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ice data center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+square kilometre array organisation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european timber regulation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for radio astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+health effects institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eta car 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international center for technology assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department for environment, food and rural affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+drosophila genetic reference panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international federation of pharmaceutical manufacturers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institutes of health guidelines for human stem cell research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united chinese americans 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national academy of sciences and national academy of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian association of postdoctoral scholars 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+italian research council cnr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+danish society for nature conservation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european research infrastructure consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beckman research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+meteorological applications for development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+atlantic multidecadal oscillation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+london universities purchasing consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biomedical advanced research and development authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for high impact philanthropy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kichwa community of doce de octubre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aboriginal heritage project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for indigenous genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical university of lublin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+initiative for science and technology in parliament 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tuba city regional health care corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of utah college of law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of massachusetts, amherst 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nelson mandela african institute for science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+treatment action campaign 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european consortium for ocean research drilling 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of medicinal chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french atomic energy commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+igm biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for disease control's division of tuberculosis elimination 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+government office for science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+terry fox laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sprenke 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national medical products administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mount sinai school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of diabetes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ucsd health system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french labour force 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of health studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of a coruña 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nitinol 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stanford university's program on energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+instrument context camera 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international council for science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of colorado's center for bioethics and humanities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+regional research center for scientific investigation and technology transfer 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hubrecht organoid technology of utrecht 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for climate modelling and analysis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+archives of internal medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+monrepos archaeological research centre and museum for human behavioural evolution 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+maine medical center research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cadi ayyad university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+proskauer rose 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for genetics and society in berkeley 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of medical research and studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international centre for medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of advanced scientific studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations' green climate fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central committee of sudan doctors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for biomedical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tsinghua university's institute of low carbon economy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global green growth institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+asia pacific movement on debt & development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ross sea mpa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national non-human primate breeding and research facility board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean salinity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international soil moisture network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international lter network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+helmholtz centre for environmental research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for ageing and health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+higher education research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+maxwell biotech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ras institute of world history 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bioprocess capital ventures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york university's winthrop hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+roswell park cancer institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+duke institute for genome sciences & policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eliza hall institute of medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnrs theoretical physics laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+henrietta lacks foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wellcome trust centre for mitochondrial research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean therapy solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+transplantation of human organs and tissues 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iatap 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+innocentive 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oil spill recovery institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association of egyptologists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre of study for the promotion of peace 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tropical melhoramento & genética 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+potsdam institute for climate impact 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+retrovirology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pnas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for professional and research ethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aerosol robotic network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+high-consequence pathogens and pathology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cherenkov array telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+affordable clean energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human mortality database 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international gerontology research group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+virgo collaboration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deepwater horizon unified command 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sens research foundation mountain view 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+escro 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+turkish academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for human reproduction 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum moves 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+confederation of spanish scientific societies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for research in biomedicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national climate assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neowise 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mrc harwell institute's mammalian genetics unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+greek ephorate of underwater antiquities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american astronomical society and american geophysical union 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+macrolide pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+simons observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+covid-19 prevention trials network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international congress for conservation biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal astronomical society of canada edmonton centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+urban wildlands group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international dark-sky association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+starlight initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for responsible research and innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german association of research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk national institute for health and clinical excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national high magnetic field laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china national nuclear corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of wisconsin law school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih human embryo research panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national bioethics advisory commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint investigation group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+south korean navy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council on government relations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations security council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+isterre institute of earth sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+montreal protocol 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+animal behaviour 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+anti-vivisection league 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+molecular libraries program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shanshui conservation center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk food and environment research agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coastal protection and restoration authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of health research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russia direct investment fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+palaeobiologist simon conway morris of cambridge university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford institute of population ageing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+parliamentary office of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heinrich pette institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environment agency austria 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+manila trench 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deep-sea research and earth systems science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulf of lions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of functional genomics of lyon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german federal institute for risk assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+boston company life biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk office of national statistics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of health's human microbiome project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gran sasso science institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+anvur 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+doe's office of nuclear physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+okazaki institute for integrative biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carnegie institution for science's department of global ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hadley centre for climate prediction and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office for cancer genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clarke & esposito 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deeu 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rubin observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard university's wyss institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beijing institute of biological products 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+south african radio astronomy observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+william alanson white institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+altona diagnostics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global campaign for microbicides 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aids program of research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+higher education and research bill 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+digital curation centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medicines control council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+policy bandwidth 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+has alfred renyi institute for mathematics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of agricultural and food chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+the research department of moët & chandon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+thirty meter telescope international observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+imr international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biofab 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lawrence berkeley national laboratory's joint bioenergy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+standard biological parts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of gene and cell therapy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+verily life sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mercator institute for china studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cb insights 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national new generation of artificial intelligence governance committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz institute for the social sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bibsam consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+liberty korea party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of strathclyde's centre for forensic science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+forensic science society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national geoheritage authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+interferometry centre of excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american academy of forensic sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk dementia research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ibs center for rna research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ipbes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us deep space climate observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kreitchman pet center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kreitchman center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+host genetics initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global open data for agriculture and nutrition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american mathematical society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harwell science and innovation campus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of washington medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gulf cooperation countries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+korean advanced institute of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+omics international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lockheed martin's space systems advanced technology center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of colorado's laboratory for atmospheric and space physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for mexican american studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sharonann lynch 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american immigration reform 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national insitute of allergies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of bioethanol science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+balseiro institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of technology bandung 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central caribbean marine institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+space development fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alfred wegener institute of polar and marine research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quark pharmaceuticals of fremont 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+museum of paleontology egidio feruglio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nanometrics inc. 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+southern ocean carbon and climate observations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+green algal tree of life 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+principal investigators association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council on animal care 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unmanned aircraft systems program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasa global hawk 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for genomic regulation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genetics and public policy center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genes & development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+innsbruck medical university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of pittsburgh cancer institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department for environment, food & rural affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deepstack 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for nuclear research of the russian academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aaas council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pontifical xavierian university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leigh marine laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mexican society for stem cell research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+publons 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of environment and resource management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+femto-st institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+minor planet center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beam therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rosetta orbiter spectrometer for ion and neutral analysis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz institute for neuro-biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university foreign interference taskforce 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian strategic policy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+d.e. shaw research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arab union of astronomy and space sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pak-austria institute of applied sciences and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+asthma health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zeta ophiuchi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal photographic society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for computational health sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+berkeley open infrastructure for network computing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+insulin mitigation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+researchkit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+evidence for democracy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max telford of university college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+paradoxopoda 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+breakthrough listen 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research centre for natural sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global telecommunications system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+polytechnic university of turin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+has institute of experimental medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+affordable energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+thwaites glacier offshore research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+health and human services alex azar 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technology and innovation council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biooncology consultants 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york stem cell foundation research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of aboriginal peoples' health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+meta-research innovation center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+superior high arbitration court 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gene campaign 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laser interferometer gravitational wave observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+partners healthcare personalized medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cell biology of infectious pathogens 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+drexlin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new hope fertility center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+reprogenetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alkahest 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+grain for green program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pew environment group's arctic 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german federal institute for geosciences and natural resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environment at imperial college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of freiburg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+grantham institute for climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+korea polar research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gfmc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swiss institute for experimental cancer research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oceaneos marine research foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute pierre-simon laplace 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international meteor organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ondřejov observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+perseids 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins lyme disease clinical research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international society for the psychology of science & technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cas institute of genetics and developmental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature immunology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council on energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tibotec pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+flatiron institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johann wolfgang goethe university hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+urban emissions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european commission joint research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british science association media fellow 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nautilus minerals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+baby biome study 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mimar sinan university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+decadal survey implementation advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national snow and ice data center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+protein & cell 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lusara foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+healthy lifespan institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+princess sumaya university for technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national longitudinal study of adolescent health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jordan atomic energy commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national oceanic and atmospheric administration's pacific marine environmental laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+taconic biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+smithsonian institution's national museum of natural history 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural history museum's department of palaeontology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british science association media 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+young scientists exchange program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zurich observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of geological and nuclear science in lower hutt 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ufrj institute of medical biochemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of ecology and climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+polaris partners 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alliance for a stronger fda 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+massachusetts biotechnology council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society for biochemistry and molecular biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese olympic committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+el niño southern oscillation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+met office hadley centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for the aids program of research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pepfar 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of health of the russian federation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+'black hole sun 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature structural & molecular biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bloomberg philanthropies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international union for conservation of nature water programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of utah health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for climate and security 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+our children's trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for the history of astronomy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+academy of experiments 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nhmrc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deep space industries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+policy solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us climate action network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global ecosystem dynamics investigation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american association for the advancement of science and the association of american universities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for climate and energy solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for arctic gas hydrate 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+greenhouse gas management institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eurasia group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alaska public radio on 13 march 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ucs center for science and democracy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations international civil aviation organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientists for global responsibility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+social sciences and humanities research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cambridge institute for medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations world meteorological organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk association of medical research charities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+farallon institute for advanced ecosystem research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy and enterprise initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kwr water research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+organisation of islamic cooperation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+left party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of hawaii's institute for astronomy in manoa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international research on permanent authentic records in electronic systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for terrestrial microbiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for carbon removal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hawaiian supreme court 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amazon conservation association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of nairobi's kenya aids vaccine initiative institute for clinical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national council of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international maize and wheat improvement center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eu erasmus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ucl centre for biodiversity and environment research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+schmidt ocean institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+great barrier reef foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mayo clinic college of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stanley price 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nicholson price 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alberta environment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+crop engineering consortium workshop 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of human rights 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pembina institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal citation reports 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+valeant pharmaceuticals of laval 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bjarke ingels group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean exploration trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+the association of american medical colleges 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+r. c. patel institute of pharmaceutical education and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for evidence-based medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+catalan institute of palaeontology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of southern california dornsife/ los angeles times 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ketamine treatment centers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+niprd 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lawson & weitzen 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+moorea biocode project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kuban state medical university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+appropriate energy laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee on publication ethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mcgill centre of genomics and policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+a. e. lalonde accelerator mass spectrometry laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+autobio diagnostics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+karolinska staff disciplinary board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of duisburg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+third rock ventures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for agricultural research in rennes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bluebird bio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+boston biopharma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+memphis meats 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+basel declaration society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+israel innovation authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+humanitas research hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australasian neuroscience society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yale school of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who's health emergencies programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+phg foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hunter college of the city university of new york 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal free london nhs foundation trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leuphana university of lüneburg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+investigation panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coalition of epidemic preparedness 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for critical infrastructure technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ska organisation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for shark research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+waymo 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+moral machine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+labour and conservative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical publishers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for cell science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international trade in endangered species 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+museum for natural history 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for allergy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international plant molecular biology congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk clinical research collaboration tissue directory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for medical progress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research center for quantum information of the slovak academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genome sequencing center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+congo research group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+italian association of cancer research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fbi houston 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california national primate research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+60-strong association of american universities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+white house office of energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+colombian supreme court 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of tropical medicine and hygiene 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for science education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum internet alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national quantum technologies programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+northern sky research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gritstone oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk research integrity office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mahidol oxford tropical medicine research unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical research council biostatistics unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+marina cavazzana-calvo of university paris-descartes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dutch petroleum society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eliminate dengue program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eliminate dengue 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eu policy at wellcome 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+julius kühn institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for minerals research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural history museum of denmark 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african centres for disease control and prevention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+complexity science hub 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+free university of amsterdam 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us ice drilling program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senckenberg research institute and natural history museum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human microbiome program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us advanced laser interferometer gravitational-wave observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national lgbt cancer network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for infection and immunity at columbia university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate analytics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york city department of health and mental hygiene 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+africa labs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pprv 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ada lovelace institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chesapeake energy corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+belmont report 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+green ecologist party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+helmholtz association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+violence prevention research program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european cooperation in science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre of excellence for invasion biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ihu institute of image-guided surgery of strasbourg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york university's courant institute of mathematical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wenchang space launch center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who-affiliated centers for law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of earth sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central european institute of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for science, innovation and society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+funding authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+community association for psychosocial services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+argentine museum of natural sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genome research limited 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of oceanic and atmospheric research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy and commerce committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+grl board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fundamental science review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senckenberg research station of quaternary palaeontology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of vertebrate palaeontology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intellia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins school of advanced international studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of new caledonia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french national institute for agricultural research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+inra's scientific advisory board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnrs laboratory for archaeomaterials 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+suffolk university law school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+baltimore ecosystem study 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+livingston ripley waterfowl conservancy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+costa rica institute of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk biotechnology and biological sciences research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international institute of molecular and cell biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+organigram 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vera c. rubin observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+camagüey meteorological center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+adam mickiewicz university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of marketing and consumer studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vaccine research initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+supreme people's court of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+goodwin procter 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european congress on tropical medicine and international health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scripps research translational institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint institute for very long baseline interferometry european research infrastructure consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bcse 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+air resources laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american college of obstetrics and gynecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint institute for very long baseline interferometry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for amazonian science and innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zaira resource management area 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal of archaeological science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+working group of indigenous minorities in southern africa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eunice kennedy shriver national institute of child health and human development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international institute of molecular and cell biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+corvelva 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+london's royal society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african health research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia university's mailman school of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+luminosity lhc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck digital library 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+osnap 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+imperial college covid-19 response team 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for systems science and engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kamioka observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hadley centre for climate science and services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deployable tower assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+five star movement 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+isi foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+permanent court of arbitration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national academies of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia dogfish hook and line industry association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mcdonnell boehnen hulbert & berghoff 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+greater atlantic regional fisheries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+thai academy of science and technology foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+persian wildlife heritage foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guanghua school of management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian institute of museums 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african studies university of london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mars exploration program analysis group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for immunization and respiratory diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+macmillan science and education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of science, technology and innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gpmb 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kaiser permanente washington health research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+frankfurt institute for advanced studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esa's science programme committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international commission on stratigraphy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+la molina national agrarian university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california health care facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alberta newsprint company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nsf's office of inspector general 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sw/niger delta forest project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wildlife conservation society vietnam 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research center for human evolution 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china biodiversity conservation and green development foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international meeting for autism research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of diabetes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of wisconsin's cooperative institute for meteorological satellite studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk court of appeal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peking university health science center school of basic medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+william davidson institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guilin pharma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human genetics advisory board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national human genome research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+south african department of health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alistair reid venom research unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of aix-marseille 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+colombian academy of exact 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+warsaw university observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+keck school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+autonomous university of zacatecas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kyung-sik choi of seoul national university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national mission on interdisciplinary cyber-physical systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gordon life science institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uct's black academic caucus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kbrwyle 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society for virology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+electron microscopy data bank 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+u r rao satellite centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for climate change and energy solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations world heritage 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british columbia society for the prevention of cruelty to animals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+polish academy of sciences institute of geophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+minecraft 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laser interferometer gravitational-wave observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+massachussetts institute of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national science and technology foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations' international civil aviation organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+multiscale biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+high energy physics advisory panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global influenza surveillance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+crick worldwide influenza centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fondazione telethon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us forest service's forest inventory and analysis program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beijing institute of transfusion medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+space radiation health project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nigms 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national organization of gay and lesbian scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mds nordion 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african society of human genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+congress's house of representatives 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+reducing intake of energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+latin american and caribbean society of medical oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research!america 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for arab neuroscientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google deepmind 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new zealand institute for plant & food research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+health and human services tom price 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of entrepreneurs and ecology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ciencia en el parlamento 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of minnesota in saint paul 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senate committee on commerce 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of environmental health sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european journal of human genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global genome initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cities climate leadership group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national autonomous university of nicaragua 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal society open science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canada research chair in interfacial phenomena 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+citizens' council for health freedom in st paul 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bioethics international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for research on safety and quality 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agency for healthcare research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gryphon investors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+janssen vaccines and prevention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gundersen medical foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for laser 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+puerto rico institute of statistics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+e.on global commodities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for business law and regulation at case western reserve university school of law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+frontiers and of nature 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for social anthropology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cryogenic laser interferometer observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pasteur institute of iran 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of molecular and cellular biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of microbiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+axiom international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+christian democrat and social democrat 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mrc national institute for medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+un population fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of health carlos iii 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arizona state university's consortium for science, policy and outcomes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih's office of science policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of texas at austin school of law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jetzon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institution for transforming india 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national university of singapore medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european planetary science congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european commission's joint research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national radio astronomy observatory green bank telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+planetary science decadal survey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+obi pharma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+physical review letters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+equality challenge unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international commission for the certification of dracunculiasis eradication 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+network of spanish researchers abroad 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for health technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california life sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+air university's china aerospace studies institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house of commons science and technology select committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+herzberg astronomy and astrophysics research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cdmsii 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for space sciences-csic 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+defence science and technology laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+entasis therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for climate and life 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alfred wegener institute helmholtz centre for polar and marine research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for climate change impacts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+palatino linotype 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world surf league 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sughrue mion 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+informetrics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of bioethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intelligence advanced research projects agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oklahoma geological survey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iter council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+springernature 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kite pharma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lion biotechnologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senate environment and public works committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+movement for the university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+addex therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clean air safety advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global change research program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of civil engineers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz institute of freshwater ecology and inland fisheries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute of animal behaviour 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+white coat waste project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ophirex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sarepta therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental investigation agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ringling brothers and barnum & bailey circus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+montreal protocol's technical and economic assessment panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+foundation for aids research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french national research agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national trade union of scientific researchers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+western kenya network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nepal climate observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of paris dauphine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of traumatology and orthopedics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global weather corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+african union commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international alliance for cancer early detection 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ludwig maximillian university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eli-eric 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of the principal scientific adviser 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human genetic diversity project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society for cell biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european parliament's industry, research and energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international geological congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european mathematical society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for monitoring 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+navajo nation council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+parliamentary and scientific committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shinji toda of tohoku university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national association of student personnel administrators 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chiron corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kustom group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global positioning system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global malaria eradication programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american college of rheumatology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jeffries international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rigel pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mersana therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kosovo education center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+baring private equity asia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+toyama chemical 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+erc science council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+maryland psychiatric research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+erc scientific council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sinovac biotech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tropical fisheries research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+premier biotech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rna biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for pharmaceutical research and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+john wesley powell center for analysis and synthesis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for cancer genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+xechem international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guangdong institute of applied biological resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international society for cellular therapy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lulucf 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california, berkeley if trump 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for intelligent systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+congressional asian pacific american caucus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for brain research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national sea grant college program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+athena dinar 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hbp board of directors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carelife medical 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations educational, scientific and cultural organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wimar witoelar 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china national renewable energy centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international union for conservation of nature's species survival commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ltern 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jx nippon oil 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian academy of sciences space research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+news of philae 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+barcelona institute of global health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+news feature 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peruvian ministry of health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+general data protection regulation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+walt de heer of georgia institute of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for solid state research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+infn frascati national laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+akershus university college of applied sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+raven aerostar of sioux falls 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+near space corporation of tillamook 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+commission for the conservation of antarctic marine living resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+complexity science hub vienna 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cooperative institute for meteorological satellite studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations' general assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cbrain 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih's advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+palaeontological association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indiebio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association international conference 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+emirates lunar mission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house of commons science and technology committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of washington school of law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national treasury employees union 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national cmv foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+outbreak science rapid prereview 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nepal climate observatory at pyramid station 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beijing normal university's school of systems science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+appec 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eclamc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of genetics and molecular and cellular biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of human resource development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hematology research program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council for british archaeology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+irish centre for vascular biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+salk institute for biological sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mercator research institute on global commons 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sabin vaccine institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+acs publications division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fda's office of device evaluation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal polytechnic school of lausanne 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+anthropological society of paris 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+museum of natural history victor-brun 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world organization for animal health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kunming institute of botany of the chinese academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih's office of management assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+elea phoenix laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aas open research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mega rice project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unsilo 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard university on cambridge 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neuronano research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international primate research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+commonwealth scientific and industrial research organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+space application services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wellcome centre for infectious diseases research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+telecommunication standardization bureau 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us antarctic research programmes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european union's copernicus climate change service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+planetary science institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+prometheus laboratories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astronomy allies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chengdu medgencell 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of puerto rico humacao 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european brain council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american geosciences institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cognitive neuroscience society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of anthropology and history 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for injury prevention and control 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+altacorp capital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+trust for america's health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wellcome trust and gates foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+northrop grumman aerospace systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard office for scholarly communication 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+airfinity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pew center for global climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of edinburgh's roslin institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+transgenic technology meeting 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+solenopsis invicta 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for research on safety 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+graduate institute of international and development studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+entomological society of canada 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+xylella fastidiosa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sisters of immaculate health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnr institute for sustainable plant protection 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of delaware's school of marine science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national aids research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lakeview campus medical facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international congress on peer review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+debye institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for medical education and clinical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+patagonian institute of social sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neil gehrels swift observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz institute for primate research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us joint space operations center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for sustainable energy policies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advisory council on underwater archaeology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+icelandic meteorological office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+f1000 research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european very long baseline interferometry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peruvian academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of disability 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+barcelona institute for global health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian human rights commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+administration for community living 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+public health preparedness and response program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+louis malardé institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alan turing institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+omics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+blood systems research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+has biological research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+novavax 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+monterrey institute of technology and higher education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stem cell network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian criminal intelligence commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global lake temperature collaboration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pbl netherlands environmental assessment agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international council on clean transportation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national medal of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+state key laboratory of pathogen and biosecurity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+doe) office of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced research projects agency—energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institutes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian mountain research facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central zagros archaeological project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+predpol of santa cruz 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indonesia endowment fund for education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia university's earth institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california union of postdocs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+impactstory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of astrophysics in bologna 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yale center for astronomy and astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fisheries trade programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technical university of braunschweig 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oslo university hospital institute for cancer research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iucn shark specialist group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for human rights in iran 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz-institute of freshwater ecology and inland fisheries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ibs center for axion 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china earthquake administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian society of zoology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scientific centre of monaco 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian foundation for basic research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+basic income earth network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+parco genos 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford uehiro centre for practical ethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hellenic foundation for research and innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office for research integrity at northwestern university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+innovative genomics institute at berkeley 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consumer watchdog in santa monica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alliance for climate education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vaccine alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+college of oceanic and atmospheric sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian society of genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+inter-american development bank 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+primatological society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate change and atmospheric research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for clinical trials 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ecohealth alliance malaysia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national mission for clean ganga 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american journal of kidney diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+plague of justinian 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+feinberg school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+renewable fuels association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stuart henrys 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sae consulting 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+energy biosciences institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international council for harmonisation of technical requirements for pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advisory committee on pesticides 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lilly asia ventures 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lunar exploration analysis group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+commercial aircraft corporation of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+philosophical transactions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tumor biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+immunochemistry, pharmacology and emergency response institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technological university of el chocó 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of southern texas medical center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+burnet institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+higher institute of industrial physics and chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+polytechnic university of catalonia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+frank & delaney 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+embl european bioinformatics institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+allen institute and cold spring harbor laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+philippine negritos 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sinovac 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of sydney michael spence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science mission directorate 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hbcu excellence in research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+qs world university rankings 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+facebook and twitter 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+israel defence forces 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+phd doctors' association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tokamak energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indonesian science fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council for science, technology and innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of science and technology policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences institute of biophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+healthtell 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+obokata 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international union for conservation of nature's world conservation congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national electronic injury surveillance system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human rights campaign foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+low carbon economy trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global wind energy council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hungarian brain research programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hse's institute of education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of endemic diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' shanghai institutes for biological sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+st. jude children's 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian space research organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scripps institute of oceanography 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japan aerospace exploration agency's institute of space and astronautical science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+conference of university presidents 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of clinical trials organizations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+salmonella paratyphi c 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+black justice league 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mind research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rutgers cancer institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+plga 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bruno kessler foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+babylonians 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+karisma foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+horia hulubei national institute for physics and nuclear engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of the côte d'azur in nice 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national advisory council on innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for mummies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european academy bozen/bolzano 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lyncean technologies of fremont 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for american paleolithic research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+event horizon telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global biological standards institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+all india people's science network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+supreme leader ayatollah 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fritz haber institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+korea centers for disease control and prevention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+millennium institute of oceanography 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us department for health and human services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carlos iii institute of health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american institute of aeronautics and astronautics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+malaysian society of parasitology and tropical medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tahija foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+riken center for developmental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dundee drug discovery unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international congress on drug therapy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+israel antiquities authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+delhi pollution control committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national academics of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+acquisition, technology and logistics agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' institute of genetics and developmental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national coral reef institute at nova southeastern university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of the ryukyus, niigata university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+clean air scientific advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pontifical catholic university of chile 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+synthesis philosophica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+liverpool john moores university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+infectious disease surveillance center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford's mathematical institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world science forum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+major research instrumentation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kyoto university's research institute for mathematical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who's strategic advisory group of experts on immunization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science and technology commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+woods canyon archaeological consultants 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central drug research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+general secretariat for research and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chemical forensics international technical working group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french ministry of higher education, research and innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+denka seiken 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us naval war college 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of são paulo school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+southern african human genome programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+organ solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations' world meteorological organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international research institute for climate and society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+southern owl nebula 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coalition for epidemic preparedness innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+board for investigation of misconduct in research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia university's international research institute for climate and society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+collaborative network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laser interferometer gravitational-wave observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vavilov research institute of plant industry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal college of obstetricians 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united kingdom atomic energy authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european atomic energy community 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+precision medicine initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australia institute think-tank 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wentworth group of concerned scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national academies press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+interplanetary observation network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian department of agriculture and water resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+darling basin authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japan geosciences union 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association of wood anatomists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kumasi centre for collaborative research in tropical medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for computational astrophysics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins center for health security 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins berman institute of bioethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences's institute of genetics and developmental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian institute of rice research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nanjing institute of geology and paleontology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+translational research informatics center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nsduh 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zayed university of artificial intelligence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swedish meteorological and hydrological institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stratospheric particle injection for climate engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+philipps university of marburg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french national institute of health and medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association of scientific, technical and medical publishers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+charité university hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+drc health research and training program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+usgs interagency grizzly bear study team 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cosmochemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european public health alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international union of geological sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european innovation council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of chile school of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cdu/spd coalition 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french committee for research and independent information on genetic engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sibley heart center cardiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association for women in mathematics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national council of foundations supporting institutions of higher education and scientific and technological research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of australian medical research institutes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian academy of technology and engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us intelligence advanced research projects agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+paleoresearch institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us centres for disease control and prevention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advanced laser interferometer gravitational-wave observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kolka glacier 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+umeå centre for microbial research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+teconomy partners 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california curation center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laboratorio elea phoenix 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+southern california earthquake center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agu council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agu ethics committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+inge lehmann medal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national center on advancing translational sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ncats 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+perlan project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+has institute for literary studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese state forestry administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kulakov national medical research center for obstetrics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+golden state killer 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dna doe project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pirogov russian national research medical university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nektar therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iberoamerican network of science and technology indicators 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of maryland in college park 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sea mammal research unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mctic 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pew charitable trusts' global penguin conservation campaign 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of integrative activities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+charité medical university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scripps glaciology group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk public health rapid support team 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+un framework convention on climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international committee for future accelerators 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ctnbio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+retrosense therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ices journal of marine science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+south africa radio astronomy observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+izmir biomedicine & genome center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science for technological innovation national science challenge 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+excellence commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lingacom 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+preventive medicine and public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for bioengineering of catalonia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+voit & mayer 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dylan morris 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+interacademy partnership 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york university institute for the study of the ancient world 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+evidence for democracy in ottawa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institut polytechnique de paris 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german research center for environmental health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+libgen 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mmwr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+george mason university's mercatus center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vibrant clean energy llc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guild of european research-intensive universities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mozilla science lab 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+translational health science and technology institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of civil rights 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of maryland school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university corporation for atmospheric research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sputnik planum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kuiper airborne observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national marine mammal foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences national astronomical observatory of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+thailand research fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins university kimmel cancer center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china manned space agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+moonshot task force 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alexander von humboldt biological resources research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature and science translational medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dutch national institute for subatomic physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uniqorn 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pew research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california institute for regenerative medicine in oakland 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+trump the world health organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eu general affairs council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intermediate palomar transient factory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european citizens 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+magellan telescopes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technical university of kaiserslautern 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gamaleya national center of epidemiology and microbiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for life science technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+collaboration for research excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sichuan university's west china hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american astronomical society's committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national earthquake information center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intergovernmental group on earth observations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+secure world foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+borneo orangutan survival foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+morris kahn 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+universal quantum and alpine quantum technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+honeywell quantum solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national collaborative research infrastructure strategy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heising-simons foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medical research future fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pfizer/biontech 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+skolkovo institute of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cubist pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bernhard nocht institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swift observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new jersey legislature 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technology and innovation committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+venezuelan amazon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+emory universitycompeting 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european molecular biology laboratory-european bioinformatics institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research and development institute in forestry marin dracea 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of spanish researchers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+darwin tree of life project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european economic area 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+melbourne energy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+earth system physics section 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us geological survey's alaska science center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cayetano heredia university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for cell biology and genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian institutes of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japan aerospace exploration agency institute of space 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+luxembourg agency for research integrity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kaelin groom 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of geneva medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+finless foods 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us centers for disease control and prevention and national institutes of health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+missouri breaks industries research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate action tracker 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kavli foundation of los angeles 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+michoacan university of saint nicholas of hidalgo 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal danish academy of fine arts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federation of american scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+savitribai phule pune university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national health and nutrition examination survey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+continuous electron beam accelerator facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuclear science advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gsa today 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+naurex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+equity task force 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of texas southwestern 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institute of allergies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rapid assistance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+foundation for polish science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hyasynth bio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+janssen vaccines & prevention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world wide lightning location network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+validation of alternative methods 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of arkansas for medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for respiratory diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international commission on radiological protection 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal bureau of investigation's bioterrorism protection team 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+broad institute of mit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations climate summit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aajc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china national accreditation service for conformity assessment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international network for government science advice 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+florida state university's coastal and marine laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental observation network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of marburg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+luna incognita 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chilean academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nejm group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations convention on biological diversity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+paulson institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+future of humanity institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of artificial intelligence and robotics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+healthpartners institute for education and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guangzhou general pharmaceutical research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+universities allied for essential medicines 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+korean institute of ocean science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal astronomical society letters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+paris institute of earth physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rencontres de moriond 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lebedev physical institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of earth scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technical university of darmstadt 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of social science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american academy of pediatrics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heliospheric observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+veneto institute of molecular medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global change biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european society for medical oncology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shenzhen international biotech leaders summit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+abel committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of california's berkeley 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alternative energies and atomic energy commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national carp control plan 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fausto llerena breeding center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kommersant 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consumer healthcare products association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california cooperative oceanic fisheries investigations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+campaign for social science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french academy of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genetics society of china 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese society for stem cell research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research institute for development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnrs institute of nuclear physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian journal of zoology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian institute for advanced research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mitogenome therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rxi pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+recombinetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aquabounty technologies of maynard 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of quantum computing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nikon small world 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stanley qi of stanford university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senseable city lab 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+keygene 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for the science of human history 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of texas at austin marine science institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+athena swan charter 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international ocean discovery program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for desert agriculture 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+white house national security council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technical university of chemnitz 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beijing national laboratory for condensed matter physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sherry marts 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of women in science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+howard hughes medical institute's janelia research campus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geos institute in ashland 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard medical school's infectious disease institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard t. h. chan school of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+smoke-free alternatives trade association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national geographic channel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+young academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unpaywall 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uct institutional reconciliation and transformation commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cinergi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gran sasso national laboratories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nepal climate observatory-pyramid 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for physics and nuclear engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oregon health & science university knight cancer institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french association of academics for the respect of international law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world health organization global plan 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of international science and engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tasmanian seed conservation centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+margaret torn of california's lawrence berkeley national laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+disaster prevention research institute of kyoto university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house committee on science, space and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arctic monitoring and assessment programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canada foundation for innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hertie institute for clinical brain research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences institute of genetics and developmental biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dornsife college of letters 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canada first research excellence fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+palaeoanthropologist bernard wood of george washington university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+copernicus atmospheric monitoring service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+meridiani planum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+elon musk 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sudanese national academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lhaaso 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih's national institute of general medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+integrated quantum science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+catalan institute for research and advanced studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+flexible solutions international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+texas water development board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cihr's institute of gender health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of infection and immunity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aurum institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vital strategies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china animal health and epidemiology center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rutgers cancer institute of new jersey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bhartiya kisan union 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tropic biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+karlsruhe tritium neutrino 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advaxis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nicaraguan academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+junjiu huang at sun yat-sen university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+union of concerned scientists' center for science and democracy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+linear collider collaboration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences key laboratory of pathogenic microbiology and immunology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian renewable energy agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swedish national council on medical ethics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+urgenda foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swedish association of university teachers and researchers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+micius foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of environmental research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oceaneos environmental solutions of vancouver 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aleph farms 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of economic development and commerce 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oceaneos 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us office of research integrity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cas) institute of zoology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for the study of inborn errors of metabolism 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+serbian progressive party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gwg energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+volkswagen foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johannes gutenberg university of mainz 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leverhulme centre for the future of intelligence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ceew 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for international environmental law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for genetics and society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zewail city of science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hawaiʻi institute of marine biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lehman brothers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+calorimetric electron telescope 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yunnan key laboratory of primate biomedical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brotman baty institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for biogeochemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+state key laboratory of agrobiotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+svb leerink 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+axion dark matter experiment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocean conservancy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+network-forum for biodiversity research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+evidence-based medicine datalab 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for international climate and environmental research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federation of young researchers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian centre for alternatives to animal methods 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+duke center for applied genomics and precision medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geooptics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american council on education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national science and technology council committee on science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+colombian association of scientific journalism 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european association of archaeologists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+insect research and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wake county superior court 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+met office hadley centre for climate science and services 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who global malaria programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china olympic committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nichd 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ocata therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hongmao liquor 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science china press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leverhulme trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nsf office of diversity and inclusion 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+allen institute for cell science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centers for environmental information 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human cell atlas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pennsylvania 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+spark therapeutics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian greens party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate change and coffee forest forum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+infectious diseases data observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global sea mineral resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ngee tropics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global partnership for sustainable development data 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+spherical tokamak for energy production 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of higher education, research and innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rome international center for materials science superstripes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research tax credit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+innovation and industry fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consortium of universities for global health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technology and economic assessment panel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+the chicago community trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of university export control officers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neo sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astrophysical observatory of turin 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aas committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+osaka university graduate school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european defence fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pontifical catholic university of paraná 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+concytec 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nsidc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of commerce.over 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+impossible foods 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yellowstone grizzlies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american association for the advancement of science and fens 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+virginia edgcomb 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cold atom laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french agency for food, environmental and occupational health & safety 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national biotechnology development strategy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+epa's office of air 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+covid-19 genomics uk consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+matrix chambers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national deep submergence facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wild nature institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian centre for space engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bioeconomy capital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indiana university school of informatics and computing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations international maritime organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research council of norway 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gmo laboratories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+colorado scientific society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+integrated disease surveillance programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international union of geodesy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american sociological review 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rooibos council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kids research institute of the children's hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global coral reef monitoring network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biomed research international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry for innovation and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indiana university lilly school of philanthropy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national institutes of health and national science foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of biological psychiatry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geometric intelligence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+corgenix 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+island digital ecosystem avatars 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+argentinian physical association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for health metrics and evaluation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cicero center for international climate research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american geophysical union fall meeting 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international system of units 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ebola research and development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ufrj's laboratory of elementary particles 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+danish cancer society research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mizuho securities usa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new enterprise associates 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+obstetrics and gynecology hospital of fudan university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national microbiome initiative 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tsingua university's institute of climate change and sustainable development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pawsey supercomputing centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+michael diamond at washington university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of science policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+forum for responsible research metrics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+therapeutics accelerator 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of naples federico ii 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research council's institute of molecular genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+first affiliated hospital of nanchang university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese center for disease control and prevention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+planetary sciences division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+integral molecular 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+german press agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+north carolina a&t state university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+academy of sciences leopoldina 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max plank institute for infection biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nemours/alfred i. dupont hospital for children 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esa's xmm-newton 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esa's rosetta 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+swiss ornithological institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peter doherty institute for infection and immunity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pla air force 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jefferson national laboratory in newport news 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bilgi university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+academy of military science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kinetx aerospace 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world mosquito program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+framework programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american federation of government employees 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+zwicky transient facility 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+the south china sea institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+akin gump 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jama network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oraquick 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnr institute for protein biochemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for scholarly publishing in wheat ridge 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hinxton group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+confederation of british industry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technology & education advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+martian surface 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british science association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ludwig maximilian university of munich 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+edition diffusion press sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ukrio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nhlbi 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global human development program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carnegie institution in stanford 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york medical college 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iop publishing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google earth engine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association of scientific, technical and medical 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mrc harwell institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+orangutan tropical peatland project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+orbit beyond of edison 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rollins school of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+helmholtz association of german research centres 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of erlangen-nuremberg 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal society's biological science awards committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian academy of the humanities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dynasty foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unicode consortium 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sciencedebate.org 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+consortia advancing standards in research administration information 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bernhard nocht institute for tropical medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of materials science of madrid 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' institute of policy management 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+agency for science, technology and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ginkgo bioworks 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ev-k2-cnr association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european sentinel 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+state university of new jersey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia university's lamont–doherty earth observatory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chemical sciences division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of history of the academy of sciences of moldova 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us air force's national security space institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum science and technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international arctic research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+surface heat budget 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+autonomous university of of yucatán 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biotechnology center of the technical university of dresden 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world meteorological organization's integrated global observing system 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+danish ministry of energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+solar orbiter 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+azure hermes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biotechnology industry research assistance council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ngo iran human rights 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+higher education policy institute in oxford 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council of young scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih office of strategic coordination 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+viiv healthcare 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european infravec 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sean n. parker centre for allergy & asthma research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate outreach 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european consortium of taxonomic facilities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+suzuka university of medical science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+themis bioscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mixed research unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+inmed pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+treatment action group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of the legislative auditor 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+baylor university's institute of archaeology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+georgia public health association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oxford vaccine group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national council of universities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california strategic growth council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+percy fitzpatrick institute of african ornithology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ebola diagnostics for partners in health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global positioning systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for genetics and society in berkeley 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hhs office for human research protections 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international thwaites glacier collaboration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research support program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of energy efficiency and renewable energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research center for molecular medicine of the austrian academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california department of corrections and rehabilitation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research integrity committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+kingston general health research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genexpert ebola assay 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+springer science+business media 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+roque de los muchachos observatory on la palma 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national university of quilmes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mycetoma research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+london mathematical society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research institute for science policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+multidisciplinary drifting observatory for the study of arctic climate 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+attosecond science lab 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+public health and prevention fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fudan university's institute of science and technology for brain-inspired intelligence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of evolutionary biology in barcelona 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of toronto scarborough 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate protection partnerships division 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+michoacan university of san nicolás de hidalgo 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cansino biologics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amsterdam university of applied sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+face2gene 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+social science research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us office for human research protections 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+earth system science data 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mahyco 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wyss center for bio 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+paul drude institute for solid state electronics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hennepin healthcare 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beijing institute of biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+spanish royal academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national science technology and innovation policy office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+italian health authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+union of concern scientists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+art world congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+basque nationalist party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hambantota port to china merchants port holdings 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnr's institute of genetic and biomedical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us association of research integrity officers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+who strategic advisory group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+narayan strategy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+giraffe conservation foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+antioquia school of engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental influences on child health outcomes 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hongmao pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian research council centre of excellence for coral reef studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sidney centre for plant health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+arrowhead pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central drugs standard control organisation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brown university school of public health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+myheritage 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+syros pharmaceuticals 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+stuttgart state museum of natural history 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national science foundation survey of graduate students 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coastal research group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national centre for monitoring 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+koch institute for integrative cancer research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pharmaceutical association committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esrc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+huntsman cancer institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of colorado boulder's natural history museum 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+integrative and comparative biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences' key laboratory of aerosol chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+march for science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lieber institute for brain development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new energy and industrial technology development organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institutional revolutionary party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bogor agricultural university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+british navy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+standing committee of the national people's congress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+smoke model evaluation experiment 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for basic biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint prevention and control mechanism 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for eye research australia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+earthrise alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cnr's institute of geosciences and earth resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of science, technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rescue global 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amazon environmental research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+venus exploration analysis group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+quantum computing 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+belgian maritime company 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mosa meat 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jezero crater 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indonesian young academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leiden ranking 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gates foundation's global health program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+microbiological diagnostic unit public health laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hawaii unity and liberation institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk independence party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+league of european research universities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+copernicus climate change service 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for american progress 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee on human rights 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bell burnell 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+motu economic and public policy research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of chicago's oriental institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+earth microbiome project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+open access scholarly publishers association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oregon health and sciences university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+massachusetts institute of technology and boston university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+samsung advanced institute of technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harbin veterinary research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yale school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international association for scientific, technical and medical publishers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+yale program on climate change communication 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+geneticist george church of harvard medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+animal welfare institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+deepsea challenger 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+vitalant research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iop publishing of bristol 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+victims of communism memorial foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+trichanalytics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mesoamerican society for biology and conservation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biospecimen governance committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fogarty international center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for higher education law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+icrp 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+serrapilheira institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guangzhou institute of geochemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+scripps translational science institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia center for children's environmental health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for disease dynamics, economics and policy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+alfred wegener institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+teamindus 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for defence studies and analyses 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+microscale 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of primate translational medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gensight biologics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association for research in vision 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+carlos iii health institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french national research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+program for promotion of research integrity at academia sinica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sant'anna school of advanced studies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of minnesota's center for infectious diseases research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+germany max planck digital library 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+singapore' national research foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cpc analytics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nautilus minerals of toronto 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ministry of trade, industry and energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+interamerican network of academies of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aptl 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+solidarity vaccine trial 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+federal emergency management agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jiangsu provincial center for disease control and prevention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+epa science advisory board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central comprehensively deepening reforms commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+china tribunal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ethics commission on automated 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee for ethics in science and higher education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+seven sons university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pujol university hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dr. lucy jones center for science and society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+joint center for research and education 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world health assembly 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national highway traffic safety administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international go federation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pathway genomics of san diego 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european federation of academies of sciences and humanities 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of zoos 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+encyclopaedia britannica 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tetralogic 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+business council for sustainable energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oceanographic institute of the university of são paulo 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+invizyne technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+islas marías federal penal colony 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sooam biotech research foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oil change international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre of excellence for climate system science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dutch association of innovative medicines 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+embo press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+climate leadership council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oceaneos environmental solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian academy of sciences institute of archeology and ethnography 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nasu institute of molecular biology and genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+diaprep systems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senate appropriations committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national children's study 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new south wales department of primary industries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+purna sulastya putra 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aerosol and particle technology laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+south african national biodiversity institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+max planck institute for chemical physics of solids 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jamestown rediscovery foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences institute of neuroscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of energy's high energy physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for worklife law 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+maharashtra hybrid seeds 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese academy of sciences national astronomical observatories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chemical & engineering news 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+all-russian scientific research institute of experimental physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nih office of portfolio analysis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+university of pittsburgh center for vaccine research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aaas center for science diplomacy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world medical association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+johns hopkins medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+editas biotechnologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sony world photography awards 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for biomedical research in kinshasa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for climate and global change research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+changchun changsheng biotechnology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ivy kupec 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nebular gas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+skagit county public health in mount vernon 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+reddie & grose 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations human rights committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american society of tropical medicine & hygiene 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+trait biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+disease foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tropical atmosphere ocean 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coral reef watch 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shaw prize foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+batthyány society of professors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+preventive medicine & diagnosis innovation program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+higher education statistics agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+oceaneos environ-mental solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french institute of oriental archaeology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+liberal democrat party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beth strain of the university of melbourne 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+public health foundation of india 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+tropical trump 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+given google 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+italian association of scientific societies in agriculture 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+thünen institute of wood research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biomedical basis of elite performance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heartland institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+louisiana state university school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+wildlife conservation research unit 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bowie medal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+netherlands institute for space research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new york stem cell foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+integrative biodiversity research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+long term ecological research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+janssen pharmaceutical companies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indian institute for science education and research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+saclay research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+astronomical journal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+washington state hospital association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+crowell & moring 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+u.s.-china economic and security review commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cell press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national center for lesbian rights 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national observatory on climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of genomics and integrative biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+equity advisory board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national university of cuyo 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us forest service's national genomics center for wildlife 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aedes genome working group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+holtzbrinck publishing group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuclear sciences institute of the national autonomous university of mexico 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+human wildlife solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global relay of observatories 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+french institute of health and medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national research, development and innovation office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+colombia agricultural institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+mainland affairs council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national academy of medicine and national academy of engineering 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national high magnetic field laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+r. poplin preprint 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+earth innovation institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+instex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+siem offshore 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peking university health science center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+central ethical review board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of microelectronics and microsystems 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american college of medical genetics and genomics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iucn species survival commission cetacean specialist group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bhartiya janata party 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+maritime studies program of williams college 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+evandro chagas institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society of german nature photographers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for vulnerable populations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+un convention on biodiversity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for responsive politics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of children's health protection 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+technical institute of physics and chemistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+south china sea institute of oceanology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of polar programs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dama/libra 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+iceye 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nigeria centre for disease control 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cochrane collaboration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+coral reef airborne laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+research misconduct board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aspen global change institute in basalt 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+revolutionary armed forces of colombia 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national agricultural imagery program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+statens serum insitut 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of food safety 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cross river gorilla landscape project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+adaptive biotechnologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nature cell biology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+journal publishing practices 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shiraz university of medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brazilian synchrotron light laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+riken center for biosystems dynamics research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rowland kao 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+fao conference 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national laboratory of genomics for biodiversity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+medrec 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+plan s. cell press 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+okjökull 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ashvin vishwanath 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for health security 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canberra deep space communication complex 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bilbao crystallographic server 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+drosophila board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us office of naval research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leibniz institute of agricultural development in transition economies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+beijing wuzi university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+intergovernmental oceanographic commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ncvc 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+covax 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+indonesian academy of sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european molecular biology organization 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+natural resources institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+education analytics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ohio sleep medicine institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+low carbon fuel standard 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+center for negative emissions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+island conservation in santa cruz 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national malaria control programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+eli consortium's international scientific and technical advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+earth science women's network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bonanza creek long term ecological research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for nuclear physics in milan 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute of geophysics and volcanology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gloucester resources 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+office of foreign assets control 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+standing committee on plants 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+duke global health innovation center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+snakebite healing and education society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cambridge antibody technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+public knowledge project's preservation network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+committee on climate change 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for applied ethology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cochrane database syst 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nik-zainal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+delhi dialogue commission 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+colombian academy of science 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pohang egs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us centers for diseases control and prevention 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dutch research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian centre for climate modelling and analysis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+prostate cancer foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+guangdong academy of medical sciences and guangdong general hospital 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+neurodegenerative diseases 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brooklyn criminal court 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk national institute for health and care excellence 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+voinnet 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+princeton policy school demands 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gns science research institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+march of dimes foundation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+griffiths university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+allen coral atlas 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+netherlands organization of scientific research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+unoosa 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+canadian astronomical society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hyung chun of yale university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+leloir institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+genetic biocontrol 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national primate research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aas data 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united kingdom research and innovation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jordanian scientific research fund 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+advocacy center for democratic culture 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+lowy institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+latin american collaborative study of congenital malformations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+similarity check 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senate committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+glyphosate task force 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for sustainable development and international relations 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+financial oversight and management board 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+california institute for biomedical research (calibr 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+amoy diagnostics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+peta's laboratory investigations department 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+trace gas orbiter 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chinese institute for brain research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+soccom 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+senckenberg biodiversity and climate research centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia university vagelos college of physicians 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+otago palaeogenetics laboratory 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national veterinary school of alfort 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute for evidence-based healthcare 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+meteor network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+institute of drug regulatory science at shenyang pharmaceutical university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+maxar technologies 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+jordan water project 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+esa's european space astronomy centre 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+frontiers group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nuziveedu seeds 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+feinstein institute for medical research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+international cotton advisory council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+doaj 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+gamaleya national research centre for epidemiology and microbiology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+academy of military medical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+pontifical academy for life 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+aerial photography field office 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+thai young scientists academy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+animal advocacy group humane society international 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chico mendes institute for biodiversity conservation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+korean baduk association 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+australian institute of marine sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rutgers aaup-american federation of teachers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laser interferometer space antenna 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+house science, space and technology committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+russian academy of science's institutes of molecular genetics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harrogate autumn flower show 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+laboratory for dynamic meteorology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sherlock biosciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+turku centre for quantum physics 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+andrew fire of stanford university school of medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+philippine space agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+puerto rican electric power authority 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+exoanalytic solutions 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+google health 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+chicago community trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bangabandhu sheikh mujib medical university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global malaria programme 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for longitudinal studies at university college london 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national independent scientific research group 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+navigation technology 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+centre for research on energy 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+shefa neuroscience research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+council for mainland affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+association of european research libraries 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european education area 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+society for research in child development 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+new iberia research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+dendreon corporation 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+heffter research institute in santa fe 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+world conference of science journalists 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+environmental protection network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+brotman baty institute for precision medicine 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+biologics consulting 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+royal society's rapid assistance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+us national oceanic and atmospheric administration 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+barrick gold corporation of toronto 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+hubert curien multidisciplinary institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bvdv 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+nobel committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sarang jeil church 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+columbia cancer agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for nuclear 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sidney kimmel comprehensive cancer center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+global research council 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+george church of harvard university 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+springer nature and taylor & francis 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+health and environment alliance 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+razavi neuroscience research center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+harvard university medical school 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sherlock bioscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uae space agency 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+united nations office for outer space affairs 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+european green deal 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+rand corporation for the wellcome trust 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+uk labour force survey 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national public health institute 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national institute for research on glaciers 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american schools of oriental research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+southern california seismic network 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+sukachev institute of forest 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+bgi research 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national agency for medicines and health products safety 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+the foundation fighting blindness 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+massachusetts institute of technology's plasma science and fusion center 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+ibs center for quantum nanoscience 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+migration advisory committee 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+plymouth university peninsula schools of medicine and dentistry 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+retina society 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+niaid-supported nicaraguan pediatric influenza cohort study 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+science in australia gender equity 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+japan aerospace exploration agency's institute for space and aeronautical sciences 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national space development program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+american climber science program 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+national association of ebola survivors 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+cfda 2021-02-03 NA NA NA NA NA NA NA NONE NA NA
+department of hydrology and meteorology 2021-02-03 67792541 node Department of Hydrology and Meteorology, Bhagwati marg, Kamalpokhari, Narayan Chaur, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 1201, नेपाल office government 0.501 नेपाल np Asia Southern Asia
+national academy 2021-02-03 143931274 way National Academy, Pancha Buddha Galli, Shankhamul Chok, Buddha Nagar, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 44617, नेपाल amenity school 0.201 नेपाल np Asia Southern Asia
+taliban 2021-02-03 14527782 node Taliban, Bhadaure Tamagi, Annapurna, कासà¥<8d>की, गणà¥<8d>डकी पà¥<8d>रदेश, 009755, नेपाल place village 0.375 नेपाल np Asia Southern Asia
+gene drive research 2021-02-03 45860468 node Gene Bank, F102, Tutepani, Satdobato, Patan, Lalitpur, वागà¥<8d>मती पà¥<8d>रदेश, 44702, नेपाल office government 0.101 नेपाल np Asia Southern Asia
+forum pharmaceuticals 2021-02-03 18726884 node Pharmaceuticals, New Plaza Marg, Bansh Ghari, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, KATHMANDU - 32, नेपाल amenity pharmacy 0.101 नेपाल np Asia Southern Asia
+national society for earthquake technology 2021-02-03 135924284 way National Society for Earthquake Technology (NSET), F103, Bhaisepati, Sainbu, Lalitpur, ललितपà¥<81>र, वागà¥<8d>मती पà¥<8d>रदेश, 13775, नेपाल building office 0.501 नेपाल np Asia Southern Asia
+nepal 2021-02-03 298303229 relation नेपाल boundary administrative 0.709769815032436 नेपाल np Asia Southern Asia
+ndrc 2021-02-03 140439984 way NDRC Nepal, Radha Mohan Marga, सिरà¥<8d>जना टोल, Naya Baneshwar, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 34, नेपाल building yes 0.101 नेपाल np Asia Southern Asia
+ccrc 2021-02-03 143860199 way CCRC, Kot Devi Marg, ठà¥<81>लोधारा, Jadibuti, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, WARD TBD, नेपाल amenity college 0.101 नेपाल np Asia Southern Asia
+national health service 2021-02-03 68009675 node Health Service, Nayapul-Makha, Makha, Modi Rural Municipality Ward No.2, देउपà¥<81>र, मोदि गाउà¤<81>पालिका (Modi), परà¥<8d>वत, गणà¥<8d>डकी पà¥<8d>रदेश, नेपाल amenity clinic 0.201 नेपाल np Asia Southern Asia
+np 2021-02-03 298303229 relation नेपाल boundary administrative 0.709769815032436 नेपाल np Asia Southern Asia
+district court 2021-02-03 139879884 way District Court, Dhulikhel, काà¤à¥<8d>रेपलाञà¥<8d>चोक, वागà¥<8d>मती पà¥<8d>रदेश, नेपाल landuse commercial 0.4 नेपाल np Asia Southern Asia
+world wildlife fund 2021-02-03 19138585 node World Wildlife Fund, Pabitra Pyara Marg, Kiran Chok, Baluwatar, Kathmandu Metropolitan Ward 4, काठमाडौं, वागà¥<8d>मती पà¥<8d>रदेश, 44616, नेपाल office ngo 0.301 नेपाल np Asia Southern Asia
+national academy of science and technology 2021-02-03 187375163 way National Academy Of Science And Technology(NAST), Main Road, Chauraha, Dhangadi, Dhangadi Sub Metropolitan, Dhanhadhi, सà¥<81>दà¥<81>र पशà¥<8d>चिमाञà¥<8d>चल विकास कà¥<8d>षेतà¥<8d>र, 091, नेपाल amenity school 0.601 नेपाल np Asia Southern Asia
+integrated mountain development 2021-02-03 76912703 node Snowland Integrated Development Center, Great Himalaya Trail, Tallo Basti, Simikot, Simkot, हà¥<81>मà¥<8d>ला, मधà¥<8d>य-पशà¥<8d>चिमाञà¥<8d>चल विकास कà¥<8d>षेतà¥<8d>र, करà¥<8d>णाली पà¥<8d>रदेश, नेपाल office ngo 0.201 नेपाल np Asia Southern Asia
+nauru 2021-02-03 257951954 relation Naoero boundary administrative 0.617910993005739 Naoero nr Oceania Micronesia
+parliament 2021-02-03 127825361 way Parliament, , Boe, Yaren, Naoero office government 0.531052870313343 Naoero nr Oceania Micronesia
+university of otago 2021-02-03 258279984 relation University of Otago, Ward Street Overbridge, North Dunedin, Dunedin, Dunedin City, Otago, 9016, New Zealand / Aotearoa amenity university 0.784012568793374 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+otago museum 2021-02-03 128177149 way Otago Museum, Great King Street, North Dunedin, Dunedin, Dunedin City, Otago, 9016, New Zealand / Aotearoa tourism museum 0.501865618613023 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+new zealand 2021-02-03 257922775 relation New Zealand / Aotearoa boundary administrative 0.991711172959347 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+daily telegraph 2021-02-03 68991583 node The Daily Telegraph building, 49, Tennyson Street, Bluff Hill, Napier City, Hawke's Bay, 4110, New Zealand / Aotearoa tourism attraction 0.201 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+magellan 2021-02-03 57692135 node Magellan, Westland District, West Coast, New Zealand / Aotearoa natural peak 0.4 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+university of waikato 2021-02-03 98803266 way University of Waikato, Greensboro Street, Hamilton East, Hamilton City, Waikato, 3216, New Zealand / Aotearoa amenity university 0.719453010430519 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+court of appeal 2021-02-03 154422323 way Court of Appeal, Aitken Street, Thorndon, Wellington, Wellington City, Wellington, 6140, New Zealand / Aotearoa amenity courthouse 0.677073009909361 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+antarctic program 2021-02-03 299195494 relation United States Antarctic Program, Harewood, Christchurch, Christchurch City, Canterbury, New Zealand / Aotearoa landuse military 0.4 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+university of canterbury 2021-02-03 120801912 way University of Canterbury, Balgay Street, Halswell-Hornby-Riccarton Community, Christchurch, Christchurch City, Canterbury, 8041, New Zealand / Aotearoa amenity university 0.77064161791144 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+gns science in lower hutt 2021-02-03 156362879 way GNS Science, 1, Fairway Drive, Avalon, Lower Hutt City, Wellington, 5040, New Zealand / Aotearoa office research 0.821073131097349 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+landcare research 2021-02-03 144804093 way Landcare Research - Manaaki Whenua, Riddet Road, Fitzherbert, Palmerston North City, Manawatū-Whanganui, 4118, New Zealand / Aotearoa building yes 0.201 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+victoria university of wellington 2021-02-03 176763739 way Victoria University of Wellington, Kitchener Street, Britomart, Auckland Central, Auckland, WaitematÄ<81>, Auckland, 1010, New Zealand / Aotearoa amenity university 0.401 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+national party 2021-02-03 26266228 node National Party, 510, Grey Street, Hamilton East, Hamilton City, Waikato, 3247, New Zealand / Aotearoa office political_party 0.201 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+springer nature 2021-02-03 107703717 way Springer Nature, The Warehouse Way, Northcote, KaipÄ<81>tiki, Auckland, 0627, New Zealand / Aotearoa office company 0.201 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+university of auckland 2021-02-03 259348817 relation University of Auckland, Ernest Davis Steps, Quay Park, Auckland Central, Auckland, WaitematÄ<81>, Auckland, 1053, New Zealand / Aotearoa amenity university 0.808489417863799 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+gns science 2021-02-03 156362879 way GNS Science, 1, Fairway Drive, Avalon, Lower Hutt City, Wellington, 5040, New Zealand / Aotearoa office research 0.521073131097349 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+toi ohomai institute of technology 2021-02-03 172831289 way Toi Ohomai Institute of Technology, Ashworth Street, Tokoroa Central, Tokoroa, South Waikato District, Waikato, 3444, New Zealand / Aotearoa amenity university 0.501 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+le maho 2021-02-03 64971060 node Mahoe, Tararua District, Manawatū-Whanganui, New Zealand / Aotearoa natural peak 0.4 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+massey university 2021-02-03 18195819 node Massey University, Turitea Road, Fitzherbert, Palmerston North City, Manawatū-Whanganui, 4118, New Zealand / Aotearoa building yes 0.637234715266229 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+ministry of education 2021-02-03 154002767 way Ministry of Education, 33, Bowen Street, Wellington Central, Wellington, Wellington City, Wellington, 6140, New Zealand / Aotearoa office government 0.715942243699873 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+washington university school of medicine 2021-02-03 96976049 way School of Medicine, Riccarton Avenue, Central City, Christchurch, Linwood-Central-Heathcote Community, Christchurch City, Canterbury, 84440, New Zealand / Aotearoa amenity university 0.301 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+national institute of water and atmospheric research 2021-02-03 157336573 way National Institute of Water and Atmospheric Research, Evans Bay Parade, Hataitai, Wellington, Wellington City, Wellington, 6011, New Zealand / Aotearoa amenity research_institute 0.701 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+institute of environmental science and research 2021-02-03 246653320 way Institute of Environmental Science and Research, Ambulance Drive, Kenepuru, Porirua City, Wellington, 5022, New Zealand / Aotearoa amenity research_institute 0.601 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+agresearch 2021-02-03 134392218 way Agresearch, Gerald Street, Lincoln, Selwyn District, Canterbury, 7608, New Zealand / Aotearoa building yes 0.101 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+defence technology agency 2021-02-03 298049383 way Defence Technology Agency Naval Field Station, Aotea Great Barrier, Auckland, New Zealand / Aotearoa landuse military 0.5 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+pacific islanders 2021-02-03 209280117 way Pacific Islanders' Presbyterian Church, Corner, Daniell Street, Newtown, Wellington, Wellington City, Wellington, 6021, New Zealand / Aotearoa amenity place_of_worship 0.201 New Zealand / Aotearoa nz Oceania Australia and New Zealand
+pdo 2021-02-03 92974544 way PDO, مسقط, عمان landuse industrial 0.3 عمان om Asia Western Asia
+oman 2021-02-03 258236468 relation عمان boundary administrative 0.680326025870515 عمان om Asia Western Asia
+oma 2021-02-03 258236468 relation عمان boundary administrative 0.680326025870515 عمان om Asia Western Asia
+research council 2021-02-03 200491619 way The Research Council, سكة 4854, مسقط, 1858, عمان office research 0.201 عمان om Asia Western Asia
+smithsonian tropical research institute 2021-02-03 176657993 way Smithsonian Tropical Research Institute, Calle Portobelo, Ancón, Distrito Panamá, Panamá, 080807, Panamá leisure nature_reserve 0.401 Panamá pa Americas Central America
+panama 2021-02-03 257650546 relation Panamá boundary administrative 0.714187410132119 Panamá pa Americas Central America
+business pharma 2021-02-03 80340067 node pharma, Calle E Norte, Barrio Manuel Quintero Villareal, David, Distrito David, ChiriquÃ, 7790414, Panamá shop convenience 0.111 Panamá pa Americas Central America
+cte 2021-02-03 65786091 node Aeropuerto de CartÃ, VÃa Nusagandi, CartÃ, Narganá, Distrito Gaigirgordub, Comarca Guna Yala, Panamá aeroway aerodrome 0.235968355602442 Panamá pa Americas Central America
+atto 2021-02-03 45780652 node Atto, Paras, Cangallo, Ayacucho, Perú place hamlet 0.35 Perú pe Americas South America
+department of interior 2021-02-03 182000790 way Ministerio del Interior, Calle 21, Corpac, San Isidro, Lima, AN ISIDRO 15036, Perú office government 0.33461374284578 Perú pe Americas South America
+posco 2021-02-03 44735208 node Posco, Mariano Nicolás Valcárcel, Camaná, Arequipa, Perú place village 0.375 Perú pe Americas South America
+tnt 2021-02-03 53869877 node TNT, Calle Lizardo Alzamora Oeste, San Isidro, Lima, 15073, Perú amenity post_office 0.495377817800873 Perú pe Americas South America
+lal 2021-02-03 258444597 relation La Libertad, Perú boundary administrative 0.489309406949894 Perú pe Americas South America
+university of the andes 2021-02-03 51366096 node Universidad Peruana Los Andes - Sede Lima, 579, Avenida Cuba, Jesús MarÃa, Lima, 011, Perú amenity school 0.101 Perú pe Americas South America
+peru 2021-02-03 258422900 relation Perú boundary administrative 0.762405923925327 Perú pe Americas South America
+unas 2021-02-03 77540241 node Uñas, Huancayo, JunÃn, 12002, Perú place suburb 0.275 Perú pe Americas South America
+ird 2021-02-03 22294051 node Institut de Recherche pour le Developpement, 455, Calle 17, Corpac, San Isidro, Lince, Lima, 27, Perú office ngo 0.412830331815194 Perú pe Americas South America
+food and agriculture organization of the united nations 2021-02-03 64529240 node Food and Agriculture Organization of the United Nations, 328, Calle Manuel Almenara, Miraflores, Lima, 15048, Perú office diplomatic 0.801 Perú pe Americas South America
+department of the interior 2021-02-03 182000790 way Ministerio del Interior, Calle 21, Corpac, San Isidro, Lima, AN ISIDRO 15036, Perú office government 0.33461374284578 Perú pe Americas South America
+farvet 2021-02-03 202442899 way Farvet, Antigua Carretera Panamericana Sur, Antarica, Cruz de La Molina, Chincha Alta, Chincha, Ica, Perú shop yes 0.101 Perú pe Americas South America
+madre de dios 2021-02-03 258281731 relation Madre de Dios, Perú boundary administrative 0.762716953241034 Perú pe Americas South America
+ssrn 2021-02-03 258244064 relation Lima, Perú boundary administrative 0.673001488378204 Perú pe Americas South America
+ica 2021-02-03 12549210 node Ica, Perú place province 0.65 Perú pe Americas South America
+etac 2021-02-03 193236562 way Etac Perú, Villa El Salvador, Lima, Perú landuse industrial 0.3 Perú pe Americas South America
+unap 2021-02-03 105022664 way Unap, Pueblo Libre, Lima, L32, Perú highway residential 0.2 Perú pe Americas South America
+spbc 2021-02-03 10555244 node Caballococha Airport, Caballococha, Ramón Castilla, Mariscal Ramón Castilla, Loreto, Perú aeroway aerodrome 0.110430435186894 Perú pe Americas South America
+lam 2021-02-03 258687618 relation Lambayeque, Perú boundary administrative 0.572574193515447 Perú pe Americas South America
+bio farma 2021-02-03 188369775 way Bio Farma, Avenida Gaston Garcia Rada, Punta Hermosa, Lima, 15846, Perú amenity pharmacy 0.201 Perú pe Americas South America
+conida 2021-02-03 81730105 node Agencia Espacial del Perú - CONIDA, 1069, Luis Felipe Villaran, San Isidro, Lima, 15046, Perú office government 0.101 Perú pe Americas South America
+tambopata national reserve 2021-02-03 259211841 relation Reserva Nacional Tambopata, Madre de Dios, Perú boundary protected_area 0.407572334229807 Perú pe Americas South America
+us mineral management service 2021-02-03 34369968 node Department of Mineral Policy and Geohazards Management & Dept. Of Mineral and Energy, Elanese Street, Konedobu, Port Moresby, National Capital District, Papua Region, 111, Papua Niugini building office 0.201 Papua Niugini pg Oceania Melanesia
+papua new guinea 2021-02-03 258241053 relation Papua Niugini boundary administrative 0.788329503761047 Papua Niugini pg Oceania Melanesia
+namura 2021-02-03 83853387 node Namura, Eastern Highlands, Highlands Region, Papua Niugini place village 0.375 Papua Niugini pg Oceania Melanesia
+us department of education 2021-02-03 97691861 way Department of Education, Meralco Avenue, Oranbo, Pasig, Metro Manila, 1604, Luzon office government 0.708010995739962 Luzon ph Asia South-Eastern Asia
+icct 2021-02-03 66980232 node ICCT College, Manila East Road, Grand Monaco Casa Royale, Calumpang, Rizal, Calabarzon, 01940, Luzon amenity college 0.101 Luzon ph Asia South-Eastern Asia
+el rosario university 2021-02-03 14118625 node Sto Rosario Montessori, Road 3, San Miguel Heights, Valenzuela, Third District, Metro Manila, 1476, Luzon amenity school 0.201 Luzon ph Asia South-Eastern Asia
+nccp 2021-02-03 132164413 way National Council of Churches of the Philippines, EDSA, West Triangle, 1st District, Quezon City, Metro Manila, 1104, Luzon office religion 0.001 Luzon ph Asia South-Eastern Asia
+court of appeals 2021-02-03 258754444 relation Court of Appeals, Maria Orosa Street, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon office government 0.301 Luzon ph Asia South-Eastern Asia
+fcc 2021-02-03 99524539 way First Cityland Condo, Rada, Legazpi, San Lorenzo, Makati 1st District, Makati, Fourth District, Metro Manila, 1200, Luzon building yes 0.001 Luzon ph Asia South-Eastern Asia
+research center 2021-02-03 226223945 way Research Center, R. Jeciel, Kaytapos, Indang, Cavite, Calabarzon, 4122, Luzon building university 0.201 Luzon ph Asia South-Eastern Asia
+department of justice 2021-02-03 258462661 relation Department of Justice, Padre Faura Street, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon office government 0.672714057293031 Luzon ph Asia South-Eastern Asia
+university of el rosario 2021-02-03 136114820 way University of the Philippines Baguio, Governor Pack Road, Montinola Subdivision, Prieto Compound, Baguio, Benguet, Cordillera Administrative Region, 2600, Luzon amenity university 0.531005307834616 Luzon ph Asia South-Eastern Asia
+environmental change institute 2021-02-03 192350518 way Institute of Climate Change and Environmental Management, Academic Avenue, Villa Isidra, Bagong Sikat, Nueva Ecija, Central Luzon, 3120, Luzon building university 0.301 Luzon ph Asia South-Eastern Asia
+georgia college 2021-02-03 254844845 way Georgia College, Psalms Street, Phase 6a, San Jose del Monte, Bulacan, Central Luzon, 3023, Luzon amenity school 0.201 Luzon ph Asia South-Eastern Asia
+office of the united nations 2021-02-03 159967172 way United Nations, Taft Avenue, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon railway station 0.529847857867275 Luzon ph Asia South-Eastern Asia
+ecol 2021-02-03 301230341 way Ecol, Purok 16, Commonwealth, 2nd District, Quezon City, Metro Manila, 1121, Luzon highway residential 0.2 Luzon ph Asia South-Eastern Asia
+us department of justice 2021-02-03 258462661 relation Department of Justice, Padre Faura Street, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon office government 0.772714057293031 Luzon ph Asia South-Eastern Asia
+phivolcs 2021-02-03 112883420 way Philippine Institute of Volcanology and Seismology, Carlos P. Garcia Avenue, Village B, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon office government 0.34030088440925 Luzon ph Asia South-Eastern Asia
+odysseus 2021-02-03 94252118 way Odysseus, North Olympus 3, 5th District, Quezon City, Metro Manila, 1124, Luzon highway residential 0.2 Luzon ph Asia South-Eastern Asia
+committee 2021-02-03 94937180 way Committee, Batasan Hills, 2nd District, Quezon City, Metro Manila, 1126, Luzon highway residential 0.2 Luzon ph Asia South-Eastern Asia
+air and energy 2021-02-03 158638457 way Concepcion Carrier Air-Conditioning Co., Energy, Light Industry and Science Park I, Cabuyao, Laguna, Calabarzon, 4025, Luzon building industrial 0.301 Luzon ph Asia South-Eastern Asia
+national journal 2021-02-03 57508627 node Journal, Cuta, Poblacion, Batangas City, Batangas, Calabarzon, 4200, Luzon place neighbourhood 0.35 Luzon ph Asia South-Eastern Asia
+philippine institute of volcanology 2021-02-03 112883420 way Philippine Institute of Volcanology and Seismology, Carlos P. Garcia Avenue, Village B, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon office government 0.74030088440925 Luzon ph Asia South-Eastern Asia
+securities and exchange commission 2021-02-03 165198298 way Securities and Exchange Commission, Gen Hughes Street, City Proper, Iloilo City, Iloilo, Western Visayas, 5000, Luzon office government 0.401 Luzon ph Asia South-Eastern Asia
+alibaba 2021-02-03 300971258 node Alibaba, Calbayog, Samar, Eastern Visayas, 6710, Luzon place village 0.375 Luzon ph Asia South-Eastern Asia
+aav 2021-02-03 240979680 way Allah Valley Airport, Surallah - T'boli Road, Veterans, South Cotabato, Soccsksargen, 9512, Luzon aeroway aerodrome 0.328965278593994 Luzon ph Asia South-Eastern Asia
+healing foundation 2021-02-03 12798005 node Healing Hand Center Foundation, Don Julian Rodriguez Avenue, Purok 7, Datu Loho Village, Metroville Subdivision, Davao City, Davao Region, 8000, Luzon amenity community_centre 0.201 Luzon ph Asia South-Eastern Asia
+san francisco department of health 2021-02-03 674851 node Department Of Health, Rizal Avenue, Barangay 335, Santa Cruz, Third District, Manila, First District, Metro Manila, 1003, Luzon amenity public_building 0.401 Luzon ph Asia South-Eastern Asia
+manhattan project 2021-02-03 113359528 way Manhattan Townhomes, Project 4, 3rd District, Quezon City, Metro Manila, Luzon landuse residential 0.4 Luzon ph Asia South-Eastern Asia
+office of resource development 2021-02-03 187766554 way Cagayan Valley Research, Resource and Development, Maharlika Highway, Apanay, Isabela, Cagayan Valley, 3309, Luzon office research 0.201 Luzon ph Asia South-Eastern Asia
+ph 2021-02-03 258179528 relation Philippines boundary administrative 0.869521465880606 Philippines ph Asia South-Eastern Asia
+national science 2021-02-03 151393273 way Science, Teachers' Village Balong Bato, Balintawak, 6th District, Quezon City, Metro Manila, 1476, Luzon highway residential 0.2 Luzon ph Asia South-Eastern Asia
+stm association 2021-02-03 116275447 way STM Avenue, Santiago Villas, San Pedro, Davao City, Davao Region, 8023, Luzon highway residential 0.2 Luzon ph Asia South-Eastern Asia
+us treasury 2021-02-03 97459657 way Treasury, SSS Employees Housing Project, North Fairview, 5th District, Quezon City, Metro Manila, 1118, Luzon highway residential 0.3 Luzon ph Asia South-Eastern Asia
+institute of tropical medicine 2021-02-03 106986237 way Research Institute for Tropical Medicine, Research Drive, Filinvest City, Alabang, Muntinlupa, Fourth District, Metro Manila, 1781, Luzon amenity hospital 0.560958143076972 Luzon ph Asia South-Eastern Asia
+uk cabinet office 2021-02-03 76783411 node PRU Life UK, Session Road, Court of Appeals Compound, Session Road Area, Benguet, Cordillera Administrative Region, 2600, Luzon office insurance 0.101 Luzon ph Asia South-Eastern Asia
+office of the president 2021-02-03 657592 node Office of the President, Jose P. Laurel Street, San Miguel, Sixth District, Manila, First District, Metro Manila, 1005, Luzon office government 0.66851441835616 Luzon ph Asia South-Eastern Asia
+university of la laguna 2021-02-03 203735425 way University of the Philippines Los Baños, Valentin Sajor, Makiling Heights Housing, Batong Malake, Los Baños, Laguna, Calabarzon, 4031, Luzon amenity university 0.77788219964298 Luzon ph Asia South-Eastern Asia
+southwest fisheries science center 2021-02-03 246594258 way National Freshwater Fisheries Technology Center, Magtanggol Road, Roseville Heights Subdivision, Muñoz, Nueva Ecija, Central Luzon, 3121, Luzon amenity research_institute 0.201 Luzon ph Asia South-Eastern Asia
+united nations 2021-02-03 159967172 way United Nations, Taft Avenue, Barangay 670, Fifth District, Manila, First District, Metro Manila, 1000, Luzon railway station 0.529847857867275 Luzon ph Asia South-Eastern Asia
+ims health 2021-02-03 71334061 node IMS Health Care, Inc., National Road, Diaz Compound, Putatan, Muntinlupa, Fourth District, Metro Manila, 1770, Luzon amenity clinic 0.201 Luzon ph Asia South-Eastern Asia
+medicare 2021-02-03 214582438 way Medicare, SSS Employees Housing Project, North Fairview, 5th District, Quezon City, Metro Manila, 1118, Luzon highway residential 0.2 Luzon ph Asia South-Eastern Asia
+john hopkins university 2021-02-03 97992857 way Johns Hopkins Street, Sampaloc 4, Bagong Bayan, University Hills Estate, Cavite, Calabarzon, 4115, Luzon highway residential 0.4 Luzon ph Asia South-Eastern Asia
+university of the philippines diliman 2021-02-03 176421389 way University of the Philippines Diliman, Maginoo, Pinyahan, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon amenity university 0.933110254645355 Luzon ph Asia South-Eastern Asia
+ninoy aquino parks and wildlife center 2021-02-03 100214475 way Ninoy Aquino Parks & Wildlife Center, 1st District, Quezon City, Metro Manila, 1100, Luzon leisure park 0.65 Luzon ph Asia South-Eastern Asia
+john arnold foundation 2021-02-03 80843435 node Arnold Jansenn Catholic Mission Foundation, Inc., Luzviminda Road, Luzviminda 2, Bagong Bayan, Dasmariñas, Cavite, Calabarzon, 4115, Luzon amenity social_facility 0.201 Luzon ph Asia South-Eastern Asia
+institute of biology 2021-02-03 259072446 relation Institute of Biology, Ma. Regidor, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon building yes 0.301 Luzon ph Asia South-Eastern Asia
+greenpeace east asia 2021-02-03 27258345 node Greenpeace Southeast Asia, 30, Dr. Lazcano Street, Laging Handa, Sacred Heart, Scout Area, 4th District, Quezon City, Metro Manila, 1103, Luzon office ngo 0.301 Luzon ph Asia South-Eastern Asia
+heritage 2021-02-03 196554341 way The Heritage, Cebu, Central Visayas, 6001, Luzon place village 0.375 Luzon ph Asia South-Eastern Asia
+macarthur 2021-02-03 258711621 relation MacArthur, Leyte 2nd District, Leyte, Eastern Visayas, 6509, Luzon boundary administrative 0.464463378933884 Luzon ph Asia South-Eastern Asia
+freedom of information 2021-02-03 66528974 node Freedom of Information, 1575, Room 3, Jose P. Laurel Street, San Miguel, Sixth District, Manila, First District, Metro Manila, 1005, Luzon office government 0.301 Luzon ph Asia South-Eastern Asia
+national school of statistics 2021-02-03 199594389 way School of Statistics, Pardo de Tavera Street, Village B, UP Campus, Diliman, 4th District, Quezon City, Metro Manila, 1101, Luzon building yes 0.301 Luzon ph Asia South-Eastern Asia
+bloomberg l.p. 2021-02-03 113997147 way Bloom Burg, Muntindilaw, Antipolo, Rizal, Calabarzon, 1870, Luzon highway residential 0.3 Luzon ph Asia South-Eastern Asia
+pinatubo 2021-02-03 300899502 way Pinatubo, Clark Center Townhomes, Margot, Mabalacat, Pampanga, Central Luzon, 2010, Luzon highway unclassified 0.2 Luzon ph Asia South-Eastern Asia
+irri 2021-02-03 258457516 relation International Rice Research Institute, Sampaguita, Masaya, Los Baños, Bay, Laguna, Calabarzon, 4031, Luzon amenity research_institute 0.375700293936422 Luzon ph Asia South-Eastern Asia
+climate science center 2021-02-03 244989659 way Climate Change Center, Academic Avenue, Villa Isidra, Bagong Sikat, Nueva Ecija, Central Luzon, 3120, Luzon building university 0.201 Luzon ph Asia South-Eastern Asia
+department of health 2021-02-03 674851 node Department Of Health, Rizal Avenue, Barangay 335, Santa Cruz, Third District, Manila, First District, Metro Manila, 1003, Luzon amenity public_building 0.301 Luzon ph Asia South-Eastern Asia
+pallas 2021-02-03 52259714 node Pallas, Nueva Vizcaya, Cagayan Valley, Luzon place village 0.375 Luzon ph Asia South-Eastern Asia
+cleantech 2021-02-03 256929799 way Cleantech, Jose Abad Santos Avenue, Zone 4, Arayat, Pampanga, Central Luzon, 2012, Luzon amenity fuel 0.101 Luzon ph Asia South-Eastern Asia
+doj 2021-02-03 53180869 node DOJ, Lino Chatto Drive, Tagbilaran, Bohol, Central Visayas, 6300, Luzon office government 0.101 Luzon ph Asia South-Eastern Asia
+application of technology 2021-02-03 160457126 way Technology Application and Promotion Institute, Upao, Pendatum Village, Central Bicutan, Taguig, Fourth District, Metro Manila, 1631, Luzon building yes 0.201 Luzon ph Asia South-Eastern Asia
+international coalition 2021-02-03 164385165 way Yamato International School, Coalition Street, Lambunao, Iloilo, Western Visayas, 6108, Luzon amenity school 0.201 Luzon ph Asia South-Eastern Asia
+national university of general san martín 2021-02-03 127228015 way National University, 551, Mansanas, Sampaloc, 4th District, Manila, First District, Metro Manila, 1008, Luzon amenity university 0.70242374951 Luzon ph Asia South-Eastern Asia
+department of science and technology 2021-02-03 99532466 way Department of Science and Technology, Taguig, Fourth District, Metro Manila, Luzon landuse commercial 0.862603275084388 Luzon ph Asia South-Eastern Asia
+iqc 2021-02-03 301753277 node IQC TRADING, Pennsylvania Avenue, San Agustin, San Fernando, La Union, Ilocos, 2500, Luzon shop hardware 0.101 Luzon ph Asia South-Eastern Asia
+international rice research institute 2021-02-03 258457516 relation International Rice Research Institute, Sampaguita, Masaya, Los Baños, Bay, Laguna, Calabarzon, 4031, Luzon amenity research_institute 0.775700293936422 Luzon ph Asia South-Eastern Asia
+department of education 2021-02-03 97691861 way Department of Education, Meralco Avenue, Oranbo, Pasig, Metro Manila, 1604, Luzon office government 0.708010995739962 Luzon ph Asia South-Eastern Asia
+department of agriculture 2021-02-03 106739978 way Department of Agriculture, Vasra, 1st District, Quezon City, Metro Manila, 1128, Luzon landuse commercial 0.5 Luzon ph Asia South-Eastern Asia
+new york supreme court 2021-02-03 81926168 node New York Supreme, Plaridel Street, Nepo Center, Angeles, Pampanga, Central Luzon, 1992, Luzon amenity restaurant 0.301 Luzon ph Asia South-Eastern Asia
+international science and technology center 2021-02-03 83192846 node Eastwood International Institute of Science and Technology, Calle Rizal, Santo Niño, Guagua, Pampanga, Central Luzon, 2003, Luzon amenity college 0.401 Luzon ph Asia South-Eastern Asia
+un world food programme 2021-02-03 71056715 node UN World Food Programme, Sheridan Street, Buayang Bato, Mandaluyong, Metro Manila, 1605, Luzon office ngo 0.401 Luzon ph Asia South-Eastern Asia
+national university 2021-02-03 127228015 way National University, 551, Mansanas, Sampaloc, 4th District, Manila, First District, Metro Manila, 1008, Luzon amenity university 0.60242374951 Luzon ph Asia South-Eastern Asia
+academy of science 2021-02-03 224316912 way National Academy of Science and Technology Philippines, Saliksik, Department of Science and Technology, Taguig, Fourth District, Metro Manila, 1631, Luzon building yes 0.301 Luzon ph Asia South-Eastern Asia
+public citizen 2021-02-03 56406294 node Public WI-FI (PISO WI-FI 011216), S.G. Calulo Street, Citizen Village, Polomolok, South Cotabato, Soccsksargen, 9504, Luzon amenity cafe 0.201 Luzon ph Asia South-Eastern Asia
+marina biotech 2021-02-03 55241914 node Biotech, Narra Road, San Antonio, San Antonio Zone 3, San Pedro, Laguna, Calabarzon, 4023, Luzon highway bus_stop 0.101 Luzon ph Asia South-Eastern Asia
+department of science technology 2021-02-03 99532466 way Department of Science and Technology, Taguig, Fourth District, Metro Manila, Luzon landuse commercial 0.762603275084388 Luzon ph Asia South-Eastern Asia
+asian development bank 2021-02-03 96144607 way 6, Asian Development Bank, Mandaluyong, Metro Manila, 1550, Luzon landuse commercial 0.818276858334084 Luzon ph Asia South-Eastern Asia
+bmc infectious diseases 2021-02-03 123804219 way Infectious Diseases, BGH Driveway, Montinola Subdivision, Phil-Am, Benguet, Cordillera Administrative Region, 30101, Luzon building hospital 0.201 Luzon ph Asia South-Eastern Asia
+philippines 2021-02-03 258179528 relation Philippines boundary administrative 0.869521465880606 Philippines ph Asia South-Eastern Asia
+institute of technology 2021-02-03 238492689 way institute of technology, Marcos Highway, Cabading, Antipolo, Rizal, Calabarzon, 1870, Luzon amenity college 0.301 Luzon ph Asia South-Eastern Asia
+cabinet 2021-02-03 76081873 node Cabinet, Agusan del Norte, Caraga, 6805, Luzon place village 0.375 Luzon ph Asia South-Eastern Asia
+university of trieste 2021-02-03 152401459 way University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان amenity university 0.201 پاکستان pk Asia Southern Asia
+university of engineering and technology 2021-02-03 161352903 way University of Engineering and Technology, Kot Khwaja Saeed Rd, Kot Khwaja Saeed, لاÛ<81>ور, پنجاب, 54010, پاکستان amenity university 0.501 پاکستان pk Asia Southern Asia
+mach 2021-02-03 169738285 way Mach, Railway Station RD, Mach, بلوچستان, پاکستان railway station 0.535994792823483 پاکستان pk Asia Southern Asia
+us securities and exchange commission 2021-02-03 226472772 way Securities and Exchange Commission, Leckil Road, Central Business District, Sultanabad, Lyari, کراچی, سنڌ, 72500, پاکستان office government 0.501 پاکستان pk Asia Southern Asia
+quaid-i-azam university 2021-02-03 173086495 way Quaid e azam Commerce College, Electrical Lawn, Danish Abad, University Town, خیبر پښتونخوا, پاکستان office educational_institution 0.401 پاکستان pk Asia Southern Asia
+chemical society 2021-02-03 58642829 node Pak Petro Chemical Pvt Ltd, قومی شاÛ<81>راÛ<81>, Sindhi Jamat Housing Society, Dogar Dairy Farm, Shah Latif Town, کراچی, سنڌ, 75030, پاکستان office company 0.201 پاکستان pk Asia Southern Asia
+university of 2021-02-03 152401459 way University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان amenity university 0.201 پاکستان pk Asia Southern Asia
+cecos university 2021-02-03 157527902 way Cecos University, اسٹریٹ 1, Hayatabad, خیبر پښتونخوا, پاکستان amenity university 0.201 پاکستان pk Asia Southern Asia
+psi 2021-02-03 48903686 node Peshi, بلوچستان, پاکستان railway station 0.435785692031318 پاکستان pk Asia Southern Asia
+office of higher education commission 2021-02-03 57649548 node Higher Education Commission, Maqboolabad Road 11, Dawood Society, بÛ<81>ادر آباد, کراچی, سنڌ, 75460, پاکستان office government 0.301 پاکستان pk Asia Southern Asia
+university of engineering & technology 2021-02-03 161352903 way University of Engineering and Technology, Kot Khwaja Saeed Rd, Kot Khwaja Saeed, لاÛ<81>ور, پنجاب, 54010, پاکستان amenity university 0.401 پاکستان pk Asia Southern Asia
+lahore university of management sciences 2021-02-03 107688614 way Lahore University of Management Sciences, Street 18, Rehman Villas, Chung Khurad, Lahore District, پنجاب, 54792, پاکستان amenity university 0.501 پاکستان pk Asia Southern Asia
+university of guanajuato 2021-02-03 152401459 way University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان amenity university 0.201 پاکستان pk Asia Southern Asia
+physics society of iran 2021-02-03 55665155 node Talha's Physics Academy, Begum Khursheed Road, Malir Town, Malir, کراچی, سنڌ, 75080, پاکستان office educational_institution 0.101 پاکستان pk Asia Southern Asia
+faisal islam 2021-02-03 64354761 node SADIQUE-E- AQBAR MOSQUE KNOW AS FAISAL MASJID, سڑک منڈی بÛ<81>اؤالدین, گوجرÛ<81>‬‎ قینچی, Khai, پنجاب, 50400, پاکستان amenity place_of_worship 0.101 پاکستان pk Asia Southern Asia
+university of istanbul 2021-02-03 152401459 way University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان amenity university 0.201 پاکستان pk Asia Southern Asia
+optical society 2021-02-03 58951925 node Eastern Optical, Alamgir Road, Bahadurabad Commercial Area, Pakistan Employee Co-operative Housing Society, کراچی, سنڌ, 75460, پاکستان shop optician 0.201 پاکستان pk Asia Southern Asia
+pakistan meteorological department 2021-02-03 250344164 way Pakistan Meteorological Department, Bannu Road, Al-Waris Town, ڈیرÛ<81> اسماعیل خان, خیبر پښتونخوا, 29050, پاکستان office government 0.301 پاکستان pk Asia Southern Asia
+research satellite 2021-02-03 57603280 node Poultry Research Institute, Murree Road, Gulistan-e-Jinnah, Gulshan Dadan Khan, Asghar Mall Scheme, راولپنڈی سٹی, ضلع راولپنڈی, پنجاب, 46300, پاکستان office research 0.101 پاکستان pk Asia Southern Asia
+wns 2021-02-03 2678292 node Nawabshah Airport, ایئرپورٹ روڈ, Haqqani Town, نوابشاÛ<81>‎, سنڌ, پاکستان aeroway aerodrome 0.325302870611459 پاکستان pk Asia Southern Asia
+people royal society 2021-02-03 56507289 node Sharmila Farooqi People Party Parliament, Shahzad Khalil Road, Dawood Society, بÛ<81>ادر آباد, کراچی, سنڌ, 75460, پاکستان tourism motel 0.201 پاکستان pk Asia Southern Asia
+university of milan 2021-02-03 152401459 way University of ..., Canal Road, بÛ<81>اولپور, پنجاب, 63100, پاکستان amenity university 0.201 پاکستان pk Asia Southern Asia
+darpa 2021-02-03 50587431 node Darpa Khel, North WazÄ«ristÄ<81>n Agency, خیبر پښتونخوا, پاکستان place village 0.375 پاکستان pk Asia Southern Asia
+educational foundation 2021-02-03 58387964 node Family Educational Services Foundation, Johar Road, Block 13 Gulistan-e-Johar, Gulistan e Johar, Gulistan-e-Johar, کراچی, سنڌ, 75300, پاکستان office educational_institution 0.201 پاکستان pk Asia Southern Asia
+government college university 2021-02-03 167220711 way Government College University, Chatterjee Road, Government Printing Press, Old Anarkali, لاÛ<81>ور, پنجاب, 531, پاکستان amenity university 0.301 پاکستان pk Asia Southern Asia
+pakistan institute of engineering and applied sciences 2021-02-03 126357678 way Pakistan Institute of Engineering and Applied Sciences (PIEAS), Market Road, ÙˆÙ<81>اقی دارالØکومت اسلام آباد, 44000, پاکستان amenity university 0.701 پاکستان pk Asia Southern Asia
+medical advancement 2021-02-03 59158684 node Pakistan Institute of Medical Advancement, Shahrah-e-Pakistan, FB Area Block 10, FB Area, Gulberg, کراچی, سنڌ, 75950, پاکستان amenity hospital 0.201 پاکستان pk Asia Southern Asia
+abdullah gül university 2021-02-03 97874378 way Gul Mohar Road, Danish Abad, University Town, خیبر پښتونخوا, 2500, پاکستان highway residential 0.2 پاکستان pk Asia Southern Asia
+pakistan irrigation and power department 2021-02-03 59500801 node Irrigation & Power Department, سرکلر روڈ, Ù<81>یصل آباد, پنجاب, 041, پاکستان office government 0.301 پاکستان pk Asia Southern Asia
+higher education commission 2021-02-03 57649548 node Higher Education Commission, Maqboolabad Road 11, Dawood Society, بÛ<81>ادر آباد, کراچی, سنڌ, 75460, پاکستان office government 0.301 پاکستان pk Asia Southern Asia
+technology and society 2021-02-03 224764336 way Usman Institute of Technology, ST-13, Abul Hassan Isphani Road, Metroville 3, Memon Nagar, کراچی, سنڌ, 75300, پاکستان amenity university 0.43855055665356 پاکستان pk Asia Southern Asia
+national institute of oceanography 2021-02-03 234104875 way National Institute of Oceanography, Sikandarabad, Keamari, کراچی, سنڌ, پاکستان landuse commercial 0.6 پاکستان pk Asia Southern Asia
+atrap 2021-02-03 24498241 node AtrÄ<81>p, ضلع آواران / Awaran, بلوچستان, پاکستان place village 0.275 پاکستان pk Asia Southern Asia
+forman christian college 2021-02-03 43029428 node Forman Christian College University, East Canal Bank Road, Zaildar Park, Muslim Town, Ichhra, پنجاب, 57760, پاکستان amenity university 0.301 پاکستان pk Asia Southern Asia
+pakistan 2021-02-03 258223154 relation پاکستان boundary administrative 0.762909367264627 پاکستان pk Asia Southern Asia
+data & society 2021-02-03 54880380 node Data Coach, یونیورسٹی روڈ, Gulshan-e-Iqbal Block 11, Gulshan-e-Iqbal, کراچی, سنڌ, 75300, پاکستان highway bus_stop 0.101 پاکستان pk Asia Southern Asia
+council and commission 2021-02-03 59604170 node British Council Library, British Council, Shahrah-e-Iran, Five Star Complex, Ú©Ù„Ù<81>ٹن, کراچی, سنڌ, 75600, پاکستان amenity library 0.101 پاکستان pk Asia Southern Asia
+university of karachi 2021-02-03 228965756 way University of Karachi, Abul Hassan Isphani Road, Metroville 3, Memon Nagar, کراچی, سنڌ, 75300, پاکستان amenity university 0.301 پاکستان pk Asia Southern Asia
+university of bialystok 2021-02-03 258648531 relation Politechnika Białostocka - Wydział Mechaniczny, Prosta, Osiedle Tysiąclecia, Piaski, Białystok, województwo podlaskie, 15-351, Polska building university 0.001 Polska pl Europe Eastern Europe
+radiometer 2021-02-03 137057564 way Radiometer, 3, Podmiejska, Osiedle Mikołaja Kopernika, Przedmieście Szczecińskie, Stargard, powiat stargardzki, województwo zachodniopomorskie, 73-110, Polska building yes 0.101 Polska pl Europe Eastern Europe
+hcp 2021-02-03 169771922 way HCP, Wilda, Poznań, województwo wielkopolskie, 61-485, Polska highway platform 0.2 Polska pl Europe Eastern Europe
+national museum 2021-02-03 258352211 relation Muzeum Narodowe, 3, Aleje Jerozolimskie, Śródmieście Południowe, Śródmieście, Warszawa, województwo mazowieckie, 00-495, Polska tourism museum 0.490290314647502 Polska pl Europe Eastern Europe
+icar 2021-02-03 80088131 node ICAR, Droga G, Dzielnica Suchodół, Krosno, województwo podkarpackie, 38-400, Polska office company 0.101 Polska pl Europe Eastern Europe
+polish academy of sciences 2021-02-03 82565029 node Polska Akademia Nauk, 72, Nowy Świat, Centrum, Śródmieście Północne, Śródmieście, Warszawa, województwo mazowieckie, 00-330, Polska amenity research_institute 0.551024356739357 Polska pl Europe Eastern Europe
+bc partners 2021-02-03 176794441 way Partners, Czajki, Å<81>owicz, powiat Å‚owicki, województwo łódzkie, Polska landuse commercial 0.3 Polska pl Europe Eastern Europe
+warsaw university 2021-02-03 98622568 way Uniwersytet Warszawski, Stawki, Osiedle Stawki, Muranów, Śródmieście, Warszawa, województwo mazowieckie, 00-183, Polska amenity university 0.299521898980972 Polska pl Europe Eastern Europe
+lancet 2021-02-03 45795901 node Lancet, 1a, KoÅ›cielna, BaÅ‚uty-DoÅ‚y, Å<81>ódź-BaÅ‚uty, Å<81>ódź, województwo łódzkie, 91-444, Polska amenity veterinary 0.101 Polska pl Europe Eastern Europe
+cipla 2021-02-03 258623051 relation Ciepła, gmina Orońsko, powiat szydłowiecki, województwo mazowieckie, Polska boundary administrative 0.286834742964615 Polska pl Europe Eastern Europe
+euroimmun 2021-02-03 59855021 node Euroimmun, 2a, Widna, Osiedle Huby, Wrocław, województwo dolnośląskie, 50-543, Polska place house 0.101 Polska pl Europe Eastern Europe
+poland 2021-02-03 258357895 relation Polska boundary administrative 0.852585547719659 Polska pl Europe Eastern Europe
+net power 2021-02-03 82888359 node NET MARINE - Marine Power Service, 232D, Pułkownika Stanisława Dąbka, Stare Obłuże, Obłuże, Gdynia, województwo pomorskie, 81-167, Polska office company 0.201 Polska pl Europe Eastern Europe
+vib 2021-02-03 255571885 way VIB, BaÅ‚uty-DoÅ‚y, Å<81>ódź-BaÅ‚uty, Å<81>ódź, województwo łódzkie, Polska landuse cemetery 0.3 Polska pl Europe Eastern Europe
+the lancet 2021-02-03 45795901 node Lancet, 1a, KoÅ›cielna, BaÅ‚uty-DoÅ‚y, Å<81>ódź-BaÅ‚uty, Å<81>ódź, województwo łódzkie, 91-444, Polska amenity veterinary 0.101 Polska pl Europe Eastern Europe
+nicolaus copernicus 2021-02-03 62194300 node Mikolaj Kopernik, Rynek, Osiedle Słoneczne, Frombork, gmina Frombork, powiat braniewski, województwo warmińsko-mazurskie, 14-530, Polska historic memorial 0.001 Polska pl Europe Eastern Europe
+ursus 2021-02-03 258751350 relation Ursus, Warszawa, województwo mazowieckie, Polska boundary administrative 0.454934934074513 Polska pl Europe Eastern Europe
+kpmg 2021-02-03 67019231 node KPMG, 4A, Inflancka, Osiedle Prezydenckie, Muranów, Śródmieście, Warszawa, województwo mazowieckie, 00-189, Polska place house 0.101 Polska pl Europe Eastern Europe
+university of warsaw 2021-02-03 96031290 way Uniwersytet Warszawski, Krakowskie Przedmieście, Centrum, Śródmieście Północne, Śródmieście, Warszawa, województwo mazowieckie, 00-046, Polska amenity university 0.59809205701364 Polska pl Europe Eastern Europe
+comex 2021-02-03 236397540 way Comex, Osiedle Żerniki, Wrocław, województwo dolnośląskie, 54-516, Polska landuse industrial 0.3 Polska pl Europe Eastern Europe
+stargardt 2021-02-03 14889255 node Stargard Gubiński, gmina Gubin, powiat krośnieński, województwo lubuskie, 66-633, Polska place village 0.258218474293395 Polska pl Europe Eastern Europe
+lg electronics 2021-02-03 99577118 way LG Electronics, Mława-Wólka, Mława, powiat mławski, województwo mazowieckie, 06-500, Polska highway residential 0.3 Polska pl Europe Eastern Europe
+citi 2021-02-03 258863589 relation Citibank, 16, Senatorska, Za Żelazną Bramą, Śródmieście Północne, Śródmieście, Warszawa, województwo mazowieckie, 00-082, Polska amenity bank 0.386834742964615 Polska pl Europe Eastern Europe
+nafta 2021-02-03 174307 node Nafta, Wołomin, gmina Wołomin, powiat wołomiński, województwo mazowieckie, 05-200, Polska place neighbourhood 0.35 Polska pl Europe Eastern Europe
+socé fall 2021-02-03 258917009 relation Soce, gmina Narew, powiat hajnowski, województwo podlaskie, Polska boundary administrative 0.331005307834616 Polska pl Europe Eastern Europe
+beresheet 2021-02-03 235094607 way × ×•×£ בר×<90>שית, כפר ×<90>דומי×<9d>, שטח C, יהודה ושומרון, Palestinian Territory highway residential 0.1 Palestinian Territory ps Asia Western Asia
+palestinian authority 2021-02-03 102008206 way Palestinian Monetry Authority, Al Shuhadaa, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory amenity public_building 0.201 Palestinian Territory ps Asia Western Asia
+cultural organization 2021-02-03 23404291 node United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory office UN 0.908162869304848 Palestinian Territory ps Asia Western Asia
+united nations educational 2021-02-03 23404291 node United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory office UN 1.00816286930485 Palestinian Territory ps Asia Western Asia
+skype 2021-02-03 72916230 node Skype, شارع الكركÙ<81>Ø©, Øارة التراجمة, بيت Ù„ØÙ…, منطقة Ø£, الضÙ<81>Ø© الغربية, 9045634, Palestinian Territory amenity restaurant 0.101 Palestinian Territory ps Asia Western Asia
+united nations educational scientific and cultural organization 2021-02-03 23404291 node United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory office UN 1.40816286930485 Palestinian Territory ps Asia Western Asia
+unesco 2021-02-03 23404291 node United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory office UN 0.808162869304848 Palestinian Territory ps Asia Western Asia
+clalit health services 2021-02-03 69773696 node שירותי ברי×<90>ות כללית, ×”×‘× ×<90>×™, ×<90>רי×<90>ל, שטח C, יהודה ושומרון, 12345, Palestinian Territory amenity clinic 0.001 Palestinian Territory ps Asia Western Asia
+basel university 2021-02-03 44957374 node Basel Hadidoun, University Street, أبو ديس, منطقة ب, الضÙ<81>Ø© الغربية, Palestinian Territory building house 0.201 Palestinian Territory ps Asia Western Asia
+ministry of antiquities 2021-02-03 134576075 way Ministry of Tourism & Antiquities, شارع جمال عبد الناصر, Øارة الÙ<81>رØية, بيت Ù„ØÙ…, منطقة Ø£, الضÙ<81>Ø© الغربية, 9045634, Palestinian Territory office government 0.301 Palestinian Territory ps Asia Western Asia
+national security 2021-02-03 3554333 node National Security, As-Salam, Qalqilya, قلقيلية, منطقة أ, יהודה ושומרון, 342, Palestinian Territory amenity police 0.201 Palestinian Territory ps Asia Western Asia
+ariel 2021-02-03 259276497 relation ×<90>רי×<90>ל, שטח C, الضÙ<81>Ø© الغربية, 4075419, Palestinian Territory boundary administrative 0.452871408274879 Palestinian Territory ps Asia Western Asia
+health ministry 2021-02-03 3709061 node Health Ministry, شارع جمال عبد الناصر / المØاÙ<81>ظة, نابلس, منطقة Ø£, יהודה ושומרון, 35214, Palestinian Territory amenity public_building 0.201 Palestinian Territory ps Asia Western Asia
+al-quds university 2021-02-03 171696127 way Al-Quds University, University Street, أبو ديس, שטח C, יהודה ושומרון, Palestinian Territory amenity university 0.670940340656356 Palestinian Territory ps Asia Western Asia
+united nations' educational 2021-02-03 23404291 node United Nations Educational, Scientific and Cultural Organization (UNESCO), Khalid al Rdaydeh, South Remal, غزة, Ù…ØاÙ<81>ظة غزة, قطاع غزة, 890, Palestinian Territory office UN 1.00816286930485 Palestinian Territory ps Asia Western Asia
+pbl 2021-02-03 258744849 relation Pombal, Leiria, Pinhal Litoral, Centro, Portugal boundary administrative 0.439395713780888 Portugal pt Europe Southern Europe
+chaves 2021-02-03 258597847 relation Chaves, Vila Real, Alto Tâmega, Norte, Portugal boundary administrative 0.57494931380879 Portugal pt Europe Southern Europe
+bnl 2021-02-03 259237087 relation Base Naval de Lisboa, Laranjeiro e Feijó, Almada, Setúbal, PenÃnsula de Setúbal, Ã<81>rea Metropolitana de Lisboa, 2810-001, Portugal landuse military 0.357598476917669 Portugal pt Europe Southern Europe
+safina center 2021-02-03 219483414 way 65, Safina, Cortegaça, Ovar, Aveiro, Baixo Vouga, Centro, 3886-908, Portugal landuse industrial 0.3 Portugal pt Europe Southern Europe
+ptb 2021-02-03 258563650 relation Ponte da Barca, Viana do Castelo, Alto Minho, Norte, Portugal boundary administrative 0.42341787558624 Portugal pt Europe Southern Europe
+eu lisbon 2021-02-03 60162212 node FortÃssimos consórcios eu desejo, Rua Professor Santos Lucas, Benfica, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1500-613, Portugal tourism artwork 0.101 Portugal pt Europe Southern Europe
+avs 2021-02-03 258957864 relation Avis, Portalegre, Alto Alentejo, Alentejo, Portugal boundary administrative 0.421268826198079 Portugal pt Europe Southern Europe
+tcs 2021-02-03 258808501 relation Trancoso, Guarda, Beira Interior Norte, Centro, Portugal boundary administrative 0.437387966234636 Portugal pt Europe Southern Europe
+iamb 2021-02-03 259381515 relation EMSA, 4, Praça Europa, Cais do Sodré, São Bento, Misericórdia, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1249-206, Portugal office government 0.410586091930766 Portugal pt Europe Southern Europe
+cvd 2021-02-03 258792832 relation Castelo de Vide, Portalegre, Alto Alentejo, Alentejo, 7320-154, Portugal boundary administrative 0.427443521124928 Portugal pt Europe Southern Europe
+cml 2021-02-03 259567502 relation Câmara de Lobos, Madeira, Portugal boundary administrative 0.42505981939652 Portugal pt Europe Southern Europe
+university of lisbon 2021-02-03 194436086 way Universidade de Lisboa - Cidade Universitária, Avenida das Forças Armadas, Sete Rios, Avenidas Novas, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1600-121, Portugal amenity university 0.503005124858326 Portugal pt Europe Southern Europe
+mrt 2021-02-03 258732826 relation Mortágua, Viseu, Viseu Dão-Lafões, Centro, Portugal boundary administrative 0.422968236493861 Portugal pt Europe Southern Europe
+vbp 2021-02-03 258706958 relation Vila do Bispo, Faro, Algarve, Portugal boundary administrative 0.425432597142074 Portugal pt Europe Southern Europe
+nova university of lisbon 2021-02-03 126784870 way Universidade Nova de Lisboa - Campus de Campolide, Rua de Campolide, Campolide, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1099-032 LISBOA, Portugal amenity university 0.520803171748129 Portugal pt Europe Southern Europe
+airc 2021-02-03 196906120 way AIRC, Lote 15, Avenida Joaquim Teixeira Santos, iParque - Parque Tecnológico de Coimbra, Antanhol, Assafarge e Antanhol, Coimbra, Baixo Mondego, Centro, 3040-540, Portugal building commercial 0.101 Portugal pt Europe Southern Europe
+gödel 2021-02-03 62622005 node Godel, Turcifal, Torres Vedras, Lisboa, Oeste, Centro, 2565-814 TURCIFAL, Portugal natural peak 0.3 Portugal pt Europe Southern Europe
+cancer 2021-02-03 44962803 node Cancer, Granja, Mourão, Évora, Alentejo Central, Alentejo, Portugal place farm 0.3 Portugal pt Europe Southern Europe
+adcs 2021-02-03 16652252 node ADCS Aldeia de S. Sebastião, CM 1080, Aldeia de São Sebastião, Castelo Bom, Almeida, Guarda, Beira Interior Norte, Centro, Portugal leisure swimming_pool 0.101 Portugal pt Europe Southern Europe
+new university of lisbon 2021-02-03 194436086 way Universidade de Lisboa - Cidade Universitária, Avenida das Forças Armadas, Sete Rios, Avenidas Novas, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1600-121, Portugal amenity university 0.503005124858326 Portugal pt Europe Southern Europe
+portugal 2021-02-03 257659868 relation Portugal boundary administrative 0.904004273464586 Portugal pt Europe Southern Europe
+mpower 2021-02-03 50692696 node MPower, EN 204, Monte de Fralães, Viatodos, Grimancelos, Minhotães e Monte de Fralães, Barcelos, Braga, Cávado, Norte, 4775-050, Portugal shop car 0.101 Portugal pt Europe Southern Europe
+agn 2021-02-03 258957387 relation Arganil, Coimbra, Pinhal Interior Norte, Centro, Portugal boundary administrative 0.424872581583534 Portugal pt Europe Southern Europe
+amr 2021-02-03 258828776 relation Amares, Braga, Cávado, Norte, Portugal boundary administrative 0.427682870549518 Portugal pt Europe Southern Europe
+arv 2021-02-03 259038370 relation Arruda dos Vinhos, Lisboa, Oeste, Centro, Portugal boundary administrative 0.413435317280238 Portugal pt Europe Southern Europe
+european monitoring centre for drugs and drug addiction 2021-02-03 258842269 relation EMCDDA, 1, Praça Europa, Cais do Sodré, São Bento, Misericórdia, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1249-289, Portugal office government 0.480889254526519 Portugal pt Europe Southern Europe
+unl 2021-02-03 126784870 way Universidade Nova de Lisboa - Campus de Campolide, Rua de Campolide, Campolide, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1099-032 LISBOA, Portugal amenity university 0.420803171748129 Portugal pt Europe Southern Europe
+university of aveiro 2021-02-03 149748981 way Universidade de Aveiro - Campus de Santiago, Rua do Sport Clube Beira-Mar, Glória, Glória e Vera Cruz, Aveiro, Baixo Vouga, Centro, 3810-193, Portugal amenity university 0.101 Portugal pt Europe Southern Europe
+amr centre 2021-02-03 258828776 relation Amares, Braga, Cávado, Norte, Portugal boundary administrative 0.427682870549518 Portugal pt Europe Southern Europe
+lisbon university institute 2021-02-03 149301566 way ISCTE - Instituto Universitário de Lisboa, Rua Branca Edmée Marques, Alvalade, Lisboa, Grande Lisboa, Ã<81>rea Metropolitana de Lisboa, 1649-026, Portugal amenity university 0.303230229325644 Portugal pt Europe Southern Europe
+university of porto 2021-02-03 100343362 way Faculdade de Engenharia da Universidade do Porto, s/n, Rua Doutor Roberto Frias, Lamas, Paranhos, Porto, Ã<81>rea Metropolitana do Porto, Norte, 4200-465, Portugal amenity university 0.418669334531229 Portugal pt Europe Southern Europe
+mtl 2021-02-03 258706967 relation Mértola, Beja, Baixo Alentejo, Alentejo, Portugal boundary administrative 0.446961485431396 Portugal pt Europe Southern Europe
+cbc 2021-02-03 258695815 relation Cabeceiras de Basto, Braga, Ave, Norte, Portugal boundary administrative 0.426598401525427 Portugal pt Europe Southern Europe
+hrt 2021-02-03 259203953 relation Horta, Faial, Açores, Portugal boundary administrative 0.457605882150238 Portugal pt Europe Southern Europe
+frb 2021-02-03 20744600 node Francos Bombeiros, Rua Engenheiro Ferreira Dias, Zona Industrial do Porto, Ramalde, Porto, Ã<81>rea Metropolitana do Porto, Norte, 4250-094, Portugal highway bus_stop 0.001 Portugal pt Europe Southern Europe
+institute of space sciences 2021-02-03 76017683 node Institute of Astrophysics and Space Sciences, Rua das Estrelas, Arrábida, Lordelo do Ouro, Lordelo do Ouro e Massarelos, Porto, Ã<81>rea Metropolitana do Porto, Norte, 4150-762, Portugal office research 0.401 Portugal pt Europe Southern Europe
+mdr 2021-02-03 258777777 relation Miranda do Douro, Bragança, Terras de Trás-os-Montes, Norte, Portugal boundary administrative 0.448086827357741 Portugal pt Europe Southern Europe
+republic of palau 2021-02-03 258530413 relation Belau boundary administrative 0.62710039879367 Belau pw Oceania Micronesia
+palau 2021-02-03 258530413 relation Belau boundary administrative 0.62710039879367 Belau pw Oceania Micronesia
+naoc 2021-02-03 56344922 node Naoc, Loma Plata, Boquerón, Región Occidental, Paraguay place village 0.375 Paraguay py Americas South America
+paraguay 2021-02-03 258211585 relation Paraguay boundary administrative 0.814653400915517 Paraguay py Americas South America
+east anatolian 2021-02-03 55991342 node Anatolian, الطريق الدائري الثاني, الغانم القديم, الدوØØ©, 37109, قطر amenity restaurant 0.101 قطر qa Asia Western Asia
+starlink 2021-02-03 57040217 node Starlink, شارع المنصورة, المنصورة, الدوØØ©, 10849, قطر shop yes 0.101 قطر qa Asia Western Asia
+ministry of public health 2021-02-03 126428404 way Ministry of Public Health, شارع عنيزة, الرميلة, الدوØØ©, 875, قطر amenity clinic 0.401 قطر qa Asia Western Asia
+anatolian 2021-02-03 55991342 node Anatolian, الطريق الدائري الثاني, الغانم القديم, الدوØØ©, 37109, قطر amenity restaurant 0.101 قطر qa Asia Western Asia
+qatar 2021-02-03 258224271 relation قطر boundary administrative 0.703411605024364 قطر qa Asia Western Asia
+world data center 2021-02-03 55939202 node Data World, ام الدوم, Muaither North, الريان, 945, قطر shop mobile_phone 0.201 قطر qa Asia Western Asia
+technical university 2021-02-03 886677 node Universitatea Tehnică, 15, Strada Constantin Daicoviciu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400020, România amenity university 0.379076406206389 România ro Europe Eastern Europe
+ifin-hh 2021-02-03 226902178 way Institutul NaÈ›ional de Cercetare-Dezvoltare pentru Fizică È™i Inginerie Nucleară „Horia Hulubeiâ€<9d>, 30, Strada Reactorului, Extreme Light Infrastructure - Nuclear Physics (ELI-NP), Măgurele, Ilfov, 77125, România amenity research_institute 0.001 România ro Europe Eastern Europe
+university politehnica 2021-02-03 131359796 way Facultatea de Electronică, Telecomunicații și Tehnologia Informației, 1-3, Bulevardul Iuliu Maniu, Militari, Sector 6, Municipiul București, 060117, România amenity university 0.001 România ro Europe Eastern Europe
+diversitas 2021-02-03 45653317 node Diversitas, Strada Timișul Sec, Est-Zizin, Brașov, 500246, România highway bus_stop 0.101 România ro Europe Eastern Europe
+international service 2021-02-03 146925092 way International Service, DN2A, Bora, Slobozia, Ialomița, 920001, România shop car 0.201 România ro Europe Eastern Europe
+ipp 2021-02-03 108543353 way Ip, Sălaj, 457210, România place village 0.393012981942171 România ro Europe Eastern Europe
+intervet 2021-02-03 82488353 node Intervet, Strada Unirii, Delfinariu, Faleză Nord, Constanța, Zona Metropolitană Constanța, Constanța, 900545, România shop pet 0.101 România ro Europe Eastern Europe
+romania 2021-02-03 257807627 relation România boundary administrative 0.805346179828883 România ro Europe Eastern Europe
+digital science 2021-02-03 74464037 node Digital Science, Strada Melodiei, Iași, Podul Roș, Iași, Zona Metropolitană Iași, Iași, 700050, România office yes 0.201 România ro Europe Eastern Europe
+voilà 2021-02-03 613559 node Voila, BraÈ™ov, 507260, România place village 0.40784642314719 România ro Europe Eastern Europe
+babeş-bolyai university 2021-02-03 258406266 relation Universitatea BabeÈ™-Bolyai, 1, Strada Mihail Kogălniceanu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400084, România amenity university 0.593983489561696 România ro Europe Eastern Europe
+technical university of 2021-02-03 886677 node Universitatea Tehnică, 15, Strada Constantin Daicoviciu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400020, România amenity university 0.379076406206389 România ro Europe Eastern Europe
+opticon 2021-02-03 58909939 node Opticon, Strada Amurgului, Primăverii, Turda, Cluj, 401047, România shop optician 0.101 România ro Europe Eastern Europe
+apa 2021-02-03 108306925 way Apa, Satu Mare, 447015, România place village 0.479859879460608 România ro Europe Eastern Europe
+spri 2021-02-03 259351384 relation Baia Sprie, Maramureș, România boundary administrative 0.551669177709866 România ro Europe Eastern Europe
+vulcan 2021-02-03 259305552 relation Vulcan, Hunedoara, România boundary administrative 0.557716038389343 România ro Europe Eastern Europe
+babeș-bolyai university in cluj-napoca 2021-02-03 258406266 relation Universitatea BabeÈ™-Bolyai, 1, Strada Mihail Kogălniceanu, Centru, Cluj-Napoca, Zona Metropolitană Cluj, Cluj, 400084, România amenity university 0.893983489561696 România ro Europe Eastern Europe
+czi 2021-02-03 54133045 node CZI srl, Șoseaua București-Alexandria, Drăgănești-Vlașca, Teleorman, 147135, România shop convenience 0.101 România ro Europe Eastern Europe
+beer institute 2021-02-03 75163060 node The Beer Institute, 111-113, Calea Floreasca, Floreasca, Sector 1, Municipiul București, 014463, România amenity pub 0.201 România ro Europe Eastern Europe
+university of bucharest 2021-02-03 119914953 way Universitatea din București, Piața Universității, Centrul Istoric, Sector 3, Municipiul București, 030018, România amenity university 0.525450602170038 România ro Europe Eastern Europe
+cerc 2021-02-03 3835281 node Cerc, Cluj, 407586, România place village 0.517932851769529 România ro Europe Eastern Europe
+niehs 2021-02-03 258717718 relation Град Ð<9d>иш, Ð<9d>ишавÑ<81>ки управни округ, Централна Србија, Србија boundary administrative 0.581344117584867 Србија rs Europe Southern Europe
+sinta 2021-02-03 2337965 node Сента, Општина Сента, СевернобанатÑ<81>ки управни округ, Војводина, 24400, Србија place town 0.464681100859821 Србија rs Europe Southern Europe
+central veterinary institute 2021-02-03 244179056 way ВетеринарÑ<81>ки завод Земун, Београд (Земун), Београд, ГрадÑ<81>ка општина Земун, Град Београд, Централна Србија, Србија landuse farmyard 0.2 Србија rs Europe Southern Europe
+serbia 2021-02-03 258556028 relation Србија boundary administrative 0.777253646015475 Србија rs Europe Southern Europe
+university of belgrade 2021-02-03 117305850 way УниверзитетÑ<81>ка библиотека „Светозар Марковић“, 71, Булевар краља Ð<90>лекÑ<81>андра, Београд (Врачар), ГрадÑ<81>ка општина Врачар, Београд, Град Београд, Централна Србија, 11000, Србија amenity library 0.4584091593896 Србија rs Europe Southern Europe
+astronomical observatory of belgrade 2021-02-03 135040458 way Ð<90>Ñ<81>трономÑ<81>ка опÑ<81>ерваторија Београд, 7, Волгина, МЗ Звездара, Београд (Звездара), ГрадÑ<81>ка општина Звездара, Београд, Град Београд, Централна Србија, 11060, Србија man_made observatory 0.30922699466609 Србија rs Europe Southern Europe
+office for students 2021-02-03 70834542 node КомеÑ<81>аријат за избеглице и миграције, 4, Ð<9d>ародних хероја, СтудентÑ<81>ки град, Београд (Ð<9d>ови Београд), ГрадÑ<81>ка општина Ð<9d>ови Београд, Београд, Град Београд, Централна Србија, 11070, Србија office government 0.001 Србија rs Europe Southern Europe
+institute of mineralogy 2021-02-03 72874514 node ИнÑ<81>титут геологии, геофизики и минералогии им. Ð<90>.Ð<90>. Трофимука, 15, ДетÑ<81>кий проезд, ВерхнÑ<8f>Ñ<8f> зона, СоветÑ<81>кий район, городÑ<81>кой округ Ð<9d>овоÑ<81>ибирÑ<81>к, Ð<9d>овоÑ<81>ибирÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 630090, РоÑ<81>Ñ<81>иÑ<8f> office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+kremlin 2021-02-03 258512367 relation МоÑ<81>ковÑ<81>кий Кремль, БоровицкаÑ<8f> улица, 39, ТверÑ<81>кой район, МоÑ<81>ква, Центральный федеральный округ, 121019, РоÑ<81>Ñ<81>иÑ<8f> tourism attraction 0.557769322264741 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+polytechnic university 2021-02-03 8106175 node ПолитехничеÑ<81>кий УниверÑ<81>итет, проÑ<81>пект Кирова, КировÑ<81>кий район, ТомÑ<81>к, городÑ<81>кой округ ТомÑ<81>к, ТомÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 634000, РоÑ<81>Ñ<81>иÑ<8f> highway bus_stop 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+kagra 2021-02-03 300995494 way Кагра, УдомельÑ<81>кий городÑ<81>кой округ, ТверÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 171870, РоÑ<81>Ñ<81>иÑ<8f> waterway river 0.275 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+national museum of the palace 2021-02-03 59090230 node Museum, 14, БольшаÑ<8f> МорÑ<81>каÑ<8f> улица, округ â„– 78, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f> shop clothes 0.101 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+roscosmos 2021-02-03 82532640 node РоÑ<81>коÑ<81>моÑ<81>, 42 Ñ<81>2, улица Щепкина, Ð<9d>апрудное, МещанÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 129110, РоÑ<81>Ñ<81>иÑ<8f> office government 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+uct 2021-02-03 108073391 way Ð<90>Ñ<8d>ропорт Ухта, РучейнаÑ<8f> улица, Подгорный, Ухта, городÑ<81>кой округ Ухта, РеÑ<81>публика Коми, Северо-Западный федеральный округ, 169302, РоÑ<81>Ñ<81>иÑ<8f> aeroway aerodrome 0.428748587005153 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+iaea 2021-02-03 258389991 relation Ð<90>Ñ<8d>ропорт Игарка, улица Большого Театра, Игарка, городÑ<81>кое поÑ<81>еление Игарка, ТуруханÑ<81>кий район, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>кий край, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> aeroway aerodrome 0.435101173083885 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+lomonosov moscow state university 2021-02-03 155606811 way 1, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f> place neighbourhood 0.589514102962792 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+kapitza institute for physical problems 2021-02-03 258586820 relation ИнÑ<81>титут физичеÑ<81>ких проблем имени П. Л. Капицы Ð Ð<90>Ð<9d>, улица СергеÑ<8f> Капицы, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119334, РоÑ<81>Ñ<81>иÑ<8f> office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+beatles 2021-02-03 6433570 node The Beatles, улица Горького, ÐвереÑ<81>Ñ‚, ЛенинÑ<81>кий район, Екатеринбург, городÑ<81>кой округ Екатеринбург, СвердловÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, 620219, РоÑ<81>Ñ<81>иÑ<8f> historic memorial 0.325794094499978 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+samsung 2021-02-03 298004709 relation Samsung, ЛиговÑ<81>кий проÑ<81>пект, округ Лиговка-ЯмÑ<81>каÑ<8f>, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f> craft electronics_repair 0.681482163173531 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+dfo 2021-02-03 258365341 relation ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> boundary administrative 0.551929848048128 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+nist 2021-02-03 137975640 way Ð<9d>иÑ<81>Ñ‚ÑŒ, ГайнÑ<81>кий муниципальный округ, ПермÑ<81>кий край, ПриволжÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> waterway river 0.275 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+kaist 2021-02-03 205795897 way КаиÑ<81>Ñ‚, городÑ<81>кое поÑ<81>еление ВерхнетуломÑ<81>кий, КольÑ<81>кий район, МурманÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Северо-Западный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> waterway river 0.275 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+nikon 2021-02-03 55215823 node Nikon, 1, 2-й СыромÑ<8f>тничеÑ<81>кий переулок, КошельнаÑ<8f> Ñ<81>лобода, ТаганÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 105120, РоÑ<81>Ñ<81>иÑ<8f> shop electronics 0.101 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+national geographic 2021-02-03 297123845 node National Geographic, 1 Ñ<81>1, Ð<9d>оводмитровÑ<81>каÑ<8f> улица, БутырÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 127015, РоÑ<81>Ñ<81>иÑ<8f> shop clothes 0.201 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+fsb 2021-02-03 181819115 way Управление ФСБ РоÑ<81>Ñ<81>ии по ЧелÑ<8f>бинÑ<81>кой облаÑ<81>ти, улица Коммуны, Центральный район, ЧелÑ<8f>бинÑ<81>к, ЧелÑ<8f>бинÑ<81>кий городÑ<81>кой округ, ЧелÑ<8f>бинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, 454091, РоÑ<81>Ñ<81>иÑ<8f> amenity police 0.512538467361346 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+sternberg astronomical institute at moscow state university 2021-02-03 258891687 relation ГоÑ<81>ударÑ<81>твенный Ð<90>Ñ<81>трономичеÑ<81>кий ИнÑ<81>титут им. П.К. Штернберга МГУ, 13, УниверÑ<81>итетÑ<81>кий проÑ<81>пект, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119333, РоÑ<81>Ñ<81>иÑ<8f> office research 0.353757209078785 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+enso 2021-02-03 258512122 relation СветогорÑ<81>к, СветогорÑ<81>кое городÑ<81>кое поÑ<81>еление, ВыборгÑ<81>кий район, ЛенинградÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Северо-Западный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> place town 0.495333231609556 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+french republic 2021-02-03 72441560 node French Bakery, ФедоÑ<81>еевÑ<81>каÑ<8f> улица, ВахитовÑ<81>кий район, городÑ<81>кой округ Казань, ТатарÑ<81>тан, ПриволжÑ<81>кий федеральный округ, 420014, РоÑ<81>Ñ<81>иÑ<8f> amenity cafe 0.101 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+aesa 2021-02-03 99011756 way Ð<90>ша, Ð<90>шинÑ<81>кое городÑ<81>кое поÑ<81>еление, Ð<90>шинÑ<81>кий район, ЧелÑ<8f>бинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> place town 0.49201754214395 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+lmt 2021-02-03 258485345 relation городÑ<81>кое поÑ<81>еление Ð<90>льметьевÑ<81>к, Ð<90>льметьевÑ<81>кий район, ТатарÑ<81>тан, ПриволжÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> boundary administrative 0.496007033040445 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+prl 2021-02-03 108260455 way Ð<90>Ñ<8d>ропорт Елизово, Ð<90>-401, Елизово, ЕлизовÑ<81>кое городÑ<81>кое поÑ<81>еление, ЕлизовÑ<81>кий район, КамчатÑ<81>кий край, ДальневоÑ<81>точный федеральный округ, 684005, РоÑ<81>Ñ<81>иÑ<8f> aeroway aerodrome 0.450772394172387 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+nbc 2021-02-03 258202613 relation Ð<90>Ñ<8d>ропорт Бегишево, 16К-1563, БиклÑ<8f>нÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, ТукаевÑ<81>кий район, ТатарÑ<81>тан, ПриволжÑ<81>кий федеральный округ, 423878, РоÑ<81>Ñ<81>иÑ<8f> aeroway aerodrome 0.443549060892257 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+institute for scientific information 2021-02-03 63385307 node ИнÑ<81>титут научной информации по общеÑ<81>твенным наукам Ð Ð<90>Ð<9d>, 3, улица ДмитриÑ<8f> УльÑ<8f>нова, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119333, РоÑ<81>Ñ<81>иÑ<8f> amenity library 0.347505326784089 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+ria novosti 2021-02-03 174554396 way ДетÑ<81>кий Ñ<81>ад â„– 1720 РИÐ<90> “Ð<9d>овоÑ<81>тиâ€<9d>, 50, КраÑ<81>ковÑ<81>кое шоÑ<81>Ñ<81>е, Малаховка, городÑ<81>кой округ Люберцы, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 140050, РоÑ<81>Ñ<81>иÑ<8f> amenity kindergarten 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+university of moscow 2021-02-03 155606811 way 1, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f> place neighbourhood 0.589514102962792 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+educational exchange 2021-02-03 60365051 node Совет по международным образовательным обменам, 24, набережнаÑ<8f> реки Мойки, Дворцовый округ, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f> office ngo 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+csh 2021-02-03 107362163 way Ð<90>Ñ<8d>ропорт Соловки, улица Ковалёва, Соловецкий, Соловецкое Ñ<81>ельÑ<81>кое поÑ<81>еление, ПриморÑ<81>кий район, Ð<90>рхангельÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Северо-Западный федеральный округ, 164070, РоÑ<81>Ñ<81>иÑ<8f> aeroway aerodrome 0.41890455386909 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+uts 2021-02-03 3463674 node Ust-Tsylma Airport, улица Ð<90>виаторов, Чукчино, УÑ<81>Ñ‚ÑŒ-Цильма, Ñ<81>ельÑ<81>кое поÑ<81>еление Коровий Ручей, УÑ<81>Ñ‚ÑŒ-ЦилемÑ<81>кий район, РеÑ<81>публика Коми, Северо-Западный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> aeroway aerodrome 0.402513658204824 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+greenpeace russia 2021-02-03 57696006 node ГринпиÑ<81> РоÑ<81>Ñ<81>ии, 26 к1, ЛенинградÑ<81>кий проÑ<81>пект, район Беговой, МоÑ<81>ква, Центральный федеральный округ, 125040, РоÑ<81>Ñ<81>иÑ<8f> office ngo 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+asa 2021-02-03 99011756 way Ð<90>ша, Ð<90>шинÑ<81>кое городÑ<81>кое поÑ<81>еление, Ð<90>шинÑ<81>кий район, ЧелÑ<8f>бинÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> place town 0.49201754214395 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+higher school of economics 2021-02-03 107832324 way Ð<9d>ИУ ВШРСПб, ОП ФилологиÑ<8f>, 123, набережнаÑ<8f> канала Грибоедова, Ð<90>дмиралтейÑ<81>кий округ, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f> amenity college 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+institute of cytology and genetics 2021-02-03 103185653 way ИнÑ<81>титут цитологии и генетики, проÑ<81>пект Ð<90>кадемика Коптюга, Ð<90>кадемгородок, СоветÑ<81>кий район, городÑ<81>кой округ Ð<9d>овоÑ<81>ибирÑ<81>к, Ð<9d>овоÑ<81>ибирÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 630090, РоÑ<81>Ñ<81>иÑ<8f> amenity research_institute 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+ubs 2021-02-03 105310352 way Ð<90>Ñ<8d>родром СмоленÑ<81>к-Северный, ПолоцкаÑ<8f> улица, Щёткино, СмоленÑ<81>к, ЗаднепровÑ<81>кий район, городÑ<81>кой округ СмоленÑ<81>к, СмоленÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 214006, РоÑ<81>Ñ<81>иÑ<8f> aeroway aerodrome 0.351537799411788 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+mps 2021-02-03 1173456 node МПС, Малаховка, городÑ<81>кой округ Люберцы, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 140033, РоÑ<81>Ñ<81>иÑ<8f> place suburb 0.275 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+lomonosov state university 2021-02-03 3649340 node Михаил ВаÑ<81>ильевич ЛомоноÑ<81>ов, улица Колмогорова, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f> historic memorial 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+school for oriental 2021-02-03 244630454 way school, 08К-66, Ð<9d>овое УÑ<81>тье, Ñ<81>ельÑ<81>кое поÑ<81>еление Ð<9d>овое УÑ<81>тье, ОхотÑ<81>кий район, ХабаровÑ<81>кий край, ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> building yes 0.111 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+general motors 2021-02-03 125839046 way General Motors, Шушары, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f> landuse industrial 0.4 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+russian academy of sciences 2021-02-03 96980816 way ЗоологичеÑ<81>кий музей ЗоологичеÑ<81>кого инÑ<81>титута Ð Ð<90>Ð<9d>, 1-3, УниверÑ<81>итетÑ<81>каÑ<8f> набережнаÑ<8f>, округ â„– 7, Санкт-Петербург, Северо-Западный федеральный округ, 199034, РоÑ<81>Ñ<81>иÑ<8f> tourism museum 0.343425222676179 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+lro 2021-02-03 5887081 node ЛРО, переулок Шаронова, iTower, Ð<90>втовокзал, ЧкаловÑ<81>кий район, Екатеринбург, городÑ<81>кой округ Екатеринбург, СвердловÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, 620142, РоÑ<81>Ñ<81>иÑ<8f> amenity police 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+shell 2021-02-03 61004484 node Shell, вл2Ð<90>, МКÐ<90>Д, 1-й километр, Южное Измайлово, район ИвановÑ<81>кое, МоÑ<81>ква, Центральный федеральный округ, 111531, РоÑ<81>Ñ<81>иÑ<8f> amenity fuel 0.684546645920874 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+russia 2021-02-03 258410737 relation РоÑ<81>Ñ<81>иÑ<8f> boundary administrative 0.852192362078589 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+uk home office 2021-02-03 259423169 relation Ук, УковÑ<81>кое городÑ<81>кое поÑ<81>еление, Ð<9d>ижнеудинÑ<81>кий район, ИркутÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> place village 0.275 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+institute of biophysics 2021-02-03 115290807 way ИнÑ<81>титут биофизики СО Ð Ð<90>Ð<9d>, 50/50, Ð<90>кадемгородок, ОктÑ<8f>брьÑ<81>кий район, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>к, городÑ<81>кой округ КраÑ<81>ноÑ<8f>Ñ€Ñ<81>к, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>кий край, СибирÑ<81>кий федеральный округ, 660036, РоÑ<81>Ñ<81>иÑ<8f> office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+budker institute of nuclear physics 2021-02-03 103148615 way ИнÑ<81>титут Ñ<8f>дерной физики им. Г.И. Будкера, 11, проÑ<81>пект Ð<90>кадемика Лаврентьева, ВерхнÑ<8f>Ñ<8f> зона, СоветÑ<81>кий район, городÑ<81>кой округ Ð<9d>овоÑ<81>ибирÑ<81>к, Ð<9d>овоÑ<81>ибирÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 630090, РоÑ<81>Ñ<81>иÑ<8f> office research 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+kbo 2021-02-03 169242562 way КБО, Козулька, городÑ<81>кое поÑ<81>еление Козулька, КозульÑ<81>кий район, КраÑ<81>ноÑ<8f>Ñ€Ñ<81>кий край, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> landuse retail 0.2 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+moscow state university 2021-02-03 155606811 way 1, МоÑ<81>ковÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет им. М. В. ЛомоноÑ<81>ова, район Раменки, МоÑ<81>ква, Центральный федеральный округ, 119991, РоÑ<81>Ñ<81>иÑ<8f> place neighbourhood 0.589514102962792 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+russian federation 2021-02-03 258410737 relation РоÑ<81>Ñ<81>иÑ<8f> boundary administrative 0.852192362078589 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+cagi 2021-02-03 97889566 way Центральный аÑ<8d>рогидродинамичеÑ<81>кий инÑ<81>титут, 1, улица ЖуковÑ<81>кого, Центр, ЖуковÑ<81>кий, городÑ<81>кой округ ЖуковÑ<81>кий, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 140181, РоÑ<81>Ñ<81>иÑ<8f> office research 0.399096455305557 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+vostochny 2021-02-03 259275506 relation ВоÑ<81>точный, СоÑ<81>ьвинÑ<81>кий городÑ<81>кой округ, СвердловÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> place village 0.465170637979749 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+vimpelcom 2021-02-03 57284844 node Vimpelcom, ТаманÑ<81>каÑ<8f> улица, СтароминÑ<81>каÑ<8f>, СтароминÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, СтароминÑ<81>кий район, КраÑ<81>нодарÑ<81>кий край, Южный федеральный округ, 353600, РоÑ<81>Ñ<81>иÑ<8f> man_made mast 0.101 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+lena 2021-02-03 258503631 relation Лена, ЮбилейнинÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, КиренÑ<81>кий район, ИркутÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> natural water 0.461899716082039 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+academy of social sciences 2021-02-03 63385307 node ИнÑ<81>титут научной информации по общеÑ<81>твенным наукам Ð Ð<90>Ð<9d>, 3, улица ДмитриÑ<8f> УльÑ<8f>нова, ГагаринÑ<81>кий, ГагаринÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119333, РоÑ<81>Ñ<81>иÑ<8f> amenity library 0.347505326784089 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+isas 2021-02-03 258476402 relation ИÑ<81>аÑ<81>, Голубовка, ГолубовÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, СедельниковÑ<81>кий район, ОмÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> waterway river 0.3 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+sgc 2021-02-03 258656849 relation Ð<90>Ñ<8d>ропорт Сургут, Ð<90>Ñ<8d>ропорт, городÑ<81>кой округ Сургут, Ханты-МанÑ<81>ийÑ<81>кий автономный округ — Югра, УральÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> aeroway aerodrome 0.445547633625325 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+tomsk state university 2021-02-03 108167321 way ТомÑ<81>кий гоÑ<81>ударÑ<81>твенный универÑ<81>итет. Центр культуры, 36, проÑ<81>пект Ленина, КировÑ<81>кий район, ТомÑ<81>к, городÑ<81>кой округ ТомÑ<81>к, ТомÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, СибирÑ<81>кий федеральный округ, 634050, РоÑ<81>Ñ<81>иÑ<8f> building university 0.36173885138595 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+itar tass 2021-02-03 259420189 relation ИТÐ<90>Ð -ТÐ<90>СС, 12 Ñ<81>1, ТверÑ<81>кой бульвар, 48, ПреÑ<81>ненÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 119049, РоÑ<81>Ñ<81>иÑ<8f> office news_agency 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+andra 2021-02-03 258614316 relation городÑ<81>кое поÑ<81>еление Ð<90>ндра, ОктÑ<8f>брьÑ<81>кий район, Ханты-МанÑ<81>ийÑ<81>кий автономный округ — Югра, УральÑ<81>кий федеральный округ, 628125, РоÑ<81>Ñ<81>иÑ<8f> boundary administrative 0.467153792339873 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+kurchatov institute 2021-02-03 258452658 relation Ð<9d>ациональный иÑ<81>Ñ<81>ледовательÑ<81>кий центр «КурчатовÑ<81>кий инÑ<81>титут», район Щукино, МоÑ<81>ква, Центральный федеральный округ, 123098, РоÑ<81>Ñ<81>иÑ<8f> landuse industrial 0.424370481866688 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+genbank 2021-02-03 37168464 node Генбанк, МалаÑ<8f> Ð<90>ндроньевÑ<81>каÑ<8f> улица, ТаганÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, 109544, РоÑ<81>Ñ<81>иÑ<8f> amenity bank 0.001 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+geo 2021-02-03 258503432 relation МоÑ<81>ква, Центральный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> place city 0.790819328283346 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+chara 2021-02-03 25876864 node Чара, КаларÑ<81>кий район, ЗабайкальÑ<81>кий край, ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> natural peak 0.3 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+jinr 2021-02-03 97272121 way Объединённый инÑ<81>титут Ñ<8f>дерных иÑ<81>Ñ<81>ледований, аллеÑ<8f> имени Ð<9d>. Сондома, ИнÑ<81>титутÑ<81>каÑ<8f> чаÑ<81>Ñ‚ÑŒ, Дубна, городÑ<81>кой округ Дубна, МоÑ<81>ковÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, Центральный федеральный округ, 141980, РоÑ<81>Ñ<81>иÑ<8f> office research 0.352354134516624 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+gru 2021-02-03 258803084 relation Главное разведывательное управление, ХодынÑ<81>кое поле, ХорошёвÑ<81>кий район, МоÑ<81>ква, Центральный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> landuse military 0.492353071516346 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+russian navy 2021-02-03 259456418 relation Главный штаб ВМФ РоÑ<81>Ñ<81>ии, Ð<90>дмиралтейÑ<81>кий округ, Санкт-Петербург, Северо-Западный федеральный округ, 190000, РоÑ<81>Ñ<81>иÑ<8f> landuse military 0.2 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+sidor 2021-02-03 51700182 node Сидор, ОмÑ<81>укчанÑ<81>кий городÑ<81>кой округ, МагаданÑ<81>каÑ<8f> облаÑ<81>Ñ‚ÑŒ, ДальневоÑ<81>точный федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> natural peak 0.3 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+tair 2021-02-03 258375362 relation Таир, КокшайÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, ЗвениговÑ<81>кий район, Марий Ðл, ПриволжÑ<81>кий федеральный округ, РоÑ<81>Ñ<81>иÑ<8f> place village 0.275 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+osf 2021-02-03 258670824 relation Ð<90>Ñ<8d>ропорт ОÑ<81>тафьево, СветлаÑ<8f> улица, поÑ<81>еление ВоÑ<81>креÑ<81>енÑ<81>кое, МоÑ<81>ква, Центральный федеральный округ, 117041, РоÑ<81>Ñ<81>иÑ<8f> aeroway aerodrome 0.405666002039974 РоÑ<81>Ñ<81>иÑ<8f> ru Europe Eastern Europe
+rwanda 2021-02-03 257506373 relation Rwanda boundary administrative 0.766200826101714 Rwanda rw Africa Eastern Africa
+dian fossey gorilla fund international 2021-02-03 155569354 way The Dian Fossey Gorilla Fund International, Ruhengeri - Gisenyi Road, Musanze, Muhoza, Musanze, Majyaruguru, Rwanda office ngo 0.501 Rwanda rw Africa Eastern Africa
+university of rwanda 2021-02-03 241100019 way Dusaidi Hostel, KN 7 Avenue, Nyamirambo, Kigali, Akarere ka Nyarugenge, Umujyi wa Kigali, 250, Rwanda tourism hostel 0.101 Rwanda rw Africa Eastern Africa
+nstc 2021-02-03 57789831 node NSTC, KG 13 Avenue, Akarere ka Gasabo, Umujyi wa Kigali, PO BOX 2376 KIGALI-RWANDA, Rwanda tourism hotel 0.101 Rwanda rw Africa Eastern Africa
+kaust 2021-02-03 259476065 relation جامعة الملك عبد الله للعلوم و التقنية, King Abdullah Boulevard, منطقة مكة المكرمة, 23955, السعودية amenity university 0.37358213360648 السعودية sa Asia Western Asia
+saudi geological survey 2021-02-03 51112840 node Saudi Geological Survey, البدر القمني, As Sulaymaniyah District ØÙŠ السليمانية, الرياض, المالز, منطقة الرياض, 11525, السعودية office government 0.301 السعودية sa Asia Western Asia
+dmd 2021-02-03 12617190 node ضمد, منطقة جازان, السعودية place town 0.3 السعودية sa Asia Western Asia
+king abdullah university of science and technology 2021-02-03 259476065 relation جامعة الملك عبد الله للعلوم و التقنية, King Abdullah Boulevard, منطقة مكة المكرمة, 23955, السعودية amenity university 0.57358213360648 السعودية sa Asia Western Asia
+saudi arabia 2021-02-03 258074051 relation السعودية boundary administrative 0.735262517159872 السعودية sa Asia Western Asia
+king saud university 2021-02-03 121097551 way جامعة الملك سعود, 4545, الملك خالد, Al Khuzama District ØÙŠ الخزامى, الدرعية, منطقة الرياض, 145111, السعودية amenity university 0.454167326792086 السعودية sa Asia Western Asia
+scientific university of the south 2021-02-03 52416329 node المعهد العلمي Ù<81>ÙŠ الاØساء, شارع الجامعة, الهÙ<81>ÙˆÙ<81>, المنطقة الشرقية, 36361-7365, السعودية amenity school 0.001 السعودية sa Asia Western Asia
+faculty of arts and sciences 2021-02-03 77665187 node Faculty of Arts and Sciences, شارع الملك Ù<81>هد, الربوة, جدة, منطقة مكة المكرمة, 5305, السعودية tourism museum 0.501 السعودية sa Asia Western Asia
+coast guard 2021-02-03 177944934 way Coast Guard, السعودية place islet 0.45 السعودية sa Asia Western Asia
+saudia 2021-02-03 258074051 relation السعودية boundary administrative 0.735262517159872 السعودية sa Asia Western Asia
+rnl 2021-02-03 10528826 node Rennell, Tigoa, Rennell and Bellona, Solomon Islands aeroway aerodrome 0.244698616841389 Solomon Islands sb Oceania Melanesia
+salomon 2021-02-03 258291922 relation Solomon Islands boundary administrative 0.648279405728165 Solomon Islands sb Oceania Melanesia
+solomon islands 2021-02-03 258291922 relation Solomon Islands boundary administrative 0.848279405728165 Solomon Islands sb Oceania Melanesia
+leru 2021-02-03 103487137 way Leru, Central, Solomon Islands place island 0.425 Solomon Islands sb Oceania Melanesia
+seychelles 2021-02-03 258464914 relation Sesel boundary administrative 0.647100293229899 Sesel sc Africa Eastern Africa
+sudan 2021-02-03 258367505 relation السودان boundary administrative 0.696406722929938 السودان sd Africa Northern Africa
+nimr 2021-02-03 82567336 node Nimr, Sheikan, ولاية شمال كردÙ<81>ان, السودان place hamlet 0.35 السودان sd Africa Northern Africa
+nsf 2021-02-03 80933809 node An NiÅŸf, غبيش, ولاية غرب كردÙ<81>ان, السودان place hamlet 0.25 السودان sd Africa Northern Africa
+srs 2021-02-03 82009778 node Saras East, الولاية الشمالية, السودان place hamlet 0.25 السودان sd Africa Northern Africa
+the sudan 2021-02-03 258367505 relation السودان boundary administrative 0.696406722929938 السودان sd Africa Northern Africa
+national congress 2021-02-03 143923175 way National Congress, شارع المعونة, Al-Kadaro, SalÄ<81>mat al BÄ<81>shÄ<81>, الخرطوم, ولاية الخرطوم, 13311, السودان amenity public_building 0.201 السودان sd Africa Northern Africa
+university of khartoum 2021-02-03 164806297 way جامعة الخرطوم, شارع النيل, قاردن سيتي, الخرطوم, ولاية الخرطوم, 11111, السودان amenity university 0.401608614050897 السودان sd Africa Northern Africa
+lmb 2021-02-03 81909309 node Al Lamab, جبرة جنوب, ولاية الخرطوم, السودان place hamlet 0.25 السودان sd Africa Northern Africa
+sese 2021-02-03 82590645 node Sese, دلقو, الولاية الشمالية, السودان natural peak 0.4 السودان sd Africa Northern Africa
+umeå university 2021-02-03 70819385 node Datorföreningen Academic Computer Club UmeÃ¥ Universitet, Petrus Laestadius väg, Lilljansberget, Universitets- och sjukhusomrÃ¥det, UmeÃ¥, UmeÃ¥ kommun, Västerbottens län, 907 13, Sverige office association 0.101 Sverige se Europe Northern Europe
+treasury 2021-02-03 20386522 node Skattkammaren, Slottsbacken, Gamla stan, Södermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 111 31, Sverige tourism museum 0.244698616841389 Sverige se Europe Northern Europe
+regulus 2021-02-03 113402174 way Regulus, Planetstaden, Stampelyckan, Söder, Lund, Lunds kommun, Skåne län, Sverige place city_block 0.225 Sverige se Europe Northern Europe
+stockholm university 2021-02-03 104694332 way Stockholms universitet, Stora Skuggans Väg, Lappkärrsberget, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 17, Sverige amenity university 0.101 Sverige se Europe Northern Europe
+sweden 2021-02-03 257716320 relation Sverige boundary administrative 0.84163245433824 Sverige se Europe Northern Europe
+swedish museum of natural history 2021-02-03 217046 node Naturhistoriska riksmuseet, Frescativägen, Ekhagen, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 18, Sverige tourism museum 0.431447409196647 Sverige se Europe Northern Europe
+linköping university 2021-02-03 105800452 way Linköpings universitet, Hans Meijers väg, Västra Valla, Linköpings domkyrkodistrikt, Linköping, Linköpings kommun, Östergötlands län, 581 17, Sverige amenity university 0.551830836555001 Sverige se Europe Northern Europe
+oxo 2021-02-03 85642466 way Oxö, Mora kommun, Dalarnas län, Sverige place islet 0.25 Sverige se Europe Northern Europe
+university of gothenburg 2021-02-03 95030421 way Göteborgs Universitet, 100, Universitetsplatsen, Vasastaden, Centrum, Göteborg, Göteborgs Stad, Västra Götalands län, 405 30, Sverige amenity university 0.001 Sverige se Europe Northern Europe
+mattias green 2021-02-03 171383634 way Mattias, Sundby, Spånga-Tensta stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, Sverige place city_block 0.225 Sverige se Europe Northern Europe
+dow jones 2021-02-03 120411788 way Dow Jones, Nacka, Nacka kommun, Stockholms län, 131 33, Sverige highway path 0.275 Sverige se Europe Northern Europe
+swedish university of agricultural sciences 2021-02-03 193939119 way Sveriges lantbruksuniversitet, Håkan Gullesons Väg, Lilljansberget, Universitets- och sjukhusområdet, Umeå, Umeå kommun, Västerbottens län, 90729, Sverige amenity university 0.419996629384852 Sverige se Europe Northern Europe
+atcc 2021-02-03 91884358 way LFV ATCC, Luftleden, Sigtuna kommun, Stockholms län, 19060, Sverige building office 0.101 Sverige se Europe Northern Europe
+university of lund 2021-02-03 258273253 relation Lunds Tekniska Högskola, Box 118, Professorsgatan, Olshög, Professorsstaden, Centrum, Lund, Lunds kommun, Skåne län, 22100, Sverige amenity university 0.552959367524706 Sverige se Europe Northern Europe
+disease control and prevention 2021-02-03 95487742 way Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige office government 0.550936419284163 Sverige se Europe Northern Europe
+karolinska university hospital 2021-02-03 119648320 way Karolinska universitetssjukhuset, Ninni Kronbergs Gata, Hagastaden, Vasastaden, Norrmalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 113 65, Sverige amenity hospital 0.44859234613195 Sverige se Europe Northern Europe
+swedish academy 2021-02-03 64577899 node Sjösportskolan, 22, Talattagatan, Långedrag, Västra Göteborg, Göteborg, Göteborgs Stad, Västra Götalands län, 42676, Sverige amenity school 0.001 Sverige se Europe Northern Europe
+european centre for disease prevention and control 2021-02-03 95487742 way Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige office government 0.550936419284163 Sverige se Europe Northern Europe
+naver 2021-02-03 80191509 node Näver, Årjängs kommun, Värmlands län, Sverige place isolated_dwelling 0.2 Sverige se Europe Northern Europe
+genzyme 2021-02-03 78318285 node Genzyme, 42, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 82, Sverige office company 0.101 Sverige se Europe Northern Europe
+statoil 2021-02-03 258653712 relation Statoil, Rönninge, Salems kommun, Stockholms län, Sverige highway service 0.175 Sverige se Europe Northern Europe
+karolinska institute 2021-02-03 299960275 relation Karolinska Institutet campus Flemingsberg, Hälsovägen, BRF. Grantorp, Visättra, Flemingsberg, Huddinge kommun, Stockholms län, 14157, Sverige amenity university 0.679801406140393 Sverige se Europe Northern Europe
+swedish museum of natural history in stockholm 2021-02-03 217046 node Naturhistoriska riksmuseet, Frescativägen, Ekhagen, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 18, Sverige tourism museum 0.531447409196647 Sverige se Europe Northern Europe
+bmc 2021-02-03 134782082 way Biomedicinskt centrum, 3, Husargatan, Polacksbacken, Uppsala, Uppsala kommun, Uppsala län, 75275, Sverige amenity university 0.190508362962683 Sverige se Europe Northern Europe
+ecdc 2021-02-03 95487742 way Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige office government 0.450936419284163 Sverige se Europe Northern Europe
+royal institute of technology 2021-02-03 164817375 way Kungliga Tekniska högskolan, Norrtullstunneln, Ruddammen, Norra Djurgården, Östermalms stadsdelsområde, Stockholm, Stockholms kommun, Stockholms län, 114 86, Sverige amenity university 0.499138790121692 Sverige se Europe Northern Europe
+chalmers university of technology 2021-02-03 98299775 way Chalmers Tekniska Högskola, Guldhedsgatan, Johanneberg, Centrum, Göteborg, Göteborgs Stad, Västra Götalands län, 40530, Sverige amenity university 0.101 Sverige se Europe Northern Europe
+european spallation source 2021-02-03 128920092 way European Spallation Source, Öster, Lund, Lunds kommun, Skåne län, 224 84, Sverige landuse construction 0.626855406087553 Sverige se Europe Northern Europe
+dalarna university in falun 2021-02-03 661089 node Högskolan Dalarna, Högskolegatan, Lugnet, Falun, Falu kommun, Dalarnas län, 791 31, Sverige amenity university 0.540546922258437 Sverige se Europe Northern Europe
+university of stockholm 2021-02-03 299483682 relation Södertörns högskola, Hälsovägen, BRF. Grantorp, Visättra, Flemingsberg, Huddinge kommun, Stockholms län, 141 52, Sverige amenity university 0.482401781952281 Sverige se Europe Northern Europe
+smhi 2021-02-03 55428577 node Sveriges meteorologiska och hydrologiska institut, 1, Folkborgsvägen, Klockaretorpet, Norrköping, Norrköpings kommun, Östergötlands län, 60176, Sverige office government 0.645620487724216 Sverige se Europe Northern Europe
+disease prevention and control 2021-02-03 95487742 way Europeiskt centrum för förebyggande och kontroll av sjukdomar, 40, Gustav III:s boulevard, Arenastaden, Frösunda, Bergshamra, Solna kommun, Stockholms län, 169 73, Sverige office government 0.550936419284163 Sverige se Europe Northern Europe
+södertörn university library 2021-02-03 299483682 relation Södertörns högskola, Hälsovägen, BRF. Grantorp, Visättra, Flemingsberg, Huddinge kommun, Stockholms län, 141 52, Sverige amenity university 0.482401781952281 Sverige se Europe Northern Europe
+earth observatory of singapore 2021-02-03 68573497 node Earth Observatory Singapore, Southwest, 637331, Singapore natural peak 0.6 Singapore sg Asia South-Eastern Asia
+institute of bioengineering and nanotechnology 2021-02-03 50955646 node Institute of Bioengineering and Nanotechnology, 31, Biopolis Way, Biopolis, Queenstown, Southwest, 138669, Singapore office research 0.501 Singapore sg Asia South-Eastern Asia
+nus medical school 2021-02-03 131651364 way Duke-NUS Medical School, 8, College Road, Bukit Merah, Singapore, Central, 169857, Singapore building university 0.59350420583069 Singapore sg Asia South-Eastern Asia
+temasek life sciences laboratory 2021-02-03 109850096 way Temasek Life Sciences Laboratory, Prince George's Park, Queenstown, Southwest, 118411, Singapore building yes 0.401 Singapore sg Asia South-Eastern Asia
+nanyang technological university 2021-02-03 115958975 way Nanyang Technological University, Nanyang Green, Western Water Catchment, Southwest, 639667, Singapore amenity university 0.765073041127411 Singapore sg Asia South-Eastern Asia
+starbucks 2021-02-03 71728372 node Starbucks, 1, Maritime Square, Bukit Merah, Singapore, Central, 099253, Singapore amenity cafe 0.665860646943562 Singapore sg Asia South-Eastern Asia
+singapore immunology network 2021-02-03 54912680 node Singapore Immunology Network (SIgN), 8A, Biomedical Grove, Biopolis, Queenstown, Singapore, Southwest, 138648, Singapore office research 0.301 Singapore sg Asia South-Eastern Asia
+iseas yusof ishak institute 2021-02-03 258638587 relation ISEAS-Yusof Ishak Institute, 30, Heng Mui Keng Terrace, Pasir Panjang, Southwest, 119614, Singapore building university 0.706728041583383 Singapore sg Asia South-Eastern Asia
+national university of singapore 2021-02-03 105581168 way National University of Singapore, Business Link, Queenstown, Southwest, 119613, Singapore amenity university 0.924762239536787 Singapore sg Asia South-Eastern Asia
+duke nus medical school 2021-02-03 131651364 way Duke-NUS Medical School, 8, College Road, Bukit Merah, Singapore, Central, 169857, Singapore building university 0.69350420583069 Singapore sg Asia South-Eastern Asia
+national action party 2021-02-03 174317745 way People's Action Party Community Foundation, 57B, New Upper Changi Road, Bedok, Singapore, Southeast, 463057, Singapore building yes 0.201 Singapore sg Asia South-Eastern Asia
+essec business school 2021-02-03 184053844 way ESSEC Business School, Asia-Pacific, Nepal Park, Nepal Hill, Queenstown, Southwest, 138502, Singapore building school 0.301 Singapore sg Asia South-Eastern Asia
+asia-pacific economic cooperation 2021-02-03 296518551 way Asia-Pacific Economic Cooperation, Heng Mui Keng Terrace, Queenstown, Southwest, 118654, Singapore building yes 0.401 Singapore sg Asia South-Eastern Asia
+dbs 2021-02-03 72442407 node DBS, 1, Maritime Square, Bukit Merah, Singapore, Central, 099253, Singapore amenity bank 0.521335061990991 Singapore sg Asia South-Eastern Asia
+icbn 2021-02-03 55620813 node ICBN, Upper Cross Street, Chinatown, Outram, Singapore, Central, 058353, Singapore amenity bank 0.101 Singapore sg Asia South-Eastern Asia
+schering-plough 2021-02-03 3281068 node Schering-Plough, Tuas West Drive, Tuas, Southwest, 638408, Singapore highway bus_stop 0.201 Singapore sg Asia South-Eastern Asia
+in-q-tel 2021-02-03 241136298 way MRT Thomson–East Coast Line, North Woodlands Way, Woodlands, Northwest, 738343, Singapore railway subway 0.505151681397098 Singapore sg Asia South-Eastern Asia
+bioengineering institute 2021-02-03 50955646 node Institute of Bioengineering and Nanotechnology, 31, Biopolis Way, Biopolis, Queenstown, Southwest, 138669, Singapore office research 0.201 Singapore sg Asia South-Eastern Asia
+singapore 2021-02-03 258556513 relation Singapore boundary administrative 0.843276755105906 Singapore sg Asia South-Eastern Asia
+duke-nus medical school 2021-02-03 131651364 way Duke-NUS Medical School, 8, College Road, Bukit Merah, Singapore, Central, 169857, Singapore building university 0.69350420583069 Singapore sg Asia South-Eastern Asia
+international air transport association 2021-02-03 61626173 node International Air Transport Association, 80, Pasir Panjang Road, Alexandra, Singapore, Southwest, 117372, Singapore office company 0.401 Singapore sg Asia South-Eastern Asia
+st helena 2021-02-03 258726181 relation Saint Helena, Saint Helena, Ascension and Tristan da Cunha place island 0.780564296027606 Saint Helena, Ascension and Tristan da Cunha sh Africa Western Africa
+university of ljubljana 2021-02-03 146644115 way Astronomsko geofizikalni observatorij Golovec, 25, Pot na Golovec, Rakovnik, Ljubljana, Upravna Enota Ljubljana, 1000, Slovenija tourism attraction 0.387641222780259 Slovenija si Europe Southern Europe
+slovenia 2021-02-03 258398896 relation Slovenija boundary administrative 0.768267137056828 Slovenija si Europe Southern Europe
+goce 2021-02-03 4307950 node GoÄ<8d>e, Vipava, 5271, Slovenija place village 0.311234742212342 Slovenija si Europe Southern Europe
+siemens 2021-02-03 72187045 node Siemens, Laborecká, Terasa, KoÅ¡ice - mestská Ä<8d>asÅ¥ Západ, okres KoÅ¡ice II, KoÅ¡ice, KoÅ¡ický kraj, Východné Slovensko, 04011, Slovensko office company 0.685789819176952 Slovensko sk Europe Eastern Europe
+green program 2021-02-03 119578034 way PROGRAM, Brnianska, Zlatovce, TrenÄ<8d>Ãn, okres TrenÄ<8d>Ãn, TrenÄ<8d>iansky kraj, Západné Slovensko, 911 37, Slovensko building commercial 0.101 Slovensko sk Europe Eastern Europe
+ibm 2021-02-03 67786313 node IBM, 11, ProtifaÅ¡istických bojovnÃkov, Stredné Mesto, KoÅ¡ice - mestská Ä<8d>asÅ¥ Staré Mesto, okres KoÅ¡ice I, KoÅ¡ice, KoÅ¡ický kraj, Východné Slovensko, 04291, Slovensko office company 0.742881688686971 Slovensko sk Europe Eastern Europe
+slovakia 2021-02-03 257217802 relation Slovensko boundary administrative 0.777034782704995 Slovensko sk Europe Eastern Europe
+hbp 2021-02-03 184618893 way 303/237, HBP a.s. - baňa Čáry, Čáry, okres Senica, Trnavský kraj, Západné Slovensko, 90843, Slovensko landuse industrial 0.3 Slovensko sk Europe Eastern Europe
+karolinska 2021-02-03 42136560 node KarolÃnska, KarolÃna, Želiezovce, okres Levice, Nitriansky kraj, Západné Slovensko, Slovensko place locality 0.125 Slovensko sk Europe Eastern Europe
+hdp 2021-02-03 185886235 way HDP, Dúbrava, okres Liptovský Mikuláš, Žilinský kraj, Stredné Slovensko, Slovensko highway path 0.175 Slovensko sk Europe Eastern Europe
+snp 2021-02-03 258637575 relation SNP, Považská Bystrica, okres Považská Bystrica, TrenÄ<8d>iansky kraj, Západné Slovensko, Slovensko boundary administrative 0.35 Slovensko sk Europe Eastern Europe
+nier 2021-02-03 127927 node Nýrovce, okres Levice, Nitriansky kraj, Západné Slovensko, 935 67, Slovensko place village 0.446214416898128 Slovensko sk Europe Eastern Europe
+nepal program 2021-02-03 119578034 way PROGRAM, Brnianska, Zlatovce, TrenÄ<8d>Ãn, okres TrenÄ<8d>Ãn, TrenÄ<8d>iansky kraj, Západné Slovensko, 911 37, Slovensko building commercial 0.101 Slovensko sk Europe Eastern Europe
+ndp 2021-02-03 176840469 way NDP, Liptovská Štiavnica, okres Ružomberok, Žilinský kraj, Stredné Slovensko, Slovensko landuse meadow 0.3 Slovensko sk Europe Eastern Europe
+ras 2021-02-03 258705009 relation HraÅ¡ovÃk, okres KoÅ¡ice - okolie, KoÅ¡ický kraj, Východné Slovensko, Slovensko boundary administrative 0.468214832002329 Slovensko sk Europe Eastern Europe
+democracy and human rights 2021-02-03 157165773 way Network Movement for Democracy and Human rights, 78, Kailahun, Kailahun District, Eastern Province, 232, Sierra Leone amenity office 0.401 Sierra Leone sl Africa Western Africa
+university of sierra leone 2021-02-03 209181703 way Njala University Plantation Forest, Njala, Moyamba District, Southern Province, Sierra Leone landuse forest 0.5 Sierra Leone sl Africa Western Africa
+sierra leone 2021-02-03 257903966 relation Sierra Leone boundary administrative 0.866895719179607 Sierra Leone sl Africa Western Africa
+global times 2021-02-03 52844722 node global times, 15 Percival Street, Percival Street, GOVERNMENT WHARF, Tower Hill, Freetown, Western Area Urban, Western Area, 232, Sierra Leone amenity cinema 0.201 Sierra Leone sl Africa Western Africa
+kenema government hospital 2021-02-03 161047442 way Kenema Government Hospital, Combema Road, Kpayama, Kenema, Kenema District, Eastern Province, EASTERN, Sierra Leone amenity hospital 0.301 Sierra Leone sl Africa Western Africa
+san marino 2021-02-03 257263712 relation San Marino boundary administrative 0.859326375658518 San Marino sm Europe Southern Europe
+senegal 2021-02-03 258367179 relation Sénégal boundary administrative 0.7011432334198 Sénégal sn Africa Western Africa
+african institute for mathematical sciences 2021-02-03 245500132 way African Institute for Mathematical Sciences, Accès IRD, M'bour, Thiès, 23000, Sénégal amenity university 0.501 Sénégal sn Africa Western Africa
+aad 2021-02-03 14855897 node Cad, Taleex تلأ Ø, Sool سول, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال place hamlet 0.25 Soomaaliya الصومال so Africa Eastern Africa
+hamas 2021-02-03 14960222 node Xamaas, Ceerigaabo عيرجابو, سناج Sanaag, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال place village 0.275 Soomaaliya الصومال so Africa Eastern Africa
+shire 2021-02-03 14757227 node Shire, Qardho قرضو, Bariباري, Soomaaliya الصومال place village 0.375 Soomaaliya الصومال so Africa Eastern Africa
+jif 2021-02-03 14854299 node Jif, Borama بوراما, عدل Awdal, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال place village 0.375 Soomaaliya الصومال so Africa Eastern Africa
+university of bari 2021-02-03 245042079 way East African University, Ugaas Yaasiin Street, Boosaaso بوصاصو, Bossaso بوصاصو, Bariباري, Soomaaliya الصومال amenity university 0.452344279227432 Soomaaliya الصومال so Africa Eastern Africa
+state forestry administration 2021-02-03 14692688 node Forestry, Burco برعو, توجدير Togdheer, جمهورية أرض الصومال Jamhuuriyadda Soomaaliland, Soomaaliya الصومال place village 0.375 Soomaaliya الصومال so Africa Eastern Africa
+somalia 2021-02-03 258390915 relation Soomaaliya الصومال boundary administrative 0.681239435622405 Soomaaliya الصومال so Africa Eastern Africa
+suriname 2021-02-03 257419144 relation Suriname boundary administrative 0.761728642556969 Suriname sr Americas South America
+parliamentary 2021-02-03 83093461 node Parliamentary, Ministries Road, Hai Gonya, Juba, Central Equatoria, PRIVATE BAG, South Sudan tourism apartment 0.101 South Sudan ss
+tms 2021-02-03 128146184 way Aeroporto Internacional de São Tomé, ES14, Bairro de Aeroporto, Praia Gamboa, Ã<81>gua Grande, ProvÃncia de São Tomé, 461, São Tomé e PrÃncipe aeroway aerodrome 0.356849137603517 São Tomé e PrÃncipe st Africa Middle Africa
+el salvador 2021-02-03 258136452 relation El Salvador boundary administrative 0.886510020381369 El Salvador sv Americas Central America
+icarda 2021-02-03 181236548 way Icarda, رسم عبود, ناØية رسم الØرمل الإمام, Ù…ØاÙ<81>ظة Øلب, سوريا landuse farmland 0.3 سوريا sy Asia Western Asia
+syria 2021-02-03 257279539 relation سوريا boundary administrative 0.752519619259582 سوريا sy Asia Western Asia
+rhdf 2021-02-03 4617427 node الغدÙ<81>Ø©, ناØية معرة النعمان, منطقة معرة النعمان, Ù…ØاÙ<81>ظة إدلب, سوريا place village 0.275 سوريا sy Asia Western Asia
+iied 2021-02-03 4676615 node جب عيد, ناØية السعن, منطقة سلمية, Ù…ØاÙ<81>ظة Øماة, سوريا place village 0.275 سوريا sy Asia Western Asia
+azizi 2021-02-03 4628756 node عزيزة, ناØية جبل سمعان, منطقة جبل سمعان, Ù…ØاÙ<81>ظة Øلب, سوريا place village 0.275 سوريا sy Asia Western Asia
+military hospital 2021-02-03 166172527 way Military hospital, طرطوس, Ù…ØاÙ<81>ظة طرطوس, سوريا landuse military 0.4 سوريا sy Asia Western Asia
+aafs 2021-02-03 4535189 node جوار العÙ<81>ص, ناØية الناصرة, منطقة تلکلخ, Ù…ØاÙ<81>ظة Øمص, سوريا place village 0.275 سوريا sy Asia Western Asia
+swaziland 2021-02-03 257310894 relation eSwatini boundary administrative 0.621640856732353 eSwatini sz Africa Southern Africa
+chad 2021-02-03 258517069 relation Tchad تشاد boundary administrative 0.762462283081021 Tchad تشاد td Africa Middle Africa
+seti institute 2021-02-03 153816233 way Institut Tchadien pour la Recherche Agronomique et le Développement, شارع مليز, Ù<81>ارشا Farcha, 1er Arrondissement / الدائرة الأولى, N'Djaména انجمينا, BP41, Tchad تشاد office research 0.001 Tchad تشاد td Africa Middle Africa
+cad 2021-02-03 258517069 relation Tchad تشاد boundary administrative 0.662462283081021 Tchad تشاد td Africa Middle Africa
+seti 2021-02-03 258517069 relation Tchad تشاد boundary administrative 0.662462283081021 Tchad تشاد td Africa Middle Africa
+cmb 2021-02-03 259551000 relation Lomé, Togo boundary administrative 0.540313125234513 Togo tg Africa Western Africa
+food and agriculture organization 2021-02-03 26752512 node Food and Agriculture Organization, Avenue de Duisburg, Quartier Administratif, 1er Arrondissement, Lomé, BP: 353, Togo office ngo 0.401 Togo tg Africa Western Africa
+togo 2021-02-03 257546531 relation Togo boundary administrative 0.759992633432734 Togo tg Africa Western Africa
+chulalongkorn university 2021-02-03 258312812 relation จุฬาลงà¸<81>รณ์มหาวิทยาลัย, 254, ถนนพà¸<8d>าไท, วังใหม่, à¹<81>ขวงวังใหม่, เขตปทุมวัน, à¸<81>รุงเทพมหานคร, 10330, ประเทศไทย amenity university 0.460618187035857 ประเทศไทย th Asia South-Eastern Asia
+institute of molecular biosciences 2021-02-03 249564888 way Institute of Molecular Biosciences, 25/25, ถนนพุทธมณฑล สาย 4, ศาลายา, จังหวัดนครปà¸<90>ม, 73170, ประเทศไทย building yes 0.401 ประเทศไทย th Asia South-Eastern Asia
+cnt 2021-02-03 258466185 relation จังหวัดชัยนาท, ประเทศไทย boundary administrative 0.466806566636269 ประเทศไทย th Asia South-Eastern Asia
+tencent 2021-02-03 57503349 node Tencent, ถนนรัชดาภิเษà¸<81>, รัชดาภิเษà¸<81>, à¹<81>ขวงรัชดาภิเษà¸<81>, เขตดินà¹<81>ดง, à¸<81>รุงเทพมหานคร, 10400, ประเทศไทย shop computer 0.101 ประเทศไทย th Asia South-Eastern Asia
+pkk 2021-02-03 298297451 node สถานีรถไฟประจวบคีรีขันธ์, ถนนมหาราช 1, ประจวบคีรีขันธ์, จังหวัดประจวบคีรีขันธ์, 77000, ประเทศไทย railway station 0.370639694209592 ประเทศไทย th Asia South-Eastern Asia
+khon kaen university 2021-02-03 207021071 way Khon Kaen University, ถนนมิตรภาพ, บ้านหนà¸à¸‡à¹€à¸”ิ่น, จังหวัดหนà¸à¸‡à¸„าย, 43000, ประเทศไทย amenity school 0.301 ประเทศไทย th Asia South-Eastern Asia
+sri 2021-02-03 258233401 relation จังหวัดสระบุรี, ประเทศไทย boundary administrative 0.478610654960806 ประเทศไทย th Asia South-Eastern Asia
+ubon ratchathani university 2021-02-03 66929366 node Ubon Ratchathani University, ถนนสถลมาร์ค, จังหวัดà¸à¸¸à¸šà¸¥à¸£à¸²à¸Šà¸˜à¸²à¸™à¸µ, ประเทศไทย amenity university 0.301 ประเทศไทย th Asia South-Eastern Asia
+ska 2021-02-03 301424908 relation จังหวัดสงขลา, ประเทศไทย boundary administrative 0.486153860067244 ประเทศไทย th Asia South-Eastern Asia
+thc 2021-02-03 654670 node ลพบุรี, ถนน วัดพระธาตุ, ลพบุรี, จังหวัดลพบุรี, 15000, ประเทศไทย railway station 0.275244632729739 ประเทศไทย th Asia South-Eastern Asia
+pri 2021-02-03 258679311 relation จังหวัดปราจีนบุรี, ประเทศไทย boundary administrative 0.47016384498111 ประเทศไทย th Asia South-Eastern Asia
+national research council of thailand 2021-02-03 45408539 node สำนัà¸<81>งานà¸<81>ารวิจัยà¹<81>ห่งชาติ (วช.), 196, ถนนพหลโยธิน, เà¸<81>ษตร, à¹<81>ขวงลาดยาว, เขตจตุจัà¸<81>ร, à¸<81>รุงเทพมหานคร, 10900, ประเทศไทย office government 0.001 ประเทศไทย th Asia South-Eastern Asia
+pna 2021-02-03 258299298 relation จังหวัดพังงา, ประเทศไทย boundary administrative 0.473319178124722 ประเทศไทย th Asia South-Eastern Asia
+national science and technology development agency 2021-02-03 154780568 way NSTDA, ถนนยูงทà¸à¸‡, à¸à¸³à¹€à¸ à¸à¸„ลà¸à¸‡à¸«à¸¥à¸§à¸‡, จังหวัดปทุมธานี, 12121, ประเทศไทย office government 0.001 ประเทศไทย th Asia South-Eastern Asia
+nma 2021-02-03 258233320 relation จังหวัดนครราชสีมา, ประเทศไทย boundary administrative 0.493204619476859 ประเทศไทย th Asia South-Eastern Asia
+un food and agriculture organization 2021-02-03 139296121 way UN Food & Agriculture Organization, ถนนพระà¸à¸²à¸—ิตย์, พระà¸à¸²à¸—ิตย์, à¹<81>ขวงชนะสงคราม, เขตพระนคร, à¸<81>รุงเทพมหานคร, 10200, ประเทศไทย building office 0.401 ประเทศไทย th Asia South-Eastern Asia
+thailand 2021-02-03 258620831 relation ประเทศไทย boundary administrative 0.76262728915554 ประเทศไทย th Asia South-Eastern Asia
+chinese pla general hospital 2021-02-03 207820505 way Chinese shrine, ถ้ำปลา ซà¸à¸¢8, บ้านถ้ำสันติสุข, จังหวัดเชียงราย, ประเทศไทย amenity place_of_worship 0.101 ประเทศไทย th Asia South-Eastern Asia
+world bank group 2021-02-03 191303191 way World Bank Group, Avenida Marginal, Lecidere, Dili, 10, Timór Lorosa'e building yes 0.301 Timór Lorosa'e tl Asia South-Eastern Asia
+european bank for reconstruction and development 2021-02-03 48191450 node European Bank for Reconstruction and Development, 82, Atatürk (1972) köçesi, Berzeňňi (Berzengi), Aşgabat, Köpetdag etraby, 744000, Türkmenistan amenity bank 0.601 Türkmenistan tm Asia Central Asia
+tunisia 2021-02-03 258390327 relation تونس boundary administrative 0.734006780061664 تونس tn Africa Northern Africa
+ne syrtis 2021-02-03 259313705 relation خليج قابس, ولاية صÙ<81>اقس, تونس natural bay 0.410111385609355 تونس tn Africa Northern Africa
+sbi 2021-02-03 258953939 relation ‫صبيØ‬, معتمدية الصخيرة, ولاية صÙ<81>اقس, 3073, تونس boundary administrative 0.45 تونس tn Africa Northern Africa
+mida 2021-02-03 259125031 relation الميدة, معتمدية الميدة, ولاية نابل, تونس boundary administrative 0.45 تونس tn Africa Northern Africa
+gfi 2021-02-03 259231351 relation القÙ<81>Ù‰, معتمدية السبيخة, ولاية القيروان, تونس boundary administrative 0.45 تونس tn Africa Northern Africa
+cme 2021-02-03 248166891 way CME, الزهروني, معتمدية الØرائرية, ØÙŠ السلامة, ولاية تونس, تونس landuse commercial 0.3 تونس tn Africa Northern Africa
+tonga 2021-02-03 258595415 relation Tonga boundary administrative 0.73797603969758 Tonga to Oceania Polynesia
+eua 2021-02-03 258839633 relation 'Eua, Mata'aho, Vahe 'Eua, ʻEua, Tonga place island 0.425 Tonga to Oceania Polynesia
+hpa 2021-02-03 162568512 way Mala'e Vakapuna Salote Pilolevu, Hala Holopeka, Niu a Kalo, Pangai, Vahe Lifuka, Haʻapai, Tonga aeroway aerodrome 0.249182950422608 Tonga to Oceania Polynesia
+anatolia 2021-02-03 56798024 node Asia Minor, Polatlı, Ankara, İç Anadolu Bölgesi, Türkiye place peninsula 0.602668374396159 Türkiye tr Asia Western Asia
+turkey 2021-02-03 258445264 relation Türkiye boundary administrative 0.812289652418409 Türkiye tr Asia Western Asia
+sabanci university 2021-02-03 112700587 way Sabancı Üniversitesi, Yetkin Sokağı, Orta Mahallesi, Tuzla, İstanbul, Marmara Bölgesi, 34956, Türkiye amenity university 0.40124284206117 Türkiye tr Asia Western Asia
+eric 2021-02-03 15819058 node Eriç, Kemah, Erzincan, Doğu Anadolu Bölgesi, Türkiye place village 0.289139026272805 Türkiye tr Asia Western Asia
+jwst 2021-02-03 58940448 node Just inn Hotel, 18, Ibni-Kemal Caddesi, Hocapaşa Mahallesi, İstanbul, Fatih, İstanbul, Marmara Bölgesi, 34112, Türkiye tourism hotel 0.001 Türkiye tr Asia Western Asia
+nike 2021-02-03 116094096 way NIKE, Datça, Ege Bölgesi, Türkiye landuse military 0.445499031753052 Türkiye tr Asia Western Asia
+adf 2021-02-03 122265582 way Adıyaman Havalimanı, 02-26, Adıyaman merkez, Adıyaman, Güneydoğu Anadolu Bölgesi, Türkiye aeroway aerodrome 0.274532111506442 Türkiye tr Asia Western Asia
+istanbul technical university 2021-02-03 299541318 relation İstanbul Teknik Üniversitesi, Hacı Sokağı, Reşitpaşa Mahallesi, Sarıyer, İstanbul, Marmara Bölgesi, 34467, Türkiye amenity university 0.478845445337603 Türkiye tr Asia Western Asia
+nif 2021-02-03 302529699 node Nif, Fethiye, Muğla, Ege Bölgesi, Türkiye place village 0.375 Türkiye tr Asia Western Asia
+koç university 2021-02-03 182910189 way Koç Ãœniversitesi, Koç Meydanı, Rumeli Feneri Mahallesi, Sarıyer, Ä°stanbul, Marmara Bölgesi, 34450, Türkiye amenity university 0.507183702790066 Türkiye tr Asia Western Asia
+bilkent university 2021-02-03 96394890 way Bilkent Üniversitesi, 1598. Cadde, Bilkent, Üniversiteler Mahallesi, Çankaya, Ankara, İç Anadolu Bölgesi, 06800, Türkiye amenity university 0.101 Türkiye tr Asia Western Asia
+world resources institute 2021-02-03 65742500 node World Resources Institute, 83/1, Mühürdar Caddesi, Caferağa Mahallesi, Kadıköy, İstanbul, Marmara Bölgesi, 34710, Türkiye office company 0.301 Türkiye tr Asia Western Asia
+sabancı university 2021-02-03 112700587 way Sabancı Ãœniversitesi, Yetkin Sokağı, Orta Mahallesi, Tuzla, Ä°stanbul, Marmara Bölgesi, 34956, Türkiye amenity university 0.50124284206117 Türkiye tr Asia Western Asia
+onc 2021-02-03 61860502 node Onc, Kamil Sokağı, Orhangazi, Orhangazi Mahallesi, Sultanbeyli, İstanbul, Marmara Bölgesi, 34925, Türkiye shop furniture 0.101 Türkiye tr Asia Western Asia
+nişantaşı university 2021-02-03 76974025 node NiÅŸantaşı Ãœniversitesi Kampüsü, Ergenekon Caddesi, Bozkurt Mahallesi, Cumhuriyet Mahallesi, ÅžiÅŸli, Ä°stanbul, Marmara Bölgesi, Türkiye amenity university 0.101 Türkiye tr Asia Western Asia
+okeanos 2021-02-03 190826338 way 27, Okeanos, Selimiye, Manavgat, Antalya, Akdeniz Bölgesi, Türkiye landuse residential 0.3 Türkiye tr Asia Western Asia
+middle east technical university 2021-02-03 259201298 relation Orta Doğu Teknik Üniversitesi, 1, 1580. Sokak, Çiğdem Mahallesi, Ankara, Çankaya, Ankara, İç Anadolu Bölgesi, 06800, Türkiye amenity university 0.473631673098451 Türkiye tr Asia Western Asia
+istac 2021-02-03 103485000 way ISTAC, Göktürk Merkez Mahallesi, Eyüpsultan, İstanbul, Marmara Bölgesi, 34077, Türkiye highway unclassified 0.2 Türkiye tr Asia Western Asia
+istanbul university 2021-02-03 747123 node İstanbul Üniversitesi, Besim Ömerpaşa Caddesi, Süleymaniye Mahallesi, İstanbul, Fatih, İstanbul, Marmara Bölgesi, 34116, Türkiye amenity university 0.521226339743682 Türkiye tr Asia Western Asia
+boğaziçi university 2021-02-03 101946622 way BoÄŸaziçi Ãœniversitesi Güney YerleÅŸkesi, Amiral Fahri Ergin Sokağı, Rumeli Hisarı Mahallesi, Sarıyer, Ä°stanbul, Marmara Bölgesi, 34470, Türkiye amenity university 0.5610714966844 Türkiye tr Asia Western Asia
+tübitak 2021-02-03 139775964 way TÃœBÄ°TAK, 221, Atatürk Bulvarı, Remzi OÄŸuz Arık Mahallesi, Ankara, Çankaya, Ankara, İç Anadolu Bölgesi, 06100, Türkiye office government 0.001 Türkiye tr Asia Western Asia
+trinidad and tobago 2021-02-03 258485524 relation Trinidad and Tobago boundary administrative 0.975753620834238 Trinidad and Tobago tt Americas Caribbean
+china computer federation 2021-02-03 38056389 node The New China Palace Restaurant and Bar, Rapsey Street, Ellerslie Park, Federation Park, Port of Spain, 190130, Trinidad and Tobago amenity restaurant 0.201 Trinidad and Tobago tt Americas Caribbean
+tuvalu 2021-02-03 258343085 relation Tuvalu boundary administrative 0.717228207678876 Tuvalu tv Oceania Polynesia
+academia sinica 2021-02-03 125761439 way ä¸å¤®ç ”究院, 128, ç ”ç©¶é™¢è·¯äºŒæ®µ, ä¸ç ”里, å<8d>—港å<8d>€, 三é‡<8d>埔, 臺北市, 11529, 臺ç<81>£ amenity research_institute 0.586985895897651 臺ç<81>£ tw Asia Eastern Asia
+ministry of health and welfare 2021-02-03 14219486 node å<81>¥ä¿<9d>局站, ä¹<9d>如二路, å¾·ä»<81>里, 三民å<8d>€, 高雄市, 807, 臺ç<81>£ highway bus_stop 0.001 臺ç<81>£ tw Asia Eastern Asia
+shilin district court 2021-02-03 302352027 relation ç¦<8f>德里, 士林å<8d>€, 臺北市, 臺ç<81>£ boundary administrative 0.450936419284163 臺ç<81>£ tw Asia Eastern Asia
+democratic progressive party 2021-02-03 25178248 node 民主進æ¥é»¨, 30, 北平æ<9d>±è·¯, å…‰è<8f>¯å•†å ´, 梅花里, ä¸æ£å<8d>€, è<8f>¯å±±, 臺北市, 10049, 臺ç<81>£ office political_party 0.513806514981921 臺ç<81>£ tw Asia Eastern Asia
+taiwan 2021-02-03 257930770 relation 臺ç<81>£ boundary administrative 0.749419791781313 臺ç<81>£ tw Asia Eastern Asia
+executive yuan 2021-02-03 59877038 node 行政院, 1, å¿ å<9d>æ<9d>±è·¯ä¸€æ®µ, 梅花里, ä¸æ£å<8d>€, è<8f>¯å±±, 臺北市, 10058, 臺ç<81>£ office government 0.528630874953084 臺ç<81>£ tw Asia Eastern Asia
+national tsing hua university 2021-02-03 258520993 relation 國立清è<8f>¯å¤§å¸, 101, 光復路二段, è»<8d>功里, æ<9d>±å<8d>€, 新竹市, 30013, 臺ç<81>£ amenity university 0.460442945520659 臺ç<81>£ tw Asia Eastern Asia
+chiao tung university 2021-02-03 258760261 relation 國立交通大å¸å…‰å¾©æ ¡å<8d>€, 1001, 大å¸è·¯, 光明里, æ<9d>±å<8d>€, 新竹市, 30010, 臺ç<81>£ amenity university 0.438299554906152 臺ç<81>£ tw Asia Eastern Asia
+supreme administrative court 2021-02-03 25702443 node 最高行政法院, 1, é‡<8d>æ…¶å<8d>—路一段126å··, 建國里, ä¸æ£å<8d>€, 城內, 臺北市, 10048, 臺ç<81>£ amenity courthouse 0.26358119422997 臺ç<81>£ tw Asia Eastern Asia
+ctv 2021-02-03 108045711 way ä¸åœ‹é›»è¦–å…¬å<8f>¸, 120, é‡<8d>陽路, 基河國宅三期, å<8d>—港å<8d>€, 三é‡<8d>埔, 臺北市, 11573, 臺ç<81>£ amenity studio 0.480565769794864 臺ç<81>£ tw Asia Eastern Asia
+national taiwan university of science and technology 2021-02-03 258700551 relation 國立臺ç<81>£ç§‘技大å¸, 43, 基隆路四段, å¸åºœé‡Œ, 大安å<8d>€, 公館, 臺北市, 10607, 臺ç<81>£ amenity university 0.403228244753236 臺ç<81>£ tw Asia Eastern Asia
+national central university 2021-02-03 133790181 way 國立ä¸å¤®å¤§å¸, 300, ä¸å¤§è·¯, 上三座屋, 五權里, ä¸å£¢å<8d>€, 桃園市, 320, 臺ç<81>£ amenity university 0.4530695196617 臺ç<81>£ tw Asia Eastern Asia
+ntust 2021-02-03 297907542 node 臺ç<81>£ç§‘技大å¸æ£é–€, 基隆路四段, å¸åºœé‡Œ, 大安å<8d>€, 公館, 臺北市, 10607, 臺ç<81>£ amenity bicycle_rental 0.001 臺ç<81>£ tw Asia Eastern Asia
+national taiwan university 2021-02-03 258571682 relation 國立臺ç<81>£å¤§å¸, 1, ç¾…æ–¯ç¦<8f>路四段, 文盛里, ä¸æ£å<8d>€, 公館, 臺北市, 10617, 臺ç<81>£ amenity university 0.525266971884114 臺ç<81>£ tw Asia Eastern Asia
+penghu 2021-02-03 258475315 relation 澎湖縣, 臺ç<81>£ boundary administrative 0.518098074053445 臺ç<81>£ tw Asia Eastern Asia
+national sun yat-sen university 2021-02-03 259320035 relation 國立ä¸å±±å¤§å¸, 70, 蓮海路, 桃æº<90>里, 鼓山å<8d>€, 高雄市, 804, 臺ç<81>£ amenity university 0.444647217327514 臺ç<81>£ tw Asia Eastern Asia
+hsus 2021-02-03 54120623 node 許金å<90>‰å©¦ç”¢ç§‘診所, 155, 繼光街, 繼光里, ä¸å<8d>€, 臺ä¸å¸‚, 40046, 臺ç<81>£ amenity clinic 0.001 臺ç<81>£ tw Asia Eastern Asia
+national institute for medical research 2021-02-03 68851905 node National Institute for Medical Research, Makuburi Rd, Makuburi, Dar es Salaam, Coastal Zone, 21493, Tanzania office educational_institution 0.501 Tanzania tz Africa Eastern Africa
+institute of meteorology 2021-02-03 54166158 node Institute of Meteorology, Majengo Mwanga Street, Katubuka, Kigoma Rural, Kigoma, Western Zone, 47000, Tanzania amenity school 0.301 Tanzania tz Africa Eastern Africa
+tanzania national parks 2021-02-03 197453437 way Simba A public campsite, T17, Kimba, Ngorongoro, Arusha, Northern Zone, Tanzania tourism camp_site 0.101 Tanzania tz Africa Eastern Africa
+ifakara health institute 2021-02-03 168888993 way Ifakara Health Institute, Bagamoyo Road, Mwanakalenge, Bagamoyo, Pwani, Coastal Zone, 66, Tanzania building yes 0.301 Tanzania tz Africa Eastern Africa
+environmental laboratory 2021-02-03 123904242 way Environmental Laboratory, Makongo Road, Makongo, Dar es Salaam, Coastal Zone, 225, Tanzania building school 0.201 Tanzania tz Africa Eastern Africa
+tanzania 2021-02-03 257254156 relation Tanzania boundary administrative 0.806848122384939 Tanzania tz Africa Eastern Africa
+nhc 2021-02-03 80286627 node Nhc, Muleba, Kagera, Lake Zone, Tanzania place village 0.375 Tanzania tz Africa Eastern Africa
+queensland institute of medical research 2021-02-03 52660057 node Institute of Rural Development Planning, Machinjioni-Bwiru, Kitangiri, Mihama, Ilemela, Mwanza, Lake Zone, +225, Tanzania office educational_institution 0.201 Tanzania tz Africa Eastern Africa
+obey as house 2021-02-03 46195275 node Obey, T9, Kasulu, Kigoma, Western Zone, 35, Tanzania shop stationery 0.201 Tanzania tz Africa Eastern Africa
+university of dar es salaam 2021-02-03 889510 node University of Dar es Salaam, University Road, Chuo Kikuu, Ubungo, Dar es Salaam, Coastal Zone, 131, Tanzania amenity university 0.896675389924706 Tanzania tz Africa Eastern Africa
+orbital 2021-02-03 202732260 way Orbital, Babati, Manyara, Northern Zone, Tanzania highway unclassified 0.2 Tanzania tz Africa Eastern Africa
+antiquities authority 2021-02-03 49902313 node Antiquities Authority (to get permit for islands), Kilwa-Nangurukuru Road, Kilwa Masoko, Kilwa, Lindi, Coastal Zone, Tanzania office government 0.201 Tanzania tz Africa Eastern Africa
+saint joseph university 2021-02-03 225955760 way St.Joseph University, Morogoro Road, Mbezi, Dar es Salaam, Coastal Zone, 11007, Tanzania amenity university 0.201 Tanzania tz Africa Eastern Africa
+people's democratic party 2021-02-03 44502629 node United People's Democratic Party (UPDP), 21, Kagera Street, Kagera, Makurumla, Dar es Salaam, Coastal Zone, P.O.BOX 22304, Tanzania office political_party 0.401 Tanzania tz Africa Eastern Africa
+sstl 2021-02-03 175656650 way SSTL Group, Bwawani, Mwananyamala, Dar es Salaam, Coastal Zone, 31537, Tanzania office company 0.101 Tanzania tz Africa Eastern Africa
+imi 2021-02-03 42593582 node Ihemi, Iringa, Southern Highlands Zone, Tanzania place village 0.275 Tanzania tz Africa Eastern Africa
+institute of medical research 2021-02-03 52660057 node Institute of Rural Development Planning, Machinjioni-Bwiru, Kitangiri, Mihama, Ilemela, Mwanza, Lake Zone, +225, Tanzania office educational_institution 0.201 Tanzania tz Africa Eastern Africa
+aga khan university 2021-02-03 68562414 node Aga Khan University, T5, Arusha, Northern Zone, 10086, Tanzania amenity school 0.301 Tanzania tz Africa Eastern Africa
+nmts 2021-02-03 202363077 way 19, Ð<9d>авчальний центр цивільного захиÑ<81>ту, Броди, БродівÑ<81>ька міÑ<81>ька рада, ЗолочівÑ<81>ький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 80600-80603, Україна landuse commercial 0.2 Україна ua Europe Eastern Europe
+uber 2021-02-03 63503463 node Uber, 3а, ОÑ<81>кара Кольберга вулицÑ<8f>, Цитадель, Галицький район, Львів, ЛьвівÑ<81>ька міÑ<81>ька громада, ЛьвівÑ<81>ький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 79013, Україна office yes 0.101 Україна ua Europe Eastern Europe
+scientific council 2021-02-03 126589521 way Ð<9d>ауководоÑ<81>лідний інÑ<81>титут "Синтез", ТуÑ<81>тановичі, БориÑ<81>лав, БориÑ<81>лавÑ<81>ький Ñ<81>тароÑ<81>тинÑ<81>ький округ, БориÑ<81>лавÑ<81>ька міÑ<81>ька рада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, Україна landuse industrial 0.2 Україна ua Europe Eastern Europe
+grl 2021-02-03 79972495 node ГРЛ, КиївÑ<81>ький район, Полтава, ПoлтaвÑ<81>ькa міÑ<81>ька громада, ПолтавÑ<81>ький район, ПолтавÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 36007, Україна place suburb 0.275 Україна ua Europe Eastern Europe
+ua 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна ua Europe Eastern Europe
+uea 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна ua Europe Eastern Europe
+national climate council 2021-02-03 17215913 node Кліматичний Ñ<81>алон "Мертвого морÑ<8f>", 12, Городище вулицÑ<8f>, СуховолÑ<8f>, ТруÑ<81>кавець, ТруÑ<81>кавецька міÑ<81>ька об'єднана територіальна громада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 82200, Україна amenity doctors 0.001 Україна ua Europe Eastern Europe
+ashg 2021-02-03 182600471 way м.Южне, Ð<90>ШГ, Хіміків вулицÑ<8f>, Южне, ОдеÑ<81>ький район, ОдеÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 65481-65489, Україна amenity school 0.001 Україна ua Europe Eastern Europe
+almaz 2021-02-03 2367823 node Ð<90>лмаз, Пшенична вулицÑ<8f>, Перемога, Борщагівка, СвÑ<8f>тошинÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 03165, Україна railway halt 0.31689306175332 Україна ua Europe Eastern Europe
+uae 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна ua Europe Eastern Europe
+saints cyril 2021-02-03 22338079 node Пам'Ñ<8f>тник Кирилу Ñ– Мефодію, Кирила Ñ– МефодіÑ<8f> площа, Пентагон, Мукачево, МукачівÑ<81>ька міÑ<81>ька громада, МукачівÑ<81>ький район, ЗакарпатÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 89600, Україна historic memorial 0.001 Україна ua Europe Eastern Europe
+elkh 2021-02-03 44342547 node Ðльх-КаÑ<8f>, ДобровÑ<81>кое Ñ<81>ельÑ<81>кое поÑ<81>еление, СимферопольÑ<81>кий район, 98533, Україна natural peak 0.3 Україна ua Europe Eastern Europe
+climate council 2021-02-03 17215913 node Кліматичний Ñ<81>алон "Мертвого морÑ<8f>", 12, Городище вулицÑ<8f>, СуховолÑ<8f>, ТруÑ<81>кавець, ТруÑ<81>кавецька міÑ<81>ька об'єднана територіальна громада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 82200, Україна amenity doctors 0.001 Україна ua Europe Eastern Europe
+uae ministry of foreign affairs 2021-02-03 96214681 way МініÑ<81>терÑ<81>тво закордонних Ñ<81>прав, 1, МихайлівÑ<81>ька площа, Старий Київ, Центр, ШевченківÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 01025, Україна amenity public_building 0.436669512144612 Україна ua Europe Eastern Europe
+nrc 2021-02-03 45182287 node Ð<9d>орвезька рада у Ñ<81>правах біженців, 10 к2, Федоренка вулицÑ<8f>, Сєвєродонецьк, Сєвєродонецький район, ЛуганÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 93408, Україна office ngo 0.30799018260571 Україна ua Europe Eastern Europe
+ods 2021-02-03 138824479 way Міжнародний аеропорт "ОдеÑ<81>а", Івана та ЮріÑ<8f> Лип вулицÑ<8f>, 10-й квартал, Район IV-1 "Південно-Західний" ("Черемушки"), МалиновÑ<81>ький район, ОдеÑ<81>а, ОдеÑ<81>ький район, ОдеÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 65078, Україна aeroway aerodrome 0.445681568627775 Україна ua Europe Eastern Europe
+ukraine 2021-02-03 257727085 relation Україна boundary administrative 0.816444243916417 Україна ua Europe Eastern Europe
+bogomoletz institute of physiology 2021-02-03 103259236 way ІнÑ<81>титут фізіології ім. О.О. БогомольцÑ<8f> Ð<9d>Ð<90>Ð<9d>У, 4, Ð<90>кадеміка БогомольцÑ<8f> вулицÑ<8f>, ЛевашовÑ<81>ька Гора, Липки, ПечерÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 01043, Україна office research 0.001 Україна ua Europe Eastern Europe
+tokyo medical university 2021-02-03 17911626 node Медичний універÑ<81>итет, ЛичаківÑ<81>ька вулицÑ<8f>, Личаків, ЛичаківÑ<81>ький район, Львів, ЛьвівÑ<81>ька міÑ<81>ька громада, ЛьвівÑ<81>ький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 79010, Україна railway tram_stop 0.001 Україна ua Europe Eastern Europe
+ivf 2021-02-03 257286052 relation Івано-ФранківÑ<81>ька облаÑ<81>Ñ‚ÑŒ, Україна boundary administrative 0.598264833674486 Україна ua Europe Eastern Europe
+cwc 2021-02-03 259500805 relation Міжнародний Ð<90>еропорт Чернівці, УÑ<81>тима Кармелюка вулицÑ<8f>, Чернівці, Чернівецький район, Чернівецька облаÑ<81>Ñ‚ÑŒ, 58009, Україна aeroway aerodrome 0.343659122005759 Україна ua Europe Eastern Europe
+unified command 2021-02-03 159462615 way Kommandobunkersilo, Ð<9d>-24, СинюхинобрідÑ<81>ька Ñ<81>ільÑ<81>ька територіальна громада, ПервомайÑ<81>ький район, МиколаївÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 55235, Україна building silo 0.001 Україна ua Europe Eastern Europe
+polytechnic university of milan 2021-02-03 48343820 node Політехнічний універÑ<81>итет, Шевченка проÑ<81>пект, Відрада, ПриморÑ<81>ький район, ОдеÑ<81>а, ОдеÑ<81>ький район, ОдеÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 65050, Україна highway bus_stop 0.001 Україна ua Europe Eastern Europe
+institute of geological sciences 2021-02-03 118391727 way ІнÑ<81>титут геологічних наук, 55б, ОлеÑ<81>Ñ<8f> Гончара вулицÑ<8f>, СвÑ<8f>тоÑ<81>лавÑ<81>ький Ñ<8f>Ñ€, Центр, ШевченківÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 01054, Україна building university 0.001 Україна ua Europe Eastern Europe
+us institute of medicine 2021-02-03 5595802 node МедуниверÑ<81>итет, бульвар Ленина, Железнодорожный район, Симферополь, СимферопольÑ<81>кий городÑ<81>кой Ñ<81>овет, 295006, Україна highway bus_stop 0.001 Україна ua Europe Eastern Europe
+nektar 2021-02-03 157515631 way 4, Ð<9d>ектар, Вишків, Луцьк, Луцька міÑ<81>ька громада, Луцький район, ВолинÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 43000-43499, Україна landuse industrial 0.2 Україна ua Europe Eastern Europe
+bogolyubov institute for theoretical physics 2021-02-03 117826903 way ІнÑ<81>титут теоретичної фізики ім. Ðœ.Ðœ. Боголюбова Ð<9d>Ð<90>Ð<9d> України, 14б/1, Метрологічна вулицÑ<8f>, Ñ<81>елище Ð<9d>аукове, ФеофаніÑ<8f>, ГолоÑ<81>іївÑ<81>ький район, Київ, КиївÑ<81>ька міÑ<81>ька громада, 03143, Україна office research 0.001 Україна ua Europe Eastern Europe
+national scientific research council 2021-02-03 126589521 way Ð<9d>ауководоÑ<81>лідний інÑ<81>титут "Синтез", ТуÑ<81>тановичі, БориÑ<81>лав, БориÑ<81>лавÑ<81>ький Ñ<81>тароÑ<81>тинÑ<81>ький округ, БориÑ<81>лавÑ<81>ька міÑ<81>ька рада, Дрогобицький район, ЛьвівÑ<81>ька облаÑ<81>Ñ‚ÑŒ, Україна landuse industrial 0.2 Україна ua Europe Eastern Europe
+institute of medicine 2021-02-03 5595802 node МедуниверÑ<81>итет, бульвар Ленина, Железнодорожный район, Симферополь, СимферопольÑ<81>кий городÑ<81>кой Ñ<81>овет, 295006, Україна highway bus_stop 0.001 Україна ua Europe Eastern Europe
+hrk 2021-02-03 100226680 way Міжнародний аеропорт "Харків", Планерний провулок, ОÑ<81>нов’Ñ<8f>нÑ<81>ький район, Харків, Ð¥apківÑ<81>ькa міÑ<81>ька громада, ХарківÑ<81>ький район, ХарківÑ<81>ька облаÑ<81>Ñ‚ÑŒ, 61031, Україна aeroway aerodrome 0.436669512144612 Україна ua Europe Eastern Europe
+risk network 2021-02-03 63292544 node Children At Risk Action Network, Willis Road, Namirembe, Mengo, Kampala Capital City, Kampala, Central Region, 33903, Uganda office association 0.201 Uganda ug Africa Eastern Africa
+united nations development programme 2021-02-03 44309116 node United Nations Development Programme, Yusuf Lule Road, Kitante, Wandegeya, Kampala Capital City, Kampala, Central Region, 29880, Uganda office quango 0.401 Uganda ug Africa Eastern Africa
+licensing board 2021-02-03 52447752 node Ministry of Works and Transport - Transport Licensing Board - Main Office, Old Portbell Road, Wankoko, Kiswa, Kampala Capital City, Kampala, Central Region, 24144, Uganda office government 0.201 Uganda ug Africa Eastern Africa
+genetic technologies 2021-02-03 72430341 node AGT Agro Genetic Technologies, Fort Portal - Kampala Road, Kiwumu, Buloba, Wakiso, Central Region, P.O BOX 14047, Uganda office research 0.201 Uganda ug Africa Eastern Africa
+uganda 2021-02-03 257547928 relation Uganda boundary administrative 0.797020967844266 Uganda ug Africa Eastern Africa
+ethiopian airlines 2021-02-03 43675550 node Ethiopian Airlines, Kimathi Avenue, Kibuli, Nakasero, Kampala Capital City, Kampala, Central Region, 7063, Uganda office company 0.201 Uganda ug Africa Eastern Africa
+iavi 2021-02-03 200242272 way MRC IAVI, Somero Road, Masaka, Central Region, 235, Uganda building yes 0.101 Uganda ug Africa Eastern Africa
+oci 2021-02-03 60558755 node Oci, Ajia, Arua, Northern Region, Uganda place village 0.375 Uganda ug Africa Eastern Africa
+unaids 2021-02-03 44866079 node UNAIDS, 60, Prince Charles Drive, Kisementi, Kololo, Kampala Capital City, Kampala, Central Region, 8352, Uganda office quango 0.101 Uganda ug Africa Eastern Africa
+bwindi impenetrable forest 2021-02-03 258803943 relation Bwindi Impenetrable Forest, Mpungu Sub-County, Kisoro, Western Region, Uganda natural wood 0.562719188578863 Uganda ug Africa Eastern Africa
+institute of pure 2021-02-03 62440383 node Umma Islamic Institute Yumbe, Moyo Road, Ibanga, Yumbe, Northern Region, 6, Uganda amenity school 0.101 Uganda ug Africa Eastern Africa
+makerere 2021-02-03 22277112 node Makerere, Kampala Capital City, Kampala, Central Region, P.O. BOX 36152 KAMPALA, Uganda place suburb 0.375 Uganda ug Africa Eastern Africa
+makerere university 2021-02-03 171750869 way Makerere University, Makerere Hill Road, Makerere Kivulu, Nakulabye, Kampala Capital City, Kampala, Central Region, P.O BOX 9 MBARARA, Uganda amenity university 0.655626604417121 Uganda ug Africa Eastern Africa
+uganda virus research institute 2021-02-03 176398119 way Uganda Virus Research Institute, 51-59, Nakiwogo Road, Lunyo Estate, Nakiwogo, Entebbe, Wakiso, Central Region, 31304, Uganda office research 0.401 Uganda ug Africa Eastern Africa
+mbarara university 2021-02-03 48867675 node Mbarara University of Science and Technology, University Road, Boma B, Mbarara, Western Region, PO BOX 1051, Uganda amenity school 0.201 Uganda ug Africa Eastern Africa
+uganda national council for science and technology 2021-02-03 44520158 node Uganda National Council for Science and Technology, Plot 6, Kimera Road, Ministers Village, Ntinda, Kampala Capital City, Kampala, Central Region, 6884 KAMPALA, Uganda office government 0.701 Uganda ug Africa Eastern Africa
+foundation for innovative new diagnostics 2021-02-03 14070822 node Foundation for Innovative New Diagnostics, Lumumba Avenue, Bat Valley, Wandegeya, Kampala Capital City, Kampala, Central Region, 21706, Uganda office ngo 0.501 Uganda ug Africa Eastern Africa
+malaria consortium 2021-02-03 5536278 node Malaria Consortium, 25, Upper Naguru East Road, Kabira, Naguru, Kampala Capital City, Kampala, Central Region, 3021, Uganda office company 0.201 Uganda ug Africa Eastern Africa
+civil aviation authority 2021-02-03 170067698 way Civil Aviation Authority, Airport Road, Old Entebbe Subward, Kigungu Ward, Bukiberu, Wakiso, Central Region, 7545, Uganda office government 0.61689306175332 Uganda ug Africa Eastern Africa
+ötzi 2021-02-03 47932812 node Mount Otze, Moyo, Northern Region, Uganda natural peak 0.3 Uganda ug Africa Eastern Africa
+oregon state university 2021-02-03 258801464 relation Oregon State University, Northwest Van Buren Avenue, Corvallis, Benton County, Oregon, 97331, United States amenity university 0.829529792748761 United States us Americas Northern America
+brent central 2021-02-03 259444301 relation Brent, Bibb County, Alabama, 35034, United States boundary administrative 0.522385266730329 United States us Americas Northern America
+centre for northern studies 2021-02-03 2328806 node Center for Northern Studies, Cross Road, Lamoille County, Vermont, United States amenity school 0.301 United States us Americas Northern America
+ucsf 2021-02-03 99733448 way University of California, San Francisco, Irving Street, Inner Sunset, San Francisco, San Francisco City and County, California, 94122, United States amenity university 0.479827038246968 United States us Americas Northern America
+james clerk maxwell telescope 2021-02-03 5561092 node James Clerk Maxwell Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States man_made telescope 0.761564502190835 United States us Americas Northern America
+desert research institute 2021-02-03 97296899 way Desert Research Institute, University Center Drive, Hughes Center, Paradise, Clark County, Nevada, 89169-4813, United States amenity university 0.301 United States us Americas Northern America
+ne 2021-02-03 257963338 relation Nebraska, United States boundary administrative 0.799657112825905 United States us Americas Northern America
+center for biological diversity 2021-02-03 223764606 way Center For Biological Diversity, 378, North Main Avenue, El Presidio, Tucson, Pima County, Arizona, 85701, United States building yes 0.401 United States us Americas Northern America
+food & water watch 2021-02-03 4509818 node Duck Deli, 1221, Duck Road, Ships Watch, Duck, Dare County, North Carolina, 27949, United States amenity restaurant 0.101 United States us Americas Northern America
+columbia hills 2021-02-03 246982992 way Columbia Hills, Klickitat County, Washington, 98673, United States natural mountain_range 0.5 United States us Americas Northern America
+l-1 2021-02-03 177817604 way L-1, Palm Beach County, Florida, 33417, United States waterway canal 0.45 United States us Americas Northern America
+oregon 2021-02-03 257496023 relation Oregon, United States boundary administrative 0.824296037464145 United States us Americas Northern America
+portland state university 2021-02-03 258656375 relation Portland State University, Southwest Terwilliger Boulevard, Marquam Hill, Homestead, Portland, Metro, Oregon, 97201, United States amenity university 0.773801459429994 United States us Americas Northern America
+us 2021-02-03 257984054 relation United States boundary administrative 0.935691367457589 United States us Americas Northern America
+wistar institute 2021-02-03 99114832 way Wistar Institute, 3601, Spruce Street, University City, Philadelphia, Philadelphia County, Pennsylvania, 19104, United States building university 0.485649467985799 United States us Americas Northern America
+pentagon 2021-02-03 258346723 relation Pentagon, Corridor 6, Arlington, Arlington County, Virginia, 20310, United States military office 0.666673809290972 United States us Americas Northern America
+harvard law school 2021-02-03 2990245 node Harvard Law School Library, 1545, Massachusetts Avenue, Old Cambridge, Cambridge, Middlesex County, Massachusetts, 02138-2903, United States amenity library 0.301 United States us Americas Northern America
+south dakota state university in brookings 2021-02-03 109863860 way South Dakota State University, Harvey Dunn Street, Brookings, Brookings County, South Dakota, 57007, United States amenity university 1.00718370279007 United States us Americas Northern America
+cleveland clinic 2021-02-03 181161483 way Cleveland Clinic, 9500, Euclid Avenue, Hough, University Circle, Cleveland, Cuyahoga County, Ohio, 44195, United States amenity hospital 0.607266933591874 United States us Americas Northern America
+planning commission 2021-02-03 145886965 way Maryland-National Capital Park and Planning Commission, 6611, Kenilworth Avenue, Riverdale Park, Prince George's County, Maryland, 20737, United States office government 0.497085518539193 United States us Americas Northern America
+texas state university 2021-02-03 297522715 relation Texas State University, 601, University Drive, San Marcos, Texas, 78666, United States amenity university 0.731950990386221 United States us Americas Northern America
+us customs 2021-02-03 169811968 way US Customs, Mc Aree Road, Eagle Ridge Apartments, Waukegan, Lake County, Illinois, 60087, United States office government 0.201 United States us Americas Northern America
+nrg energy 2021-02-03 226847874 way NRG Energy Fly Ash Landfill, Tonawanda, Erie County, New York, United States landuse landfill 0.4 United States us Americas Northern America
+occidental petroleum 2021-02-03 185703827 way Occidental Petroleum, Deauville Boulevard, Westridge Park, Midland, Midland County, Texas, 79703, United States building yes 0.201 United States us Americas Northern America
+stuart school of business 2021-02-03 2815985 node Stuart School, 39th Street, Metairie, Jefferson Parish, Louisiana, 70001, United States amenity school 0.201 United States us Americas Northern America
+baylor university 2021-02-03 129265508 way Baylor University, 1301, South University Parks Drive, Waco, McLennan County, Texas, 76706, United States amenity university 0.719338807988632 United States us Americas Northern America
+massachusetts of technology 2021-02-03 258016252 relation Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States amenity university 0.946742627764641 United States us Americas Northern America
+missouri state university 2021-02-03 2719859 node Missouri State University, 901, South National Avenue, Phelps Grove/University Heights, Springfield, Greene County, Missouri, 65807, United States amenity university 0.732450490278609 United States us Americas Northern America
+connecticut agricultural experiment station 2021-02-03 195858196 way Connecticut Agricultural Experiment Station, 123, Prospect Hill Historic District, New Haven, New Haven County, Connecticut, 06504-1106, United States landuse institutional 0.6 United States us Americas Northern America
+us national institutes of health 2021-02-03 102178084 way National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, United States landuse commercial 0.6 United States us Americas Northern America
+amgen of thousand oaks 2021-02-03 178550546 way Amgen, Thousand Oaks, Ventura County, California, United States landuse industrial 0.5 United States us Americas Northern America
+argonne national laboratory 2021-02-03 84941288 way Argonne National Laboratory, DuPage County, Illinois, United States landuse industrial 0.756680175360968 United States us Americas Northern America
+carnegie mellon university 2021-02-03 258357673 relation Carnegie Mellon University, Warwick Terrace, Squirrel Hill North, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States amenity university 0.861734322664205 United States us Americas Northern America
+intel 2021-02-03 177283013 way Intel, Intel Hawthorn Farm Campus, Orenco Station, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, United States landuse construction 0.3 United States us Americas Northern America
+university of michigan 2021-02-03 258570054 relation University of Michigan, 500, South State Street, Ann Arbor, Washtenaw County, Michigan, 48109, United States amenity university 0.942114967834941 United States us Americas Northern America
+security board 2021-02-03 48301592 node Social Security Administration, 123, William Street, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10038, United States office government 0.201 United States us Americas Northern America
+zynga 2021-02-03 128825110 way Zynga, 650, Townsend Street, West SoMa, San Francisco, San Francisco City and County, California, 90103, United States building yes 0.101 United States us Americas Northern America
+university of chicago 2021-02-03 123843818 way The University of Chicago, 5801, South Ellis Avenue, Hyde Park, Chicago, Hyde Park Township, Cook County, Illinois, 60637, United States amenity university 0.934698313895193 United States us Americas Northern America
+wikimedia foundation 2021-02-03 60460773 node Wikimedia Foundation, 120, Kearny Street, Union Square, San Francisco, San Francisco City and County, California, 94104, United States office foundation 1.04735447105057 United States us Americas Northern America
+border protection 2021-02-03 148436560 way U.S. Customs and Border Protection, Ogdensburg, Saint Lawrence County, New York, United States landuse commercial 0.4 United States us Americas Northern America
+duke university in durham 2021-02-03 259450641 relation Duke University, 15th Street, 9th Street District, Durham, Durham County, North Carolina, 27705, United States amenity university 0.993140337132867 United States us Americas Northern America
+hcmc 2021-02-03 123770771 way Hennepin County Medical Center, 701, Park Avenue South, Minneapolis, Hennepin County, Minnesota, 55415, United States amenity hospital 0.250254845255209 United States us Americas Northern America
+tcm 2021-02-03 231854259 way McChord Field, E Street, Oakswest Apartments, Pierce County, Washington, 98438, United States aeroway aerodrome 0.001 United States us Americas Northern America
+icf international 2021-02-03 70920084 node ICF International, 615, Southwest Alder Street, Downtown, Portland, Metro, Oregon, 97205, United States office company 0.201 United States us Americas Northern America
+university of california in merced 2021-02-03 129779241 way University of California, Merced, 5200, Mineral King Road, Merced County, California, 95343, United States amenity university 0.913735597530124 United States us Americas Northern America
+san council 2021-02-03 93735273 way The South Council, Plantation Heights, York County, Virginia, 23185, United States highway residential 0.2 United States us Americas Northern America
+cohen commission 2021-02-03 103899851 way Buffalo Building, 300; 302; 304; 306; 308; 310; 312, East Buffalo Street, Commission Row, Milwaukee, Milwaukee County, Wisconsin, 53202, United States historic building 0.210430435186894 United States us Americas Northern America
+loyola university medical center 2021-02-03 134129591 way Loyola University Medical Center, 2160, South 1st Avenue, Maywood, Proviso Township, Cook County, Illinois, 60153, United States amenity hospital 0.661844955490085 United States us Americas Northern America
+general atomics 2021-02-03 18281619 node General Atomics, John Hopkins Court, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States building office 0.587535809977585 United States us Americas Northern America
+robert c. byrd green bank telescope 2021-02-03 102881650 way Green Bank Telescope, Slavin Hollow Road, Pocahontas County, West Virginia, 24944, United States man_made telescope 0.790988572487363 United States us Americas Northern America
+robert h. lurie children's hospital of chicago 2021-02-03 208072291 way Ann & Robert H. Lurie Children's Hospital Heliport, Lurie Children's Hospital Emergency Lane, Streeterville, Near North Side, Chicago, Cook County, Illinois, 60611, United States aeroway helipad 0.701 United States us Americas Northern America
+saint louis zoo 2021-02-03 96373365 way Saint Louis Zoo, 1, Government Drive, City of Saint Louis, Missouri, 63110, United States tourism zoo 0.623386683132434 United States us Americas Northern America
+brigham young university 2021-02-03 97425595 way Brigham Young University, Campus Drive, Provo, Utah County, Utah, 84604, United States amenity university 0.852231384786617 United States us Americas Northern America
+national optical astronomy observatory 2021-02-03 39657118 node National Optical Astronomy Observatory, 950, North Cherry Avenue, Tucson, Pima County, Arizona, 85721, United States amenity research_institute 0.401 United States us Americas Northern America
+massachusetts 2021-02-03 258278823 relation Massachusetts, United States boundary administrative 0.836449761303479 United States us Americas Northern America
+terra bella 2021-02-03 258597384 relation Terra Bella, Tulare County, California, United States boundary census 0.575700293936422 United States us Americas Northern America
+collaborative research centre 2021-02-03 234889363 way Biosciences Collaborative Laboratory, de France Avenue, Ames Research Center, Mountain View, Santa Clara County, California, 94035-0016, United States building yes 0.201 United States us Americas Northern America
+saint louis university 2021-02-03 259124957 relation Saint Louis University, 1, North Grand Boulevard, St Louis University, City of Saint Louis, Missouri, 63103, United States amenity university 0.77813837372741 United States us Americas Northern America
+us office of personnel management 2021-02-03 106443728 way Office of Personnel Management, 1900, E Street Northwest, Washington, District of Columbia, 20006, United States office government 0.401 United States us Americas Northern America
+eugene 2021-02-03 257538846 relation Eugene, Lane County, Oregon, United States boundary administrative 0.678763756395741 United States us Americas Northern America
+university of massachusetts, 2021-02-03 75830459 node Cold Spring Orchard, 391, Sabin Street, Cold Spring, Belchertown, Hampshire County, Massachusetts, 01009, United States shop farm 0.101 United States us Americas Northern America
+ct 2021-02-03 258171713 relation Connecticut, United States boundary administrative 0.818771933111505 United States us Americas Northern America
+research projects 2021-02-03 166563644 way Defense Advanced Research Projects Agency, 675, North Randolph Street, Ballston, Arlington, Arlington County, Virginia, 22203, United States office government 0.201 United States us Americas Northern America
+denver museum of nature & science 2021-02-03 99790553 way Denver Museum of Nature and Science, 2001, Colorado Boulevard, Denver, Denver County, Colorado, 80205, United States tourism museum 0.833256970094253 United States us Americas Northern America
+buck institute for research 2021-02-03 175713833 way Buck Institute for Research on Aging, 8001, Redwood Boulevard, Novato, Marin County, California, 94945, United States place house 0.712019878936673 United States us Americas Northern America
+university of florence 2021-02-03 258686921 relation Creighton University, North 19th Street, Omaha, Douglas County, Nebraska, 68110, United States amenity university 0.558770852912237 United States us Americas Northern America
+hartwick college 2021-02-03 121610396 way Hartwick College, 1, Hartwick Drive, Oneonta, City of Oneonta, Otsego County, New York, 13820, United States amenity university 0.573438300637181 United States us Americas Northern America
+society of nuclear medicine 2021-02-03 108632117 way Society of Nuclear Medicine and Molecular Imaging, Samuel Morse Drive, Pinecrest, Reston, Fairfax County, Virginia, 20190, United States building yes 0.401 United States us Americas Northern America
+crh 2021-02-03 2951088 node Choate Rosemary Hall, 333, Christian Street, Wallingford, Connecticut, New Haven County, Connecticut, 06492, United States amenity school 0.381143934225165 United States us Americas Northern America
+university of california at davis 2021-02-03 258689332 relation University of California, Davis, Russell Boulevard, Davis, Yolo County, California, 95616, United States amenity university 0.501 United States us Americas Northern America
+central intelligence agency 2021-02-03 134865123 way Central Intelligence Agency, Clearview Manor, McLean, Fairfax County, Virginia, United States landuse government 0.5 United States us Americas Northern America
+west virginia department of environmental protection 2021-02-03 83977046 node West Virginia Department of Environmental Protection, 607, 57th Street Southeast, Charleston, Kanawha County, West Virginia, 25304, United States office government 0.601 United States us Americas Northern America
+national reconnaissance office 2021-02-03 153231959 way National Reconnaissance Office, Fairfax County, Virginia, United States landuse military 0.790008541274048 United States us Americas Northern America
+us cdc 2021-02-03 172987439 way CDC, New Center, Detroit, Wayne County, Michigan, United States landuse farmyard 0.3 United States us Americas Northern America
+university of california, riverside 2021-02-03 33709158 node UCR ARTSblock, 3824, Main Street, Riverside, Riverside County, California, 92501, United States tourism museum 0.458218474293395 United States us Americas Northern America
+university of namur 2021-02-03 2897922 node Notre Dame de Namur University, Laxague Drive, Belmont, San Mateo County, California, 94002, United States amenity school 0.201 United States us Americas Northern America
+alliance 2021-02-03 257848637 relation Alliance, Box Butte County, Nebraska, 69301, United States boundary administrative 0.545502923866838 United States us Americas Northern America
+us energy 2021-02-03 257952569 relation Energy, Williamson County, Illinois, 62933, United States boundary administrative 0.523032671836241 United States us Americas Northern America
+seattle children's hospital 2021-02-03 259228662 relation Seattle Children's Hospital, 4800, Sand Point Way Northeast, Laurelhurst, Seattle, King County, Washington, 98105, United States amenity hospital 0.678688679458624 United States us Americas Northern America
+northridge 2021-02-03 345694 node Northridge, Los Angeles, Los Angeles County, California, 91324, United States place suburb 0.518973378442822 United States us Americas Northern America
+northwest fisheries science center 2021-02-03 173032772 way Northwest Fisheries Science Center, 2725, Montlake Boulevard East, Montlake, Seattle, King County, Washington, 98112, United States office government 0.401 United States us Americas Northern America
+research rocket 2021-02-03 130028486 way Research Park Boulevard Northwest, Rideout Village, Huntsville, Madison County, Alabama, 35814, United States highway motorway 0.2 United States us Americas Northern America
+smithsonian environmental research center 2021-02-03 258721015 relation Smithsonian Environmental Research Center, Anne Arundel County, Maryland, United States boundary protected_area 0.702323854176492 United States us Americas Northern America
+duke clinical research institute 2021-02-03 100768801 way Duke Clinical Research Institute, 300, West Morgan Street, American Tobacco Historic District, Durham, Durham County, North Carolina, 27701, United States building yes 0.401 United States us Americas Northern America
+dsm 2021-02-03 258271826 relation Des Moines International Airport, IA 28, Des Moines, Polk County, Iowa, 50321, United States aeroway aerodrome 0.393012981942171 United States us Americas Northern America
+safeway 2021-02-03 173823433 way Safeway, West Pierson Street, Phoenix, Maricopa County, Arizona, 85340, United States shop supermarket 0.381950414040809 United States us Americas Northern America
+colby college 2021-02-03 101282151 way Colby College, 4000, Mayflower Hill Drive, Waterville, Kennebec County, Maine, 04901, United States amenity college 0.640907941903285 United States us Americas Northern America
+joint genome institute 2021-02-03 235834399 way Joint Genome Institute, Smoot Road, Berkeley, Alameda County, California, 94720, United States building yes 0.610439474412231 United States us Americas Northern America
+trump administration 2021-02-03 445769 node Trump, Baltimore County, Maryland, 21161, United States place hamlet 0.375244632729739 United States us Americas Northern America
+indiana university 2021-02-03 125822977 way William H. Mathers Museum of World Cultures, 601, East 8th Street, Bloomington, Monroe County, Indiana, 47408, United States tourism museum 0.253150759043076 United States us Americas Northern America
+national research centre 2021-02-03 123856183 way National Research Center, 30th Street, Boulder, Boulder County, Colorado, 80304, United States building office 0.201 United States us Americas Northern America
+university of eastern piedmont 2021-02-03 54983360 node Clark University Graduate School of Geography, 936, Main Street, Main South, South Worcester, Worcester, Worcester County, Massachusetts, 01610, United States office educational_institution 0.201 United States us Americas Northern America
+wisconsin alumni research foundation 2021-02-03 101032142 way Wisconsin Alumni Research Foundation, 614, Walnut Street, Madison, Dane County, Wisconsin, 53706, United States building university 0.401 United States us Americas Northern America
+usf 2021-02-03 258794377 relation University of San Francisco, 2130, Fulton Street, North of Panhandle, San Francisco, San Francisco City and County, California, 94117, United States amenity university 0.483095905643059 United States us Americas Northern America
+emory university school of medicine 2021-02-03 101031365 way Emory University School of Medicine, McTyeire Drive Northeast, Emory Highlands, Druid Hills, DeKalb County, Georgia, 30322, United States amenity college 0.501 United States us Americas Northern America
+pomona college 2021-02-03 193227969 way Pomona College, Harrison Avenue, Claremont, Los Angeles County, California, 91711, United States amenity university 0.649611830504229 United States us Americas Northern America
+ogle 2021-02-03 258064016 relation Ogle County, Illinois, United States boundary administrative 0.619540947885713 United States us Americas Northern America
+nvidia 2021-02-03 101896241 way Nvidia, Santa Clara, Santa Clara County, California, United States landuse commercial 0.3 United States us Americas Northern America
+ncsu 2021-02-03 2661843 node NCSU Pond Number One Dam, Wake County, North Carolina, 27603-2668, United States waterway dam 0.35 United States us Americas Northern America
+university of illinois 2021-02-03 24997928 node Gameday Spirit, 2028, North Prospect Avenue, Champaign, Champaign County, Illinois, 61822, United States shop clothes 0.101 United States us Americas Northern America
+american museum of natural history 2021-02-03 181018011 way American Museum of Natural History, 180, Central Park West, Upper West Side, Manhattan Community Board 7, Manhattan, New York County, New York, 10024, United States tourism museum 1.04240928202528 United States us Americas Northern America
+us centers for disease control and prevention 2021-02-03 96695743 way Centers for Disease Control and Prevention Edward R. Roybal Campus, Clifton Heights Lane Northeast, Druid Hills, DeKalb County, Georgia, 1540, United States office research 0.701 United States us Americas Northern America
+planetary society 2021-02-03 188431321 way The Planetary Society, Cordova Street, Pasadena, Los Angeles County, California, 91129, United States building yes 0.201 United States us Americas Northern America
+pennsylvania state university in state college 2021-02-03 147721263 way Air Quality Learning and Demonstration Center, Air Quality Lane, Ferguson Township, Centre County, Pennsylvania, 16803, United States tourism attraction 0.401 United States us Americas Northern America
+international monetary fund 2021-02-03 258484235 relation International Monetary Fund, 700, 19th Street Northwest, Golden Triangle, Washington, District of Columbia, 20052, United States office ngo 0.913937873889599 United States us Americas Northern America
+lcls 2021-02-03 113981149 way LCLS X-Ray Transport Tunnel, Stanford Hills, San Mateo County, California, 94028, United States highway service 0.175 United States us Americas Northern America
+forty seven 2021-02-03 2501141 node Cow Island Number Forty-seven, Memphis, Shelby County, Tennessee, United States place island 0.525 United States us Americas Northern America
+woods hole oceanographic institution 2021-02-03 189684904 way Woods Hole Oceanographic Institution, Water Street, Woods Hole, Falmouth, Barnstable County, Massachusetts, 02543, United States amenity university 0.401 United States us Americas Northern America
+king juan carlos university 2021-02-03 152402826 way King Juan Carlos I of Spain Center, 54, Washington Square South, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States building university 0.301 United States us Americas Northern America
+university of south carolina 2021-02-03 126084543 way University of South Carolina, South Pickens Street, Hollywood, Columbia, Richland County, South Carolina, 29205, United States amenity university 0.923689910980171 United States us Americas Northern America
+engineering and medicine 2021-02-03 101669661 way Fitzpatrick Center for Interdisciplinary Engineering, Medicine and Applied Sciences (FCIEMAS), 101, Science Drive, Durham, Durham County, North Carolina, 27705, United States building yes 0.301 United States us Americas Northern America
+xcel energy 2021-02-03 119271696 way Xcel Energy, 1901, East Horsetooth Road, Peachtree, Fort Collins, Larimer County, Colorado, 80525, United States building yes 0.581776066939633 United States us Americas Northern America
+gallup 2021-02-03 258164532 relation Gallup, McKinley County, New Mexico, 87301, United States boundary administrative 0.564154606259328 United States us Americas Northern America
+caltech submillimeter observatory 2021-02-03 103887235 way Caltech Submillimeter Observatory, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States man_made observatory 0.662945678183792 United States us Americas Northern America
+icesat 2021-02-03 203547980 way ICESat Road, Glenn Dale, Prince George's County, Maryland, 20771, United States highway unclassified 0.2 United States us Americas Northern America
+heidelberg university 2021-02-03 164310513 way Heidelberg University, Governor's Trail, College Hill, Tiffin, Seneca County, Ohio, 44883, United States amenity university 0.519018527529768 United States us Americas Northern America
+laval university 2021-02-03 91625841 way Laval Drive, Blackberry Estates, University City, Saint Louis County, Missouri, 63132, United States highway residential 0.3 United States us Americas Northern America
+research mission 2021-02-03 169420504 way University of Kansas Medical Center Research Institute, 4330, Shawnee Mission Parkway, Fairway, Johnson County, Kansas, 66205, United States place house 0.201 United States us Americas Northern America
+astronomical observatory 2021-02-03 88928538 way Astronomical Observatory, Caddo Parish, Louisiana, United States highway residential 0.3 United States us Americas Northern America
+american medical association 2021-02-03 124480513 way American Medical Association, 515, North State Street, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States building office 0.301 United States us Americas Northern America
+the washington post 2021-02-03 259037983 relation Washington, District of Columbia, United States boundary administrative 0.849288898611582 United States us Americas Northern America
+cdw 2021-02-03 166168670 way CDW, 200, North Milwaukee Avenue, Mellody Farm, Vernon Hills, Lake County, Illinois, 60061, United States building commercial 0.430139264553753 United States us Americas Northern America
+american cancer society 2021-02-03 296512848 node American Cancer Society, 3709, West Jetton Avenue, Palma Ceia, Tampa, Hillsborough County, Florida, 33629, United States office ngo 0.301 United States us Americas Northern America
+us national guard 2021-02-03 165631796 way US National Guard, Montgomery County, Maryland, United States landuse military 0.5 United States us Americas Northern America
+mississippi 2021-02-03 258375642 relation Mississippi, United States boundary administrative 0.800391778545257 United States us Americas Northern America
+sloan digital sky survey 2021-02-03 3752682 node Sloan Digital Sky Survey telescope, Apache Point Road, Otero County, New Mexico, 88349, United States man_made telescope 0.401 United States us Americas Northern America
+suny upstate medical university 2021-02-03 300965654 way SUNY Upstate Medical University Bursar Office, 155, Elizabeth Blackwell Street, University Hill, Syracuse, Onondaga County, New York, 13210, United States building yes 0.401 United States us Americas Northern America
+boeing 2021-02-03 217291868 way Boeing, Pasadena, Harris County, Texas, United States landuse commercial 0.3 United States us Americas Northern America
+hertz 2021-02-03 103372207 way Hertz, Westchester, Los Angeles, Los Angeles County, California, United States landuse commercial 0.3 United States us Americas Northern America
+erma 2021-02-03 258445399 relation Erma, Lower Township, Cape May County, New Jersey, United States place census-designated 0.43674906391142 United States us Americas Northern America
+withers 2021-02-03 423638 node Withers, Washington County, Virginia, United States place hamlet 0.35 United States us Americas Northern America
+space telescope science institute 2021-02-03 52509642 node Space Telescope Science Institute, 3700, San Martin Drive, Wyman Park, Baltimore, Maryland, 21218, United States office administrative 0.401 United States us Americas Northern America
+maryland 2021-02-03 258170637 relation Maryland, United States boundary administrative 0.824620353023131 United States us Americas Northern America
+tennessee valley authority 2021-02-03 108570171 way Tennessee Valley Authority, 1101, Market Street, Chattanooga, Hamilton County, Tennessee, 37402, United States building commercial 0.778949510198751 United States us Americas Northern America
+betty moore foundation 2021-02-03 76687108 node Annual Reviews, 4116 Park Boulevard, Palo Alto, CA 94306, Palo Alto, Santa Clara County, California, 94306, United States shop bookmaker 0.001 United States us Americas Northern America
+new york institute of technology 2021-02-03 214578329 way New York Institute of Technology, North Hempstead Turnpike, Old Westbury, Oyster Bay, Nassau County, New York, 11548, United States amenity university 0.501 United States us Americas Northern America
+netflix 2021-02-03 169311000 way Netflix, 3175, Northeast Aloclek Drive, East Hillsboro, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, 97124, United States office company 0.101 United States us Americas Northern America
+us department of health and human services 2021-02-03 176345296 way Department of Health and Human Services, 221, State Street, Augusta, Kennebec County, Maine, 04330, United States office government 0.701 United States us Americas Northern America
+berkeley center 2021-02-03 118620616 way Berkeley Center, 3000, North Lemon Street, Downtown Fullerton, Fullerton, Orange County, California, 92832, United States building yes 0.201 United States us Americas Northern America
+qiagen 2021-02-03 41703932 node QIAGEN, 1700, Seaport Boulevard, Pacific Shores Center, Redwood City, San Mateo County, California, 94063, United States office it 0.101 United States us Americas Northern America
+national academy of medicine 2021-02-03 101801329 way Academy of Medicine, 7th Street Northeast, Atlanta, Fulton County, Georgia, 30308, United States amenity school 0.428160971568546 United States us Americas Northern America
+delaware 2021-02-03 257993619 relation Delaware, United States boundary administrative 0.783550568235905 United States us Americas Northern America
+bigelow aerospace of las vegas 2021-02-03 161499859 way Bigelow Aerospace, LLC, 1899, West Brooks Avenue, North Las Vegas, Clark County, Nevada, 89032, United States man_made works 0.80124284206117 United States us Americas Northern America
+stony brook university medical center 2021-02-03 104502319 way Stony Brook University, 100, Nicolls Road, Suffolk County, New York, 11794, United States amenity university 0.803198357564167 United States us Americas Northern America
+urbana-champaign 2021-02-03 258133881 relation Urbana, Champaign County, Illinois, United States boundary administrative 0.737432720198099 United States us Americas Northern America
+john jay college of criminal justice 2021-02-03 169888445 way John Jay College of Criminal Justice, 11th Avenue, Hell's Kitchen, Manhattan Community Board 4, Manhattan, New York County, New York, 10018, United States amenity college 0.987075864564083 United States us Americas Northern America
+us department of agriculture forest service 2021-02-03 48599253 node US Department of Agriculture, Maine Avenue Southwest, Washington, District of Columbia, 20250, United States office government 1.00973759439018 United States us Americas Northern America
+earth institute 2021-02-03 197272744 way Southwestern College & New Earth Institute, 3960, San Felipe Road, Santa Fe, Santa Fe County, New Mexico, 87507, United States amenity college 0.366903631515068 United States us Americas Northern America
+marquette university 2021-02-03 258967349 relation Marquette University, West Canal Street, Menomonee River Valley, Milwaukee, Milwaukee County, Wisconsin, 53208, United States amenity university 0.69509364958047 United States us Americas Northern America
+department of radiation oncology 2021-02-03 204988396 way Department of Radiation Oncology, 2280, Inwood Road, Dallas, TX, Dallas, Dallas County, Texas, 75390, United States building university 0.401 United States us Americas Northern America
+sierra club 2021-02-03 129277947 way Yosemite Conservation Heritage Center, Valley Loop Trail, Curry Village, Mariposa County, California, 95389, United States tourism museum 0.349235472656649 United States us Americas Northern America
+american southwest 2021-02-03 131418716 way American, Bounce, Midland, Midland County, Texas, United States highway service 0.175 United States us Americas Northern America
+stanford linear accelerator center 2021-02-03 299175282 way Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States amenity research_center 0.827082745074033 United States us Americas Northern America
+kqed 2021-02-03 45347963 node KQED, 50, West San Fernando Street, Downtown Historic District, San Jose, Santa Clara County, California, 95110, United States amenity studio 0.439805842395375 United States us Americas Northern America
+university of california at berkeley 2021-02-03 258416614 relation University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States amenity university 1.1481943782617 United States us Americas Northern America
+hyundai motor 2021-02-03 133389707 way Lithia Hyundai Of Odessa, John Ben Shepperd Parkway Boulevard, ASB Replat, Odessa, Ector County, Texas, 79762, United States shop car 0.101 United States us Americas Northern America
+us social security administration 2021-02-03 76558039 node US Social Security Administration, West Sedgley Avenue, Philadelphia, Philadelphia County, Pennsylvania, 19132, United States office government 0.401 United States us Americas Northern America
+james madison university 2021-02-03 259182914 relation James Madison University, Harrison Street, Harrisonburg, Rockingham County, Virginia, 22801, United States amenity university 0.764385501255418 United States us Americas Northern America
+ewing bank 2021-02-03 257926178 relation Ewing, Franklin County, Illinois, United States boundary administrative 0.524872581583534 United States us Americas Northern America
+lawrence livermore national laboratory 2021-02-03 95865246 way Lawrence Livermore National Laboratory, South Vasco Road, Livermore, Alameda County, California, 94550, United States amenity science_park 0.893328255224182 United States us Americas Northern America
+vu university medical center 2021-02-03 201868510 way The Vue, Fayetteville, Washington County, Arkansas, United States place neighbourhood 0.35 United States us Americas Northern America
+isro satellite center 2021-02-03 68074173 node The Satellite Center, Williams Boulevard, Kenner, Jefferson Parish, Louisiana, 70062, United States shop yes 0.201 United States us Americas Northern America
+micron technology 2021-02-03 139763063 way Micron Technology, Boise, Ada County, Idaho, United States landuse industrial 0.4 United States us Americas Northern America
+molecular ecology 2021-02-03 257345614 way Wildlife Molecular Ecology Office, 2322, Mowry Road, Gainesville, Alachua County, Florida, 32611, United States office research 0.201 United States us Americas Northern America
+hastings center 2021-02-03 459457 node Hastings Center, Town of Hastings, Oswego County, New York, 13036, United States place hamlet 0.45 United States us Americas Northern America
+small earth nepal 2021-02-03 88622633 way Small Street, White Earth, Mountrail County, North Dakota, United States highway residential 0.3 United States us Americas Northern America
+los angeles times 2021-02-03 258868206 relation Los Angeles Times, 202, South Spring Street, Historic Core District, Downtown, Los Angeles, Los Angeles County, California, 90013, United States office newspaper 0.503130333992136 United States us Americas Northern America
+belle ii 2021-02-03 294506250 way 2, Belle, San Juan County, Washington, 98279, United States place house 0.101 United States us Americas Northern America
+the university of texas md anderson cancer center 2021-02-03 103450497 way University of Texas MD Anderson Cancer Center, 1515, Holcombe Boulevard, Texas Medical Center, Houston, Harris County, Texas, 77030, United States amenity hospital 1.04319043229938 United States us Americas Northern America
+university of miami 2021-02-03 201200428 way University of Miami, Fate Bridge, Coral Gables, Miami-Dade County, Florida, 33124, United States amenity university 0.846468701525174 United States us Americas Northern America
+us department of commerce 2021-02-03 229151840 way US Department of Commerce, Observatory Avenue, Garden Court Apartments, Ukiah, Mendocino County, California, 95482, United States building yes 0.401 United States us Americas Northern America
+northrop grumman 2021-02-03 240632398 way Northrop Grumman, Mesa, Maricopa County, Arizona, United States landuse industrial 0.4 United States us Americas Northern America
+armstrong flight research center 2021-02-03 243644685 way Armstrong Flight Research Center, Forbes Avenue, Kern County, California, 93524, United States aeroway aerodrome 0.401 United States us Americas Northern America
+uniformed services university 2021-02-03 161336966 way Uniformed Services University of the Health Sciences, 4301, Jones Bridge Road, Bethesda, Montgomery County, Maryland, 20814, United States place house 0.739197856791149 United States us Americas Northern America
+us federal trade commission 2021-02-03 258221902 relation Federal Trade Commission, 600, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20565, United States office government 0.474617736328324 United States us Americas Northern America
+aurora flight sciences 2021-02-03 109389915 way Orbital Sciences Corporation Launch Systems Group L-1011 Flight Operations, 17143, Avtel Street, Mojave, Kern County, California, 93501, United States building yes 0.201 United States us Americas Northern America
+military college of south carolina 2021-02-03 195543970 way The Citadel, 171, Moultrie Street, Charleston, Charleston County, South Carolina, 29409, United States amenity university 0.631222267761364 United States us Americas Northern America
+rensselaer polytechnic institute in troy 2021-02-03 259514286 relation Rensselaer Polytechnic Institute, 110, 8th Street, Downtown, City of Troy, Rensselaer County, New York, 12180, United States amenity university 0.985127795668338 United States us Americas Northern America
+nasa headquarters 2021-02-03 103417943 way National Aeronautics and Space Administration Headquarters, E Street Southwest, Southwest Employment Area, Washington, District of Columbia, 20546, United States office government 0.101 United States us Americas Northern America
+merck & co. 2021-02-03 299016689 node Merck & Co., 4633, Merck Road, Finch Mill, Wilson, Wilson County, North Carolina, 27893, United States amenity pharmacy 0.201 United States us Americas Northern America
+university of texas md anderson cancer center 2021-02-03 103450497 way University of Texas MD Anderson Cancer Center, 1515, Holcombe Boulevard, Texas Medical Center, Houston, Harris County, Texas, 77030, United States amenity hospital 1.04319043229938 United States us Americas Northern America
+miami university of ohio in oxford 2021-02-03 134890642 way Miami University, McKee Avenue, Oxford, Oxford Township, Butler County, Ohio, 45056, United States amenity university 0.901832830623064 United States us Americas Northern America
+hhs 2021-02-03 101633556 way U.S. Department of Health and Human Services, Center Leg Freeway, Southwest Employment Area, Washington, District of Columbia, 20546, United States office government 0.27381125651268 United States us Americas Northern America
+appalachia 2021-02-03 257877414 relation Appalachia, Wise County, Virginia, 24216, United States boundary administrative 0.462086077089553 United States us Americas Northern America
+university of california san francisco 2021-02-03 99733448 way University of California, San Francisco, Irving Street, Inner Sunset, San Francisco, San Francisco City and County, California, 94122, United States amenity university 0.979827038246968 United States us Americas Northern America
+icahn school of medicine 2021-02-03 156253448 way Icahn School of Medicine at Mount Sinai, 1184, 5th Avenue, Manhattan Community Board 11, Manhattan, New York County, New York, 10029, United States building hospital 0.791742165798516 United States us Americas Northern America
+tulane university school of medicine 2021-02-03 169112739 way Tulane University School of Medicine, 131, South Robertson Street, Storyville, New Orleans, Orleans Parish, Louisiana, 70112, United States building yes 0.501 United States us Americas Northern America
+university of potsdam 2021-02-03 114514033 way State University of New York at Potsdam, 44, Pierrepont Avenue, Potsdam, Saint Lawrence County, New York, 13676, United States amenity university 0.665126099291008 United States us Americas Northern America
+university of california in santa cruz 2021-02-03 75590962 node University of California, Santa Cruz, Coolidge Drive, Santa Cruz, Santa Cruz County, California, 95064, United States tourism information 0.501 United States us Americas Northern America
+scripps 2021-02-03 149620798 way Scripps, Asilomar Avenue, Pacific Grove Acres, Pacific Grove, Monterey County, California, 93950-2424, United States building yes 0.101 United States us Americas Northern America
+zebrafish international resource center 2021-02-03 226773628 way Zebrafish International Resource Center, 1307, Franklin Boulevard, Eugene, Lane County, Oregon, 97403-5274, United States building yes 0.401 United States us Americas Northern America
+university of rutgers 2021-02-03 185251759 way Rutgers University Newark, Washington Street, Teachers Village, Newark, Essex County, New Jersey, 07102, United States amenity university 0.561038475674441 United States us Americas Northern America
+arianespace 2021-02-03 79847733 node Arianespace, Inc., 5335, Wisconsin Avenue Northwest, Friendship Heights, Washington, District of Columbia, 20007, United States office company 0.101 United States us Americas Northern America
+mason inman 2021-02-03 223001264 way Mason Road, Pleasent Meadows Apartments, Inman, Spartanburg County, South Carolina, 29349, United States highway residential 0.3 United States us Americas Northern America
+spirit 2021-02-03 373450 node Spirit, Town of Spirit, Price County, Wisconsin, United States place village 0.36851441835616 United States us Americas Northern America
+burke museum of natural history and culture 2021-02-03 127334627 way Burke Museum of Natural History and Culture, 4300, 15th Avenue Northeast, University District, Seattle, King County, Washington, 98105, United States tourism museum 1.04572520594953 United States us Americas Northern America
+kennedy space center 2021-02-03 99967594 way Kennedy Space, Bus Drop-Off, Brevard County, Florida, United States amenity parking 0.201 United States us Americas Northern America
+potash corporation of saskatchewan 2021-02-03 180233467 way Potash Corporation of Saskatchewan Nitrogen Fertilizer, Augusta, Richmond County, Georgia, United States landuse industrial 0.6 United States us Americas Northern America
+eli 2021-02-03 258404300 relation Ely, White Pine County, Nevada, United States boundary administrative 0.445859697073655 United States us Americas Northern America
+bard college 2021-02-03 166142313 way Bard College, 30, Campus Road, Annandale-on-Hudson, Town of Red Hook, Dutchess County, New York, 12504, United States amenity college 0.665268080528699 United States us Americas Northern America
+medical university of south carolina 2021-02-03 258977557 relation The Medical University of South Carolina, 171, Gadsden Green Homes, Charleston, Charleston County, South Carolina, 29425, United States leisure park 0.862086077089553 United States us Americas Northern America
+xprize foundation 2021-02-03 42269322 node Xprize Foundation, 900, West Slauson Avenue, Fox Hills, Culver City, Los Angeles County, California, 90230-6482, United States office company 0.201 United States us Americas Northern America
+dca 2021-02-03 224465042 way Disney California Adventure, 1620, South Disneyland Drive, Anaheim, Orange County, California, 92802, United States tourism theme_park 0.462070869758741 United States us Americas Northern America
+iowa state university 2021-02-03 258786807 relation Iowa State University, US 30, Ames, Story County, Iowa, 50011, United States amenity university 0.829769585619443 United States us Americas Northern America
+bucknell university 2021-02-03 259556528 relation Bucknell University, South 5th Street, Lewisburg, Union County, Pennsylvania, 17837, United States amenity university 0.201 United States us Americas Northern America
+us white house 2021-02-03 147370893 way White House, 1600, Pennsylvania Avenue Northwest, Washington, District of Columbia, 20500, United States historic castle 0.93472115416811 United States us Americas Northern America
+new york stock exchange 2021-02-03 158002696 way New York Stock Exchange, 11, Wall Street, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10005, United States tourism attraction 0.401 United States us Americas Northern America
+manufacturing usa 2021-02-03 234440084 way Zippo Manufacturing Company, Bradford Township, McKean County, Pennsylvania, United States landuse industrial 0.492802990599768 United States us Americas Northern America
+south carolina 2021-02-03 257325089 relation South Carolina, United States boundary administrative 0.90345926227768 United States us Americas Northern America
+alexion pharmaceuticals 2021-02-03 156694688 way Alexion Pharmaceuticals, 100, South Frontage Road, Downtown, New Haven, New Haven County, Connecticut, 06519, United States office company 0.201 United States us Americas Northern America
+korean studies 2021-02-03 259381167 relation Center for Korean Studies, 1881, East West Road, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States building university 0.201 United States us Americas Northern America
+university of california san diego 2021-02-03 94305187 way University of California, San Diego, 9500, Gilman Drive, San Diego, San Diego County, California, 92093, United States amenity university 1.04938836421927 United States us Americas Northern America
+gladstone institutes 2021-02-03 108770743 way J David Gladstone Institutes, 1650, Owens Street, Mission Bay, San Francisco, San Francisco City and County, California, 94158, United States building office 0.201 United States us Americas Northern America
+wilmerhale 2021-02-03 299916888 node WilmerHale, 60, State Street, Dock Square, Financial District, Boston, Suffolk County, Massachusetts, 02109, United States office lawyer 0.101 United States us Americas Northern America
+dupont corporation 2021-02-03 54825357 node Fort DuPont Redevelopment & Preservation Corporation, 260, Old Elm Avenue, New Castle County, Delaware, 19706, United States place house 0.201 United States us Americas Northern America
+carnegies 2021-02-03 27489275 node Carnegie's, 1600, Oregon Street, Redding, Shasta County, California, 96001, United States amenity restaurant 0.001 United States us Americas Northern America
+seattle times 2021-02-03 147961931 way The Seattle Times, 1000, Denny Way, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States office newspaper 0.709495227301736 United States us Americas Northern America
+digitalglobe 2021-02-03 104916466 way DigitalGlobe, 12076, Grant Street, Thornton, Adams County, Colorado, 80241, United States office company 0.503582454919981 United States us Americas Northern America
+alphastar 2021-02-03 64296768 node AlphaStar, Pacific Coast Highway, Los Altos, Long Beach, Los Angeles County, California, 90804:90815, United States office company 0.101 United States us Americas Northern America
+vanderbilt 2021-02-03 257898818 relation Vanderbilt, Fayette County, Pennsylvania, United States boundary administrative 0.400938798149577 United States us Americas Northern America
+washington state university 2021-02-03 258940577 relation Washington State University, Northeast Reaney Way, Pullman, Whitman County, Washington, 99164, United States amenity university 0.81377697632841 United States us Americas Northern America
+case western university 2021-02-03 115838150 way Computing, Arts, Sciences and Education, University Drive, Miami-Dade County, Florida, 33199, United States building university 0.101 United States us Americas Northern America
+university of oklahoma 2021-02-03 181607166 way University of Oklahoma, 660, Parrington Oval, Norman, Cleveland County, Oklahoma, 73019, United States amenity university 0.906565448656976 United States us Americas Northern America
+at&t 2021-02-03 146631567 way AT&T, 1302, North Tustin Street, Orange, Orange County, California, 92867, United States shop mobile_phone 0.780778860724176 United States us Americas Northern America
+university of california 2021-02-03 258416614 relation University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States amenity university 0.948194378261701 United States us Americas Northern America
+kahea 2021-02-03 89134590 way Kahea Street, Makakilo Heights, Kapolei, Honolulu County, Hawaii, 96707, United States highway residential 0.2 United States us Americas Northern America
+nlm 2021-02-03 100564321 way NLM, 8600, Rockville Pike, Glenbrook, East Bethesda, Bethesda, Montgomery County, Maryland, 20894, United States amenity library 0.674397490815619 United States us Americas Northern America
+ucla 2021-02-03 179950382 way UCLA, Marina del Rey, Los Angeles County, California, United States highway pedestrian 0.2 United States us Americas Northern America
+new jersey 2021-02-03 257885980 relation New Jersey, United States boundary administrative 0.952055513496666 United States us Americas Northern America
+ilc 2021-02-03 233280716 way Interactive Learning Center, 2120, West University Drive, Boise, Ada County, Idaho, 83725, United States building university 0.001 United States us Americas Northern America
+whitman college 2021-02-03 2986474 node Whitman College, Princeton, Mercer County, New Jersey, 08544, United States place locality 0.325 United States us Americas Northern America
+emmett conrad high school 2021-02-03 191982414 way Emmett J Conrad High School, 7502, Fair Oaks Avenue, Vickery Meadows PID, Dallas, Dallas County, Texas, 75231, United States amenity school 0.662719188578863 United States us Americas Northern America
+applied physics laboratory 2021-02-03 258543667 relation Henderson Hall, 1013, Northeast Lincoln Way, University District, Seattle, King County, Washington, 98105-6286, United States building yes 0.001 United States us Americas Northern America
+global ecology 2021-02-03 147781560 way Global Ecology Research Center, Searsville Road, Stanford, Santa Clara County, California, 94305-6015, United States building yes 0.201 United States us Americas Northern America
+iowa state 2021-02-03 91448035 way Iowa State, Fawn Creek Court, Maquoketa, Jackson County, Iowa, 52060, United States highway service 0.275 United States us Americas Northern America
+non-noaa 2021-02-03 248632258 way NOAA, Pascagoula, Jackson County, Mississippi, 39567, United States highway tertiary 0.2 United States us Americas Northern America
+us department of veterans affairs 2021-02-03 231756243 way US Department of Veterans Affairs, 1535, 1st Avenue East, MedQuarter, Cedar Rapids, Linn County, Iowa, 52402, United States office government 0.501 United States us Americas Northern America
+confederated tribes of the colville reservation 2021-02-03 38301258 node Omak Lake Campground, North End Omak Lake Road, Okanogan County, Washington, United States tourism camp_site 0.001 United States us Americas Northern America
+cos 2021-02-03 258401206 relation Coshocton County, Ohio, United States boundary administrative 0.614671596762107 United States us Americas Northern America
+wall street journal 2021-02-03 147759956 way Wall Street Journal, 1701, Page Mill Road, Palo Alto, Santa Clara County, California, 94304, United States building yes 0.301 United States us Americas Northern America
+underwriters laboratories 2021-02-03 154447688 way Underwriters Laboratories, Pfingsten Road, Northfield Township, Cook County, Illinois, 60015-1331, United States building yes 0.201 United States us Americas Northern America
+fordham university 2021-02-03 59136214 node Fordham University, East Fordham Road, The Bronx, Bronx County, New York, 10458, United States tourism information 0.201 United States us Americas Northern America
+boston medical center 2021-02-03 257699340 relation Boston Medical Center, 1, Albany Street, South End, Boston, Suffolk County, Massachusetts, 02118, United States amenity hospital 0.615802194348806 United States us Americas Northern America
+state oceanic administration 2021-02-03 477271 node Oceanic, Rumson, Monmouth County, New Jersey, 07760, United States place hamlet 0.542954744060451 United States us Americas Northern America
+university of st thomas 2021-02-03 101263266 way University of St. Thomas, Otis Avenue, St. Paul, Ramsey County, Minnesota, 55104, United States amenity university 0.81644595554698 United States us Americas Northern America
+institute for astronomy 2021-02-03 253393324 way Institute for Astronomy, 2680, Woodlawn Drive, Manoa, Honolulu, Honolulu County, Hawaii, 96813, United States amenity university 0.691312669988132 United States us Americas Northern America
+montana state university in bozeman 2021-02-03 165822886 way Montana State University, West College Street, Bozeman, Gallatin County, Montana, 59715, United States amenity university 0.929796188420265 United States us Americas Northern America
+amherst college 2021-02-03 162492573 way Amherst College, Barrett Hill Road, Amherst, Hampshire County, Massachusetts, 01002, United States amenity college 0.715982514090231 United States us Americas Northern America
+university of arkansas 2021-02-03 199918736 way University of Arkansas, North Oakland Avenue, Fayetteville, Washington County, Arkansas, 72701, United States amenity university 0.820276506570897 United States us Americas Northern America
+media lab 2021-02-03 133210918 way E14 - Media Lab, 75, Amherst Street, Cambridge, Middlesex County, Massachusetts, 02139, United States building university 0.201 United States us Americas Northern America
+un assembly 2021-02-03 161485338 way 1318, The Assembly, Tallahassee, Leon County, Florida, 32303, United States landuse commercial 0.4 United States us Americas Northern America
+marine policy center 2021-02-03 108710790 way Bush River Yacht Club, 4001, East Baker Avenue, Wildwood, Harford County, Maryland, 21009, United States leisure marina 0.001 United States us Americas Northern America
+shire pharmaceuticals 2021-02-03 140916147 way Shire Pharmaceuticals, 200, Riverpark Drive, North Reading, Middlesex County, Massachusetts, 01864, United States building commercial 0.201 United States us Americas Northern America
+george washington university school 2021-02-03 106978219 way George Washington University, I Street Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States amenity university 0.861031504404982 United States us Americas Northern America
+clothing distribution center 2021-02-03 14884299 node Beehive Clothing Distribution Center, Charmant Drive, La Jolla Colony, University City, San Diego, San Diego County, California, 92161, United States shop clothes 0.301 United States us Americas Northern America
+denison 2021-02-03 257424444 relation Denison, Grayson County, Texas, 75020, United States boundary administrative 0.62462611732643 United States us Americas Northern America
+houghton 2021-02-03 258207257 relation Houghton County, Michigan, United States boundary administrative 0.601814895980315 United States us Americas Northern America
+utc 2021-02-03 130801377 way University Teaching Center, 105, East 21st Street, The Drag, Austin, Travis County, Texas, 78705, United States building university 0.135420222661424 United States us Americas Northern America
+hurd 2021-02-03 500391 node Hurd, Caribou, Aroostook County, Maine, United States place hamlet 0.35 United States us Americas Northern America
+tmt 2021-02-03 5539908 node Thirty Meter Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States man_made telescope 0.354348884656857 United States us Americas Northern America
+pamela 2021-02-03 86413400 way Pamela, Taylor, Wayne County, Michigan, 48180, United States highway residential 0.2 United States us Americas Northern America
+point carbon 2021-02-03 258600968 relation Carbon County, Montana, United States boundary administrative 0.583120203849316 United States us Americas Northern America
+stanford genome technology center 2021-02-03 125860486 way Stanford Genome Technology Center, 855, South California Avenue, Evergreen Park, Palo Alto, Santa Clara County, California, 94304, United States office research 0.401 United States us Americas Northern America
+shawnee state university 2021-02-03 213692812 way Shawnee State University, US 23, Boneyfiddle Commercial Historic District, Portsmouth, Scioto County, Ohio, 41175, United States amenity university 0.301 United States us Americas Northern America
+national kidney foundation 2021-02-03 8481622 node National Kidney Foundation, 100, North Main Street, Keister Addition, Blacksburg, Montgomery County, Virginia, 24060-7401, United States office association 0.301 United States us Americas Northern America
+greenfield 2021-02-03 258666758 relation Greenfield, Franklin County, Massachusetts, 01301, United States boundary administrative 0.56861574469538 United States us Americas Northern America
+new mexico 2021-02-03 258170453 relation New Mexico, United States boundary administrative 0.915456300696001 United States us Americas Northern America
+wal-mart 2021-02-03 171263241 way Wal-Mart, Frisco, Denton County, Texas, 75036, United States highway service 0.275 United States us Americas Northern America
+congress 2021-02-03 257925515 relation Congress, Maricopa County, Arizona, 85332, United States boundary administrative 0.490444593674683 United States us Americas Northern America
+international space station 2021-02-03 54535102 node International Space Station, 1601, NASA Parkway, Houston, Harris County, Texas, 77058, United States tourism attraction 0.301 United States us Americas Northern America
+national ignition facility 2021-02-03 145115666 way National Ignition Facility, Greenville Road, Livermore, Alameda County, California, United States building yes 0.71403442187005 United States us Americas Northern America
+texas gulf coast 2021-02-03 203071766 way Texas Gulf Coast Regional Airport, Aifport Way, Brazoria County, Texas, United States aeroway aerodrome 0.550254845255209 United States us Americas Northern America
+southern methodist university 2021-02-03 97835046 way Southern Methodist University, 6425, Dyer Street, University Park, Dallas County, Texas, 75205, United States amenity university 0.818001590349159 United States us Americas Northern America
+nrf 2021-02-03 236034264 way Naval Reactors Facility, Butte County, Idaho, United States landuse industrial 0.2 United States us Americas Northern America
+national science library 2021-02-03 124347967 way Brown University Sciences Library, 101-109, Thayer Street, College Hill, Providence, Providence County, Rhode Island, 02912, United States amenity library 0.474532111506442 United States us Americas Northern America
+diamond 2021-02-03 257115549 relation Diamond, Grundy County, Illinois, United States boundary administrative 0.534194405720176 United States us Americas Northern America
+salisbury university 2021-02-03 186046675 way Salisbury University, 1101, Camden Avenue, Camden, Salisbury, Wicomico County, Maryland, 21801, United States amenity university 0.577478932777613 United States us Americas Northern America
+la jolla institute of immunology 2021-02-03 149701516 way La Jolla Institute for Allergy and Immunology, Athena Circle, Science Research Park, University City, San Diego, San Diego County, California, 92039, United States building university 0.401 United States us Americas Northern America
+university of dallas 2021-02-03 209882960 way University of Dallas, Rochelle Boulevard, Irving, Dallas County, Texas, 75039, United States amenity university 0.687650262005596 United States us Americas Northern America
+west virginia university 2021-02-03 203052022 way George Washington University - Virginia Science and Technology Campus, Broad Run Drive, Broad Run Farms, Loudoun County, Virginia, 20165, United States amenity university 0.521409003314806 United States us Americas Northern America
+hennepin county medical center 2021-02-03 123770771 way Hennepin County Medical Center, 701, Park Avenue South, Minneapolis, Hennepin County, Minnesota, 55415, United States amenity hospital 0.650254845255209 United States us Americas Northern America
+bantam 2021-02-03 259427115 relation Bantam, Litchfield, Litchfield County, Connecticut, United States boundary administrative 0.413940046679794 United States us Americas Northern America
+north dakota state university 2021-02-03 127054506 way North Dakota State University, 13th Avenue North, Roosevelt/NDSU, Fargo, Cass County, North Dakota, 58102, United States amenity university 0.852950729263141 United States us Americas Northern America
+case western reserve university 2021-02-03 259081536 relation Case Western Reserve University, 10900, Euclid Avenue, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States amenity university 0.914467419199317 United States us Americas Northern America
+virginia polytechnic institute and state university 2021-02-03 258252884 relation Virginia Polytechnic Institute and State University, Drillfield Drive, Blacksburg, Montgomery County, Virginia, 24061, United States amenity university 1.12437784952094 United States us Americas Northern America
+monterey bay aquarium research institute 2021-02-03 57262992 node Monterey Bay Aquarium Research Institute, 7700, Sandholdt Road, Moss Landing, Monterey County, California, 95039, United States office research 0.501 United States us Americas Northern America
+new york law school 2021-02-03 153073848 way New York Law School, 185, Worth Street, Tribeca, Manhattan Community Board 1, Manhattan, New York County, New York, 10013, United States building university 0.805751306412585 United States us Americas Northern America
+personal genome diagnostics 2021-02-03 54194328 node Personal Genome Diagnostics (PGDx), 2809, Boston Street, Canton, Baltimore, Maryland, 21224, United States office company 0.301 United States us Americas Northern America
+oppenheimer 2021-02-03 490611 node Oppenheimer, Bedford Township, Bedford County, Pennsylvania, United States place hamlet 0.35 United States us Americas Northern America
+gilead 2021-02-03 299882604 relation Gilead, Oxford County, Maine, United States boundary administrative 0.485438474922168 United States us Americas Northern America
+south african san institute 2021-02-03 2850026 node First African Baptist Church, Institute Street, Statesboro, Bulloch County, Georgia, 30458, United States amenity place_of_worship 0.201 United States us Americas Northern America
+quantum 2021-02-03 220451883 way Quantum, Tallahassee, Leon County, Florida, United States landuse residential 0.3 United States us Americas Northern America
+south dakota 2021-02-03 258150382 relation South Dakota, United States boundary administrative 0.895271582116408 United States us Americas Northern America
+ai now institute 2021-02-03 73395982 node AI Now Institute, West 12th Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10014, United States office research 0.301 United States us Americas Northern America
+national institute of standards and technology 2021-02-03 103001988 way National Institute of Standards and Technology, Montgomery County, Maryland, 20899, United States landuse industrial 0.8 United States us Americas Northern America
+michigan technological university 2021-02-03 214188897 way Michigan Technological University, 1400, Townsend Drive, Houghton, Portage Township, Houghton County, Michigan, 49931, United States amenity university 0.728748587005153 United States us Americas Northern America
+wesleyan university 2021-02-03 259300886 relation Wesleyan University, High Street, Middletown, Middlesex County, Connecticut, 06457, United States amenity university 0.717126371953885 United States us Americas Northern America
+children's hospital 2021-02-03 146447101 way Boston Children's Hospital, 300, Blackfan Street, Boston, Suffolk County, Massachusetts, 02115, United States amenity hospital 0.663455742331178 United States us Americas Northern America
+black hills institute of geological research 2021-02-03 189013937 way Black Hills Museum of Natural History, Main Street, Hill City, Pennington County, South Dakota, 57745, United States tourism museum 0.490508362962683 United States us Americas Northern America
+irena 2021-02-03 257479734 relation Irena, Worth County, Missouri, United States boundary administrative 0.447285603202449 United States us Americas Northern America
+american association of university women 2021-02-03 2978211 node American Association of University Women, Connecticut Avenue Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States building yes 0.501 United States us Americas Northern America
+advanced bionics 2021-02-03 107738073 way Advanced Bionics, Westinghouse Place, Santa Clarita, Los Angeles County, California, 91310, United States building commercial 0.201 United States us Americas Northern America
+genomic research 2021-02-03 85844826 way Genomic Drive, University Research Park, Madison, Dane County, Wisconsin, 53719, United States highway residential 0.3 United States us Americas Northern America
+etc group 2021-02-03 194468754 way ETC Group, 1997, 1100 East, Sugar House, Salt Lake City, Salt Lake County, Utah, 84106, United States office engineering 0.201 United States us Americas Northern America
+united launch alliance 2021-02-03 226339536 way United Launch Alliance, Morgan County, Alabama, United States landuse industrial 0.5 United States us Americas Northern America
+school of social sciences 2021-02-03 302307768 node School of Social Sciences, 6100, Main Street, Houston, Harris County, Texas, 77005, United States amenity university 0.617338060184506 United States us Americas Northern America
+national centre 2021-02-03 418056 node National, Monongalia County, West Virginia, United States place hamlet 0.389139026272805 United States us Americas Northern America
+johns hopkins university 2021-02-03 259066232 relation Johns Hopkins University, 3400, North Charles Street, Charles Village, Baltimore, Maryland, 21218, United States amenity university 0.891185823835172 United States us Americas Northern America
+brigham and women's hospital 2021-02-03 258770706 relation Brigham and Women's Hospital, 75, Francis Street, Roxbury, Boston, Suffolk County, Massachusetts, 02115, United States amenity hospital 0.87720861480317 United States us Americas Northern America
+new madrid 2021-02-03 258032415 relation New Madrid County, Missouri, United States boundary administrative 0.712205972002166 United States us Americas Northern America
+ucsb 2021-02-03 205319990 way University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States place locality 0.125 United States us Americas Northern America
+channel islands 2021-02-03 259434584 relation Channel Islands, Ventura County, California, 90704, United States place archipelago 0.711550869264683 United States us Americas Northern America
+clay mathematics institute 2021-02-03 186024492 way Institute for Pure and Applied Mathematics, 460, Portola Plaza, Westwood, Los Angeles, Los Angeles County, California, 90095, United States building yes 0.43181178765026 United States us Americas Northern America
+kaiser foundation health plan 2021-02-03 212439225 way Kaiser Foundation Hospital, Modesto Helipad, Health Care Way, Modesto, Stanislaus County, California, 95368, United States aeroway helipad 0.301 United States us Americas Northern America
+us national security agency 2021-02-03 135361590 way National Security Agency, Anne Arundel County, Maryland, United States landuse government 0.866177100706018 United States us Americas Northern America
+rehabilitation research 2021-02-03 176264206 way Rehabilitation Research Training Building, West Main Street, The Fan, Richmond, Virginia, 23220, United States building yes 0.201 United States us Americas Northern America
+seaman 2021-02-03 258449460 relation Seaman, Adams County, Ohio, United States boundary administrative 0.416167966338533 United States us Americas Northern America
+teva pharmaceuticals 2021-02-03 188636672 way Teva Pharmaceuticals, 1090, Horsham Road, Montgomeryville, North Wales, Montgomery County, Pennsylvania, 19454, United States building industrial 0.201 United States us Americas Northern America
+children's research institute 2021-02-03 134977531 way Children's Research Institute (CRI), Mound Park Avenue South, Roser Park, St. Petersburg, Pinellas County, Florida, 33701, United States building university 0.401 United States us Americas Northern America
+environmental protection agency 2021-02-03 118168847 way Environmental Protection Agency, Veterans Memorial Drive, Florence, Boone County, Kentucky, 41042, United States office government 0.301 United States us Americas Northern America
+us national bureau of economic research 2021-02-03 97970473 way National Bureau of Economic Research, 1050, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02138, United States building yes 1.03403299384431 United States us Americas Northern America
+ohio university 2021-02-03 181314709 way Ohio University, Edgehill Drive, Athens, Athens County, Ohio, 45701, United States amenity university 0.701814895980315 United States us Americas Northern America
+north carolina state university 2021-02-03 258870586 relation North Carolina State University, Trinity Road, Westover, Raleigh, Wake County, North Carolina, 27607, United States amenity university 0.639862222899095 United States us Americas Northern America
+united states geological survey 2021-02-03 83553443 node United States Geological Survey, 1849, C Street Northwest, Washington, District of Columbia, 20240, United States office government 1.13534289613778 United States us Americas Northern America
+weill cornell medicine 2021-02-03 73119338 node Weill Cornell Internal Medicine Associates at Wright, 1484, 1st Avenue, Upper East Side, Manhattan Community Board 8, Manhattan, New York County, New York, 10075, United States amenity clinic 0.301 United States us Americas Northern America
+roosevelt university 2021-02-03 2336069 node Roosevelt University, 430, South Michigan Avenue, Printer's Row, Loop, Chicago, Cook County, Illinois, 60605, United States amenity university 0.614479959227419 United States us Americas Northern America
+edgcomb 2021-02-03 88605407 way Edgcomb Avenue, Knoxville, Tioga County, Pennsylvania, 16928, United States highway residential 0.2 United States us Americas Northern America
+university of texas southwestern medical center 2021-02-03 207040692 way University of Texas Southwestern Medical Center, 5323, Harry Hines Boulevard, Dallas, TX, Dallas, Dallas County, Texas, 75390, United States amenity university 0.942002873412564 United States us Americas Northern America
+genentech hall 2021-02-03 122738337 way Genentech Hall, Roger Evans Terrace, Mission Bay, San Francisco, San Francisco City and County, California, United States building yes 0.201 United States us Americas Northern America
+arf 2021-02-03 246438766 way ARF, Marian View Drive, Idyllwild, Riverside County, California, 92549, United States amenity animal_shelter 0.101 United States us Americas Northern America
+accuweather in state college 2021-02-03 177586041 way AccuWeather, 385, Science Park Road, Science Park, State College, Centre County, Pennsylvania, 16803, United States office company 0.301 United States us Americas Northern America
+university of washington 2021-02-03 258779744 relation University of Washington, Burke-Gilman Trail, University District, Seattle, King County, Washington, 98105, United States amenity university 0.898418423079257 United States us Americas Northern America
+university of colorado denver 2021-02-03 104339205 way University of Colorado Denver, Cherry Creek Trail, Lower Downtown, Denver, Denver County, Colorado, 80217, United States amenity university 0.66358119422997 United States us Americas Northern America
+brookings 2021-02-03 258255410 relation Brookings County, South Dakota, United States boundary administrative 0.575721107070673 United States us Americas Northern America
+justice 2021-02-03 258429262 relation Justice, Lyons Township, Cook County, Illinois, 60458, United States boundary administrative 0.566266067536779 United States us Americas Northern America
+central washington university 2021-02-03 206740946 way Central Washington University, East Vantage Highway, Ellensburg, Kittitas County, Washington, 98926, United States amenity university 0.69394918828843 United States us Americas Northern America
+us army corps of engineers 2021-02-03 211349908 way US Army Corps of Engineers, DeKalb County, Tennessee, United States landuse commercial 0.7 United States us Americas Northern America
+jackson lab 2021-02-03 87279896 way Jackson, Castleberry, Conecuh County, Alabama, 36432, United States highway primary 0.3 United States us Americas Northern America
+florida museum of natural history 2021-02-03 182064668 way Florida Museum of Natural History, 3215, Hull Road, Gainesville, Alachua County, Florida, 32611, United States tourism museum 0.868804350670811 United States us Americas Northern America
+carnegie 2021-02-03 258387827 relation Carnegie, Allegheny County, Pennsylvania, 15106, United States boundary administrative 0.459613385609502 United States us Americas Northern America
+university of maryland 2021-02-03 198712103 way University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States amenity university 0.859664537852789 United States us Americas Northern America
+research integrity 2021-02-03 65571490 node Police Integrity Research Lab, Ridge Street, Athletics District, Bowling Green, Wood County, Ohio, 43403, United States office research 0.201 United States us Americas Northern America
+senate 2021-02-03 367209 node Senate, Jack County, Texas, United States place hamlet 0.35 United States us Americas Northern America
+novartis institutes for biomedical research 2021-02-03 133694482 way Novartis Institutes for Biomedical Research, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States landuse commercial 0.7 United States us Americas Northern America
+princeton plasma physics laboratory 2021-02-03 96034748 way Princeton Plasma Physics Laboratory, 100, Stellarator Road, Plainsboro Township, Princeton, Middlesex County, New Jersey, 08540, United States amenity research_institute 0.776937105996802 United States us Americas Northern America
+seaworld 2021-02-03 159858865 way SeaWorld San Diego, 500, Sea World Drive, San Diego, San Diego County, California, 92109, United States tourism theme_park 0.479859879460608 United States us Americas Northern America
+daiichi sankyo 2021-02-03 80948574 node Daiichi Sankyo, Village Circle, Solana Plaza, Westlake, Tarrant County, Texas, 76092, United States office yes 0.201 United States us Americas Northern America
+labor party 2021-02-03 205366515 way Socialist Labor Party Hall, 46, Barre, Barre City, Washington County, Vermont, 496, United States boundary protected_area 0.405371759161912 United States us Americas Northern America
+glenn research center 2021-02-03 60822274 node NASA John H. Glenn Research Center at Lewis Field, Taylor Road, Brook Park, Cuyahoga County, Ohio, 44126, United States office research 0.739197856791149 United States us Americas Northern America
+google 2021-02-03 18812108 node Google, 355, Main Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States office company 0.794935675921029 United States us Americas Northern America
+western university 2021-02-03 2863345 node Western University, Easthill Drive, Jamacha, San Diego, San Diego County, California, 91945, United States amenity school 0.201 United States us Americas Northern America
+peabody museum of archaeology and ethnology 2021-02-03 2943218 node Peabody Museum of Archaeology and Ethnology, 11, Divinity Avenue, Cambridge, Middlesex County, Massachusetts, 02138, United States tourism museum 1.00313937321747 United States us Americas Northern America
+cell research 2021-02-03 137785222 way Former GM Fuel Cell Research Facility, Honeoye Falls, Mendon, Monroe County, New York, United States landuse industrial 0.4 United States us Americas Northern America
+global congress 2021-02-03 173285347 way SRG Global, 601, North Congress Avenue, Smythe, Evansville, Vanderburgh County, Indiana, 47715, United States building yes 0.201 United States us Americas Northern America
+american academy of neurology 2021-02-03 127199908 way American Academy of Neurology, Chicago Avenue South, Minneapolis, Hennepin County, Minnesota, 55415, United States building yes 0.401 United States us Americas Northern America
+smithsonian national museum of natural history 2021-02-03 107528703 way National Museum of Natural History, Smithsonian Pollinator Garden Path, Penn Quarter, Washington, District of Columbia, 20560, United States tourism museum 1.09276993072723 United States us Americas Northern America
+duke lemur center 2021-02-03 212038174 way Duke Lemur Center, Evans Street, Welcome Circle, Durham, Durham County, North Carolina, 27705, United States tourism zoo 0.605872022275768 United States us Americas Northern America
+california department of forestry and fire protection 2021-02-03 102294799 way Cal Fire (California Department of Forestry and Fire Protection) CZU Felton Headquarters, CA 9, Felton, Santa Cruz County, California, 95018-9704, United States amenity fire_station 0.701 United States us Americas Northern America
+concordia university 2021-02-03 124004751 way Concordia University, 2811, Northeast Holman Street, Concordia, Portland, Metro, Oregon, 97211, United States amenity university 0.525928585624107 United States us Americas Northern America
+asia society 2021-02-03 156760684 way Asia Society, Park Avenue, Carnegie Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10021, United States tourism museum 0.600038865094841 United States us Americas Northern America
+fullerton 2021-02-03 258631737 relation Fullerton, Orange County, California, United States boundary administrative 0.608922490506601 United States us Americas Northern America
+university of nebraska–lincoln 2021-02-03 105525403 way Sheldon Museum of Art, North 12th Street, Downtown, Haymarket, Lincoln, Lancaster County, Nebraska, 68588-0300, United States tourism gallery 0.603230229325644 United States us Americas Northern America
+chimp haven 2021-02-03 23953062 node Chimp Haven, 13600, Caddo Drive, Caddo Parish, Louisiana, 71047, United States tourism zoo 0.398387040368712 United States us Americas Northern America
+cca 2021-02-03 133975195 way California College of the Arts, 8th Street, San Francisco, San Francisco City and County, California, 90103, United States amenity university 0.417511672002615 United States us Americas Northern America
+mayo clinic 2021-02-03 162861597 way Mayo Clinic, Phoenix, Maricopa County, Arizona, 85054, United States highway unclassified 0.3 United States us Americas Northern America
+ccri 2021-02-03 190410505 way Community College of Rhode Island Liston Campus, 1, Hilton Street, Providence, Providence County, Rhode Island, 02905, United States amenity college 0.001 United States us Americas Northern America
+island conservation 2021-02-03 57458246 node Brooks Island, Concord, Middlesex County, Massachusetts, 01733, United States place island 0.425 United States us Americas Northern America
+us bureau of land management 2021-02-03 64573812 node La Posa South LTVA, US 95, Quartzsite, La Paz County, Arizona, 85346, United States tourism caravan_site 0.101 United States us Americas Northern America
+university of colorado 2021-02-03 167749471 way University of Northern Colorado, 501, 20th Street, Jackson Field, Greeley, Weld County, Colorado, 80631, United States amenity university 0.714405926306359 United States us Americas Northern America
+university of delaware 2021-02-03 30187178 node University of Delaware, South College Avenue, Newark, New Castle County, Delaware, 19713, United States amenity university 0.801868684259545 United States us Americas Northern America
+ny 2021-02-03 257701567 relation New York, United States boundary administrative 0.765584640908957 United States us Americas Northern America
+alabama 2021-02-03 257215122 relation Alabama, United States boundary administrative 0.819961141220614 United States us Americas Northern America
+millipore sigma 2021-02-03 259388950 relation Millipore Sigma, North Harrison Road, Pleasant Gap, Spring Township, Centre County, Pennsylvania, 16823, United States building commercial 0.201 United States us Americas Northern America
+shoemaker levy 9 2021-02-03 48677113 node A Shine To Go, 1710, Allied Street, McIntire Plaza Shopping Center, Greenfields, Charlottesville, Virginia, 22903, United States craft shoemaker 0.101 United States us Americas Northern America
+national institute for public health 2021-02-03 35683102 node Washington University, Institute for Public Health, 600, South Taylor Avenue, WashU, City of Saint Louis, Missouri, 63110, United States office university 0.401 United States us Americas Northern America
+lunar and planetary institute 2021-02-03 2467172 node Lunar and Planetary Institute Rice University, West Oaks Drive, Pasadena, Harris County, Texas, 77058, United States amenity school 0.401 United States us Americas Northern America
+us federal aviation administration 2021-02-03 129948979 way Federal Aviation Administration, Bernalillo County, New Mexico, United States boundary administrative 0.65 United States us Americas Northern America
+the cdc 2021-02-03 172987439 way CDC, New Center, Detroit, Wayne County, Michigan, United States landuse farmyard 0.3 United States us Americas Northern America
+ibm research 2021-02-03 98702289 way IBM Almaden Research Center, 650, Harry Road, IBM Almaden Research Center, San Jose, Santa Clara County, California, 95120, United States building yes 0.483827688081076 United States us Americas Northern America
+city university of new york 2021-02-03 179360561 way Queens College, City University of New York, 152nd Street, Queens, Queens County, New York, 11367, United States amenity university 0.9318394385017 United States us Americas Northern America
+us department of agriculture 2021-02-03 48599253 node US Department of Agriculture, Maine Avenue Southwest, Washington, District of Columbia, 20250, United States office government 1.00973759439018 United States us Americas Northern America
+university of southern mississippi 2021-02-03 258509104 relation University of Southern Mississippi, 118, College Drive, Hattiesburg, Forrest County, Mississippi, 39406, United States amenity university 0.839494404593605 United States us Americas Northern America
+j. paul getty museum 2021-02-03 55027361 node The J. Paul Getty Museum, Beverly Park Drive, Brentwood, Los Angeles, Los Angeles County, California, 90049, United States tourism museum 0.873062316630288 United States us Americas Northern America
+open academic society 2021-02-03 171172391 way Health Professions Academic Building, 901, South 9th Street, Society Hill, Philadelphia, Philadelphia County, Pennsylvania, 19107, United States building hospital 0.319931111449548 United States us Americas Northern America
+peninsula medical school 2021-02-03 191165616 way Peninsula Regional Medical Center, 100, East Carroll Street, Salisbury, Wicomico County, Maryland, 21801, United States amenity hospital 0.46691348680426 United States us Americas Northern America
+us national oceanic and atmospheric administration 2021-02-03 301086165 way 1839, National Oceanic Atmospheric Administration, San Diego, San Diego County, California, 92101, United States landuse industrial 0.6 United States us Americas Northern America
+loma linda university 2021-02-03 244288874 way Loma Linda University, Tulip Avenue, Loma Linda, San Bernardino County, California, 92350, United States amenity university 0.301 United States us Americas Northern America
+walter reed army institute of research 2021-02-03 179850833 way Walter Reed Army Institute of Research, Robert Grant Avenue, Linden, Lyttonsville, Silver Spring, Montgomery County, Maryland, 20895-3199, United States office research 0.601 United States us Americas Northern America
+georgetown university medical center 2021-02-03 105725399 way Georgetown University, 3700, O Street Northwest, Georgetown, Washington, District of Columbia, 20057, United States amenity university 0.787586492717596 United States us Americas Northern America
+subaru telescope 2021-02-03 101632679 way Subaru Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States man_made telescope 0.61807260783706 United States us Americas Northern America
+board 2021-02-03 435229 node Board, Mason County, West Virginia, United States place hamlet 0.35 United States us Americas Northern America
+us defense advanced research projects agency 2021-02-03 166563644 way Defense Advanced Research Projects Agency, 675, North Randolph Street, Ballston, Arlington, Arlington County, Virginia, 22203, United States office government 0.501 United States us Americas Northern America
+los alamos national laboratory 2021-02-03 259190746 relation Los Alamos National Laboratory, Los Alamos, Los Alamos County, New Mexico, United States boundary military 0.927683295435605 United States us Americas Northern America
+marine research 2021-02-03 26002868 node West Marine, Research Boulevard, North Crossing, Austin, Travis County, Texas, 78752, United States shop boat 0.201 United States us Americas Northern America
+sci 2021-02-03 258539307 relation Scioto County, Ohio, United States boundary administrative 0.614306518100907 United States us Americas Northern America
+center for genomics and systems biology 2021-02-03 151793647 way Center for Genomics and Systems Biology, 16, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States building university 0.601 United States us Americas Northern America
+academy 2021-02-03 259255631 relation Academy, City of Saint Louis, Missouri, United States boundary administrative 0.386244954737813 United States us Americas Northern America
+texas a&m university 2021-02-03 259129741 relation Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States amenity university 1.05527727305854 United States us Americas Northern America
+polar science center 2021-02-03 183870807 way PARS, Polar Aeronomy and Radio Science, Fairbanks, Fairbanks North Star, Alaska, United States landuse industrial 0.4 United States us Americas Northern America
+mass. 2021-02-03 258278823 relation Massachusetts, United States boundary administrative 0.836449761303479 United States us Americas Northern America
+university of oregon 2021-02-03 258754869 relation University of Oregon, Emerald Express, Eugene, Lane County, Oregon, 97403-5274, United States amenity university 0.858937574127135 United States us Americas Northern America
+university of south alabama 2021-02-03 2909833 node University of South Alabama, USA South Drive, West Hill, Mobile, Mobile County, Alabama, 36688, United States amenity university 0.401 United States us Americas Northern America
+us national center for atmospheric research 2021-02-03 47686315 node NCAR Exhibits, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States tourism museum 0.501 United States us Americas Northern America
+nrao 2021-02-03 299024599 relation Green Bank Observatory, ICB Road, Green Bank, Pocahontas County, West Virginia, 24944, United States amenity research_institute 0.001 United States us Americas Northern America
+ketchum 2021-02-03 257781466 relation Ketchum, Blaine County, Idaho, 83340, United States boundary administrative 0.49577998822869 United States us Americas Northern America
+cowen and company 2021-02-03 258460482 relation Cowen, Webster County, West Virginia, 26206, United States boundary administrative 0.453558714867367 United States us Americas Northern America
+the boston globe 2021-02-03 92324871 way Boston Street, Globe, Gila County, Arizona, 85501, United States highway residential 0.3 United States us Americas Northern America
+medical college of wisconsin 2021-02-03 223514733 way Medical College of Wisconsin, 8701, East Connell Court, Wauwatosa, Milwaukee County, Wisconsin, 53226, United States amenity university 0.755899467051989 United States us Americas Northern America
+federal security service 2021-02-03 154159910 way Navy Federal Credit Union, 141, Security Drive, Winchester, Frederick County, Virginia, 22602, United States office Credit_Union 0.201 United States us Americas Northern America
+unc-chapel hill 2021-02-03 258459202 relation University of North Carolina, South Columbia Street, Downtown, Chapel Hill, Orange County, North Carolina, 27516, United States amenity university 0.782889212190386 United States us Americas Northern America
+congress for the nih 2021-02-03 77612239 node Betty McCollum for Congress, 661, Lasalle Street, St. Paul, Ramsey County, Minnesota, 55114, United States office government 0.201 United States us Americas Northern America
+us congress 2021-02-03 257925515 relation Congress, Maricopa County, Arizona, 85332, United States boundary administrative 0.490444593674683 United States us Americas Northern America
+american superconductor 2021-02-03 140147943 way American Superconductor, 64, Jackson Road, Devens, Harvard, Worcester County, Massachusetts, 01434, United States building industrial 0.201 United States us Americas Northern America
+impc 2021-02-03 204982626 way IMPC, Inglesby Drive, Williamsburg East, Richland County, South Carolina, 29223, United States amenity place_of_worship 0.101 United States us Americas Northern America
+national oceanic and atmospheric administration 2021-02-03 301086165 way 1839, National Oceanic Atmospheric Administration, San Diego, San Diego County, California, 92101, United States landuse industrial 0.6 United States us Americas Northern America
+village veterinary medical center 2021-02-03 178105276 way Village Veterinary Medical Center, Kingston Pike, Dixie Lee Junction, Farragut, Knox County, Tennessee, 37934, United States amenity veterinary 0.401 United States us Americas Northern America
+bellatrix 2021-02-03 213865135 way Bellatrix, Altair, Orange County Great Park, Irvine, Orange County, California, 92619, United States highway residential 0.2 United States us Americas Northern America
+american association of science 2021-02-03 8123167 node AAAS / Science, 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States tourism attraction 0.201 United States us Americas Northern America
+dunn solar telescope 2021-02-03 139772916 way Dunn Solar Telescope, Telescope Loop, Sacramento Peak Observatory, Sunspot, Otero County, New Mexico, 88349, United States building yes 0.301 United States us Americas Northern America
+mit press 2021-02-03 63902179 node The MIT Press Bookstore, 297, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States shop books 0.201 United States us Americas Northern America
+boston children's hospital 2021-02-03 146447101 way Boston Children's Hospital, 300, Blackfan Street, Boston, Suffolk County, Massachusetts, 02115, United States amenity hospital 0.763455742331178 United States us Americas Northern America
+villanova university 2021-02-03 106294586 way Villanova University, Aldwyn Lane, Villanova, Radnor, Radnor Township, Delaware County, Pennsylvania, 19085, United States amenity university 0.700710894545203 United States us Americas Northern America
+carter center 2021-02-03 3094933 node Carter Presidential Center, John Lewis Freedom Parkway Northeast, Linwood, Atlanta, Fulton County, Georgia, 30306 DASH4279, United States tourism museum 0.201 United States us Americas Northern America
+fermi national laboratory 2021-02-03 99059145 way Fermi National Accelerator Laboratory, DuPage County, Illinois, United States landuse industrial 0.763054296170657 United States us Americas Northern America
+allen institute for brain science 2021-02-03 176152346 way Allen Institute for Brain Science, 615, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States office research 0.501 United States us Americas Northern America
+us federal bureau of investigation 2021-02-03 295889146 relation Federal Bureau of Investigation, 935, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20535, United States amenity police 0.742718151065986 United States us Americas Northern America
+research biosecurity 2021-02-03 106116575 way Biosecurity Research Institute, Denison Avenue, Manhattan, Riley County, Kansas, 66506â€<90>1600, United States building university 0.201 United States us Americas Northern America
+us senate 2021-02-03 367209 node Senate, Jack County, Texas, United States place hamlet 0.35 United States us Americas Northern America
+us forest service 2021-02-03 301108853 node Cabin City, Twelvemile Creek Road #353, Cabin City, Mineral County, Montana, United States tourism camp_site 0.001 United States us Americas Northern America
+md 2021-02-03 258170637 relation Maryland, United States boundary administrative 0.724620353023131 United States us Americas Northern America
+welsh 2021-02-03 257788849 relation Welsh, Jefferson Davis Parish, Louisiana, 70591, United States boundary administrative 0.36851441835616 United States us Americas Northern America
+slac national accelerator laboratory in stanford 2021-02-03 299175282 way Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States amenity research_center 0.927082745074033 United States us Americas Northern America
+maine 2021-02-03 257996253 relation Maine, United States boundary administrative 0.80496250046223 United States us Americas Northern America
+another house 2021-02-03 42793507 node Another, 9500, Gilman Drive, University Center, San Diego, San Diego County, California, 92092, United States tourism artwork 0.101 United States us Americas Northern America
+louisiana 2021-02-03 257328554 relation Louisiana, United States boundary administrative 0.813184888367119 United States us Americas Northern America
+tex 2021-02-03 257418219 relation Texas, United States boundary administrative 0.858052139534058 United States us Americas Northern America
+california institute of technology 2021-02-03 97237039 way California Institute of Technology, East Del Mar Boulevard, Pasadena, Los Angeles County, California, 91106, United States amenity university 0.98591368499579 United States us Americas Northern America
+georgia state 2021-02-03 50248915 node Georgia State, 2, Martin Luther King Junior Drive Southeast, Five Points, Atlanta, Fulton County, Georgia, 30303-3506, United States railway station 0.201 United States us Americas Northern America
+illinois 2021-02-03 257440201 relation Illinois, United States boundary administrative 0.843803112037364 United States us Americas Northern America
+cambridge university 2021-02-03 95023289 way Cambridge Drive, University Park, Markham, Bremen Township, Cook County, Illinois, 60428, United States highway residential 0.3 United States us Americas Northern America
+university of south florida 2021-02-03 98932241 way University of South Florida, USF Pine Drive, Tampa, Hillsborough County, Florida, 33612, United States amenity university 0.401 United States us Americas Northern America
+iea 2021-02-03 258149110 relation Iowa, United States boundary administrative 0.721883953901863 United States us Americas Northern America
+information center 2021-02-03 88944375 way Information Center, Polk County, Arkansas, 71953, United States highway residential 0.3 United States us Americas Northern America
+noaa earth system research laboratory 2021-02-03 153944153 way NOAA - Earth System Research Laboratory, 325, Broadway, Boulder, Boulder County, Colorado, 80305, United States office government 0.501 United States us Americas Northern America
+university of kansas medical center 2021-02-03 156808377 way University of Kansas Medical Center, 3901, Rainbow Boulevard, Kansas City, Wyandotte County, Kansas, 66160, United States amenity hospital 0.781950414040809 United States us Americas Northern America
+accuweather 2021-02-03 177586041 way AccuWeather, 385, Science Park Road, Science Park, State College, Centre County, Pennsylvania, 16803, United States office company 0.101 United States us Americas Northern America
+university of massachusetts medical school 2021-02-03 125863087 way University of Massachusetts Medical School, First Road, Worcester, Worcester County, Massachusetts, 01653, United States amenity college 0.501 United States us Americas Northern America
+arizona 2021-02-03 257489274 relation Arizona, United States boundary administrative 0.823799492478004 United States us Americas Northern America
+novartis 2021-02-03 168483166 way 211, Novartis, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States landuse industrial 0.3 United States us Americas Northern America
+wildlife services 2021-02-03 208429848 way US Fish & Wildlife Services, 101, Park de Ville Drive, Fairview Marketplace, Columbia, Boone County, Missouri, 65203, United States building yes 0.201 United States us Americas Northern America
+uspto 2021-02-03 103148391 way USPTO Remsen Building, 400, Dulany Street, Lyles-Crouch, Alexandria, Virginia, 22314, United States building office 0.101 United States us Americas Northern America
+game commission 2021-02-03 70479424 node Nebraska Game and Parks Commission, 2200, North 33rd Street, Lincoln, Lancaster County, Nebraska, 68503, United States office government 0.482582546755277 United States us Americas Northern America
+sangamo 2021-02-03 87502152 way Sangamo Drive, Belaire Estates, Greenville County, South Carolina, 29611, United States highway residential 0.2 United States us Americas Northern America
+pioneer 2021-02-03 258145486 relation Pioneer, Humboldt County, Iowa, United States boundary administrative 0.530939679465417 United States us Americas Northern America
+open phil 2021-02-03 448866 node Phil, Robeson County, North Carolina, United States place hamlet 0.35 United States us Americas Northern America
+hershey 2021-02-03 258025884 relation Hershey, Dauphin County, Pennsylvania, United States boundary administrative 0.570462886806853 United States us Americas Northern America
+boston dynamics 2021-02-03 161862452 way Boston Dynamics, 78, Fourth Avenue, Waltham, Middlesex County, Massachusetts, 02451, United States office company 0.590005927058632 United States us Americas Northern America
+university of missouri 2021-02-03 157228940 way University of Missouri, Old 63 South, Columbia, Boone County, Missouri, 65201, United States amenity university 0.856334584047093 United States us Americas Northern America
+cleveland museum of natural history 2021-02-03 258196323 relation Cleveland Museum of Natural History, 1, Wade Oval Drive, Magnolia-Wade Park Historic District, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States tourism museum 0.839306791900516 United States us Americas Northern America
+defense advanced research projects agency 2021-02-03 166563644 way Defense Advanced Research Projects Agency, 675, North Randolph Street, Ballston, Arlington, Arlington County, Virginia, 22203, United States office government 0.501 United States us Americas Northern America
+united states 2021-02-03 257984054 relation United States boundary administrative 1.13569136745759 United States us Americas Northern America
+dhhs 2021-02-03 80387349 node DHHS, 220, Capitol Street, Augusta, Kennebec County, Maine, 04330, United States place house 0.101 United States us Americas Northern America
+saint martin's university 2021-02-03 228320701 way Saint Martin's University, I 5, Lacey, Thurston County, Washington, 98516-5364, United States amenity university 0.710838391011185 United States us Americas Northern America
+carthage college 2021-02-03 181816840 way Carthage College, 2001, Alford Park Drive, Kenosha, Kenosha County, Wisconsin, 53140, United States amenity college 0.59394918828843 United States us Americas Northern America
+aia 2021-02-03 104903713 way American Institute of Architects, 1735, New York Avenue Northwest, Washington, District of Columbia, 20006, United States office ngo 0.482165402797397 United States us Americas Northern America
+international rescue committee 2021-02-03 82409109 node International Rescue Committee, 1535, Liberty Lane, Westside, Missoula, Missoula County, Montana, 59807, United States amenity social_centre 0.301 United States us Americas Northern America
+aaas 2021-02-03 8123141 node AAAS Art Gallery (public), 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States tourism artwork 0.101 United States us Americas Northern America
+scripps institution of oceanography 2021-02-03 2864486 node Scripps Institution of Oceanography, Kennel Way, San Diego, San Diego County, California, 92093, United States amenity school 0.401 United States us Americas Northern America
+national library of medicine 2021-02-03 100564321 way NLM, 8600, Rockville Pike, Glenbrook, East Bethesda, Bethesda, Montgomery County, Maryland, 20894, United States amenity library 0.574397490815619 United States us Americas Northern America
+federal bureau of investigation 2021-02-03 295889146 relation Federal Bureau of Investigation, 935, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20535, United States amenity police 0.742718151065986 United States us Americas Northern America
+bloom energy 2021-02-03 301192108 node Bloom Energy, 4353, North 1st Street, Alviso, San Jose, Santa Clara County, California, 95134, United States office company 0.201 United States us Americas Northern America
+vanderbilt university 2021-02-03 119946667 way Vanderbilt University, Belcourt Avenue, Hillsboro Village, Nashville-Davidson, Davidson County, Tennessee, 37212, United States amenity university 0.75130624340886 United States us Americas Northern America
+bowling green state university 2021-02-03 258878654 relation Bowling Green State University, 1001, East Wooster Street, Bentwood Estates, Bowling Green, Wood County, Ohio, 43403-0001, United States amenity university 0.882362468990463 United States us Americas Northern America
+university of idaho 2021-02-03 151457830 way University of Idaho, South Main Street, Moscow, Latah County, Idaho, 83843, United States amenity university 0.773119489546607 United States us Americas Northern America
+quinnipiac university 2021-02-03 259033660 relation Quinnipiac University, Blandon Drive, Hamden, New Haven County, Connecticut, 06518, United States amenity university 0.609392399368322 United States us Americas Northern America
+washington university 2021-02-03 35683102 node Washington University, Institute for Public Health, 600, South Taylor Avenue, WashU, City of Saint Louis, Missouri, 63110, United States office university 0.201 United States us Americas Northern America
+naval research laboratory 2021-02-03 105823802 way United States Naval Research Laboratory, Washington, District of Columbia, 20375, United States landuse military 0.730026590181569 United States us Americas Northern America
+us national library of medicine 2021-02-03 100564321 way NLM, 8600, Rockville Pike, Glenbrook, East Bethesda, Bethesda, Montgomery County, Maryland, 20894, United States amenity library 0.574397490815619 United States us Americas Northern America
+abc news/ washington post 2021-02-03 169691814 way Washington Boulevard, Newport News, Virginia, 23604, United States highway secondary 0.3 United States us Americas Northern America
+smithsonian conservation biology institute in front royal 2021-02-03 259518942 relation Smithsonian Conservation Biology Institute, Front Royal, Warren County, Virginia, United States boundary national_park 1.03408057788768 United States us Americas Northern America
+university of maryland in college park 2021-02-03 198712103 way University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States amenity university 1.15966453785279 United States us Americas Northern America
+us appeals court 2021-02-03 90738673 way Appeals Court, Independence, Kenton County, Kentucky, 41051, United States highway residential 0.3 United States us Americas Northern America
+the guardian 2021-02-03 2795396 node The Guardian, San Juan County, Colorado, United States natural peak 0.5 United States us Americas Northern America
+university of lyon 2021-02-03 143873364 way Southwest Minnesota State University, Birch Street, Marshall, Lyon County, Minnesota, 56258, United States amenity university 0.541762590849456 United States us Americas Northern America
+santa clara university 2021-02-03 258949006 relation Santa Clara University, El Camino Real, Santa Clara, Santa Clara County, California, 95050, United States amenity university 0.787796879524132 United States us Americas Northern America
+harvard university 2021-02-03 258370425 relation Harvard University, Kingsley Street, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134-1420, United States amenity university 0.977190722653673 United States us Americas Northern America
+pacific tsunami warning center 2021-02-03 297701617 node Pacific Tsunami Warning Center, Perimeter Road, Pacific Tsunami Warning Center, Ewa Beach, Honolulu County, Hawaii, 96706, United States man_made monitoring_station 0.754544854295327 United States us Americas Northern America
+st cloud state university 2021-02-03 258951532 relation St. Cloud State University, 720, 4th Avenue South, St. Cloud, Stearns County, Minnesota, 56301, United States amenity university 0.810507227685364 United States us Americas Northern America
+qualcomm 2021-02-03 98480927 way Qualcomm, 10555, Sorrento Valley Road, San Diego, San Diego County, California, 92140, United States building yes 0.101 United States us Americas Northern America
+chaffey college 2021-02-03 99601399 way Chaffey College, Banyan Street, Rancho Cucamonga, San Bernardino County, California, 91737, United States amenity college 0.549235472656649 United States us Americas Northern America
+rogers 2021-02-03 258319337 relation Rogers, Benton County, Arkansas, United States boundary administrative 0.579492986484072 United States us Americas Northern America
+minnesota state fair 2021-02-03 86373774 way Minnesota Avenue, Fair Oaks, Sacramento County, California, 95628-7416, United States highway residential 0.4 United States us Americas Northern America
+iowa state university in ames 2021-02-03 258786807 relation Iowa State University, US 30, Ames, Story County, Iowa, 50011, United States amenity university 0.929769585619443 United States us Americas Northern America
+continental resources 2021-02-03 127263494 way Continental Resources, 175, Ledge Street, Ward 4, Nashua, Hillsborough County, New Hampshire, 03060, United States building yes 0.201 United States us Americas Northern America
+san diego state university 2021-02-03 259507492 relation San Diego State University, 1, Campanile Mall, Montezuma Mesa, Del Cerro, San Diego, San Diego County, California, 92182, United States amenity university 0.909716528793983 United States us Americas Northern America
+history of natural science 2021-02-03 3051871 node El Campo Museum of Art, History, and Natural Science, North Mechanic Street, El Campo, Wharton County, Texas, 77437, United States tourism museum 0.401 United States us Americas Northern America
+palomar observatory 2021-02-03 61117750 node Palomar Observatory, Canfield Road, San Diego County, California, 92060, United States tourism attraction 0.816929691572276 United States us Americas Northern America
+colorado 2021-02-03 258349416 relation Colorado, United States boundary administrative 0.816010061654908 United States us Americas Northern America
+the states 2021-02-03 257984054 relation United States boundary administrative 1.03569136745759 United States us Americas Northern America
+wildlife conservation society 2021-02-03 105840797 way Prospect Park Zoo, 450, Flatbush Avenue, Prospect Heights, Brooklyn, Kings County, New York, 11225, United States tourism zoo 0.360507920897054 United States us Americas Northern America
+us national science board 2021-02-03 12578717 node NYU School of Medicine, 562, 1st Avenue, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10017-6927, United States amenity university 0.499286093607089 United States us Americas Northern America
+research animal resources center 2021-02-03 118554634 way Research Animal Resources, 1861, Buford Place, St. Paul, Ramsey County, Minnesota, 55108, United States building yes 0.301 United States us Americas Northern America
+us national football league 2021-02-03 140878974 way Bay Area Christian School Football Field, Oak Creek Drive, Oak Creek, League City, Galveston County, Texas, 77573, United States leisure pitch 0.201 United States us Americas Northern America
+university of rochester 2021-02-03 114205376 way Memorial Art Gallery, 500, University Avenue, East End, Rochester, Monroe County, New York, 14607, United States tourism museum 0.53489332460211 United States us Americas Northern America
+homestake 2021-02-03 337921 node Homestake, Jefferson County, Montana, United States place hamlet 0.35 United States us Americas Northern America
+langley research center 2021-02-03 259101253 relation NASA Langley Research Center, Hampton, Virginia, United States landuse military 0.744328937907079 United States us Americas Northern America
+university of rochester medical center 2021-02-03 208125826 way University of Rochester Medical Center, 601, Elmwood Avenue, Upper Mount Hope, Rochester, Monroe County, New York, 14611, United States amenity hospital 0.754365194683011 United States us Americas Northern America
+brown university 2021-02-03 101690172 way Brown University, South Main Street, Fox Point, Providence, Providence County, Rhode Island, 02912, United States amenity university 0.786479374942082 United States us Americas Northern America
+san francisco brain research institute 2021-02-03 133163876 way Brain Research Institute, 670, Charles E Young Drive South, Westwood, Los Angeles, Los Angeles County, California, 90095, United States amenity research_institute 0.301 United States us Americas Northern America
+columbia water center 2021-02-03 89099032 way Columbia Rd 44, Tide Water, Columbia County, Arkansas, 71753, United States highway residential 0.3 United States us Americas Northern America
+methodist hospital 2021-02-03 170349304 way Methodist Hospital, 2301, South Broad Street, South Philadelphia, Philadelphia, Philadelphia County, Pennsylvania, 19145, United States amenity hospital 0.341913844040538 United States us Americas Northern America
+cso 2021-02-03 5565914 node Caltech Submillimeter Observatory, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States man_made telescope 0.362945678183792 United States us Americas Northern America
+mothers against drunk driving 2021-02-03 55217955 node Mothers Against Drunk Driving, Del Prado Boulevard South, Cape Coral, Lee County, Florida, 33990, United States office association 0.401 United States us Americas Northern America
+spect 2021-02-03 87269115 way Spect Court, Virginia Hills, Groveton, Fairfax County, Virginia, 22310, United States highway residential 0.2 United States us Americas Northern America
+us food and drug administration 2021-02-03 27293848 node US Food & Drug Administration, 5162, Valleypointe Parkway, Thornecrest, Roanoke County, Virginia, 24019, United States office government 0.401 United States us Americas Northern America
+university of texas marine science institute 2021-02-03 202308911 way University of Texas Marine Science Institute, 750, Channel View Drive, Port Aransas, Nueces County, Texas, 78373, United States amenity university 0.601 United States us Americas Northern America
+mote marine laboratory 2021-02-03 73893475 node Mote Marine Laboratory and Aquarium, 1600, Ken Thompson Parkway, Sarasota, Sarasota County, Florida, 34236, United States tourism museum 0.301 United States us Americas Northern America
+earth venture 2021-02-03 71060837 node Earth, Wood & Fire, 214, Mountain Road, Bagleys Venture, Lynchs Corner, Fallston, Harford County, Maryland, 21047, United States amenity restaurant 0.201 United States us Americas Northern America
+brenco 2021-02-03 82037986 node Brenco, Walton Street, Pine Gardens, Petersburg, Virginia, 23805, United States railway crossover 0.101 United States us Americas Northern America
+satori 2021-02-03 257593503 relation Story, Sheridan County, Wyoming, 82842, United States place locality 0.297085518539193 United States us Americas Northern America
+college board 2021-02-03 184461788 way College Board, Penn Street, Newtown Gate, Newtown Township, Bucks County, Pennsylvania, 189440, United States building yes 0.201 United States us Americas Northern America
+missile defense agency 2021-02-03 123924708 way Missile Defense Agency, 18th Street, Fort Belvoir South Post, Fort Belvoir, Fairfax County, Virginia, 22060, United States building yes 0.301 United States us Americas Northern America
+northern illinois university in dekalb 2021-02-03 192458528 way Northern Illinois University, Stadium Drive, DeKalb, DeKalb County, Illinois, 60115, United States amenity university 0.501 United States us Americas Northern America
+human rights watch 2021-02-03 58663937 node Human Rights Watch, 350 5th Ave, West 34th Street, Midtown South, Manhattan Community Board 5, Manhattan, New York County, New York, 10118, United States office ngo 0.301 United States us Americas Northern America
+george mason university 2021-02-03 170416369 way George Mason University, Cleveland Street, Maple Hills, Halemhurst, Fairfax, Fairfax (city), Virginia, 22030, United States amenity university 0.804705676188448 United States us Americas Northern America
+marriott harrison 2021-02-03 210483963 way Marriott Renaissance, Hutchinson River Parkway, Town of Harrison, New York, 10577, United States tourism hotel 0.201 United States us Americas Northern America
+northern arizona university 2021-02-03 138822770 way Northern Arizona University, South Beaver Street, Flagstaff Normal Addition, Flagstaff, Coconino County, Arizona, 86001, United States amenity university 0.751100009026849 United States us Americas Northern America
+medline 2021-02-03 207638209 way Medline, 1900, Meadowville Technology Parkway, Meadowville, Chesterfield County, Virginia, 23836, United States building yes 0.101 United States us Americas Northern America
+star program 2021-02-03 254478022 way North Star, Program Way, Larimer County, Colorado, United States building cabin 0.201 United States us Americas Northern America
+hughes 2021-02-03 258255449 relation Hughes County, South Dakota, 57501, United States boundary administrative 0.571820093574305 United States us Americas Northern America
+fox news 2021-02-03 64775737 node Fox News, Terminal C, Grapevine, Tarrant County, Texas, 75261, United States shop convenience 0.201 United States us Americas Northern America
+texas children's hospital 2021-02-03 50694412 node Texas Children's Hospital, 6621, Fannin Street, Texas Medical Center, Houston, Harris County, Texas, 77030, United States amenity hospital 0.699521898980972 United States us Americas Northern America
+state for energy 2021-02-03 123397480 way United States District Court for Western District of Oklahoma, The Underground, Bank of Oklahoma Plaza, Central Business District, Oklahoma City, Oklahoma County, Oklahoma, 73104:73106, United States amenity courthouse 0.201 United States us Americas Northern America
+smithsonian conservation biology institute 2021-02-03 259518942 relation Smithsonian Conservation Biology Institute, Front Royal, Warren County, Virginia, United States boundary national_park 0.734080577887678 United States us Americas Northern America
+langone medical center 2021-02-03 125494622 way NYU Langone Medical Center, East 30th Street, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10016, United States amenity hospital 0.653159798268413 United States us Americas Northern America
+princeton 2021-02-03 258098921 relation Princeton, Mercer County, New Jersey, United States boundary administrative 0.6656381585396 United States us Americas Northern America
+iowa 2021-02-03 258149110 relation Iowa, United States boundary administrative 0.821883953901863 United States us Americas Northern America
+folsom state prison 2021-02-03 102683947 way Folsom State Prison, Johnny Cash Trail, Folsom, Sacramento County, California, 95630, United States amenity prison 0.680889254526519 United States us Americas Northern America
+federal express 2021-02-03 233799488 way Federal Express, Santa Fe, Santa Fe County, New Mexico, United States landuse industrial 0.4 United States us Americas Northern America
+kellys 2021-02-03 239282811 way The Kelly's, Edina, Hennepin County, Minnesota, United States landuse residential 0.2 United States us Americas Northern America
+pgc 2021-02-03 220208091 way Grant County Airport, Fish Hatchery Road, Grant County, West Virginia, 26847, United States aeroway aerodrome 0.110430435186894 United States us Americas Northern America
+new hampshire 2021-02-03 257734907 relation New Hampshire, United States boundary administrative 0.892788681067394 United States us Americas Northern America
+aaa 2021-02-03 159632298 way AAA, 650, 2nd Street West, Sonoma, Sonoma County, California, 95476, United States office insurance 0.5584454244094 United States us Americas Northern America
+wisc-tv 2021-02-03 2318577 node WISC-TV (Madison), Daytona Beach Drive, Madison, Dane County, Wisconsin, 53711, United States man_made tower 0.201 United States us Americas Northern America
+amgen 2021-02-03 178550546 way Amgen, Thousand Oaks, Ventura County, California, United States landuse industrial 0.3 United States us Americas Northern America
+stanford school of medicine 2021-02-03 13364304 node Stanford School Of Medicine, D Street, Menlo Park, San Mateo County, California, 94025, United States amenity university 0.401 United States us Americas Northern America
+kellogg biological station 2021-02-03 2299744 node Kellogg Biological Preserve, Emmett Charter Township, Calhoun County, Michigan, 49014, United States leisure park 0.35 United States us Americas Northern America
+wayne state university 2021-02-03 259372324 relation Wayne State University, Commonwealth Street, Woodbridge, Midtown, Detroit, Wayne County, Michigan, 48208, United States amenity university 0.805217009868445 United States us Americas Northern America
+eec 2021-02-03 92923719 way Swanzy Lake Rd, Swanzy, Forsyth Township, Marquette County, Michigan, 49841, United States highway residential 0.1 United States us Americas Northern America
+university of athens 2021-02-03 259130044 relation University of Georgia, East Green Street, Athens-Clarke County Unified Government, Athens-Clarke County, Georgia, 30602, United States amenity university 0.854309471737941 United States us Americas Northern America
+research on research institute 2021-02-03 175713833 way Buck Institute for Research on Aging, 8001, Redwood Boulevard, Novato, Marin County, California, 94945, United States place house 0.712019878936673 United States us Americas Northern America
+university of massachusetts amherst 2021-02-03 259199097 relation University of Massachusetts Amherst, Kendrick Place, Amherst, Hampshire County, Massachusetts, 01004, United States amenity university 0.91421857649354 United States us Americas Northern America
+mcgovern institute for brain research 2021-02-03 488056 node McGovern Institute for Brain Research (MIT), 43, Vassar Street, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States amenity research_institute 0.810037958989748 United States us Americas Northern America
+kansas 2021-02-03 257791284 relation Kansas, United States boundary administrative 0.816541831442553 United States us Americas Northern America
+armstrong 2021-02-03 258347195 relation Armstrong County, Texas, 79019, United States boundary administrative 0.653833128209837 United States us Americas Northern America
+pacific institute 2021-02-03 160911248 way Mid-Pacific Institute, Kaaka Place, Lower MÄ<81>noa, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States amenity school 0.469299555080491 United States us Americas Northern America
+hall 2021-02-03 258640088 relation Hall County, Texas, United States boundary administrative 0.654110162810059 United States us Americas Northern America
+stockton university 2021-02-03 95943679 way Stockton University, Garden State Parkway, Clarks Mill, Galloway Township, Atlantic County, New Jersey, 08241, United States amenity university 0.563793454953531 United States us Americas Northern America
+smithsonian institution 2021-02-03 107528703 way National Museum of Natural History, Smithsonian Pollinator Garden Path, Penn Quarter, Washington, District of Columbia, 20560, United States tourism museum 0.592769930727231 United States us Americas Northern America
+thermo fisher scientific 2021-02-03 192725475 way Thermo-Fisher Scientific, Northeast Hillsboro, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, United States landuse industrial 0.5 United States us Americas Northern America
+us drug enforcement agency 2021-02-03 183416479 way US Drug Enforcement Agency, World Communications Drive, Omaha, Douglas County, Nebraska, 68122, United States building yes 0.401 United States us Americas Northern America
+jila 2021-02-03 96516634 way Joint Institute for Lab Astrophysics, 1900, Colorado Avenue, The Hill, Boulder, Boulder County, Colorado, 80309, United States building university 0.326239076957718 United States us Americas Northern America
+ecosystem services 2021-02-03 80480832 node Ecosystem Services, Group Meeting Area, Palo Alto, Santa Clara County, California, 94303, United States tourism information 0.201 United States us Americas Northern America
+office of the united states trade representative 2021-02-03 106912217 way Office of the United States Trade Representative, 600, 17th Street Northwest, Washington, District of Columbia, 20006, United States office government 0.819931111449548 United States us Americas Northern America
+boise state university 2021-02-03 187946735 way Boise State University, South Broadway Avenue, Boise, Ada County, Idaho, 83735, United States amenity university 0.744647217327514 United States us Americas Northern America
+children's medical center 2021-02-03 96926132 way Children's Medical Center of Dallas, 1935, Medical District Drive, Dallas, TX, Dallas, Dallas County, Texas, 75235, United States amenity hospital 0.581472839091896 United States us Americas Northern America
+labcorp 2021-02-03 209061591 way LabCorp, Burlington, Alamance County, North Carolina, United States highway residential 0.2 United States us Americas Northern America
+rutgers 2021-02-03 246008043 way Rutgers, Cherry Street, Two Bridges, Manhattan Community Board 3, Manhattan, New York County, New York, 10002, United States building yes 0.101 United States us Americas Northern America
+us national academy of medicine 2021-02-03 101801329 way Academy of Medicine, 7th Street Northeast, Atlanta, Fulton County, Georgia, 30308, United States amenity school 0.428160971568546 United States us Americas Northern America
+university of massachusetts lowell 2021-02-03 259071002 relation University of Massachusetts Lowell, Central Street, The Acre, Lowell, Middlesex County, Massachusetts, 01852-9998, United States amenity university 0.812219348874805 United States us Americas Northern America
+universities 2021-02-03 58939938 node Universities, Troost Avenue, Kansas City, Jackson County, Missouri, 64131, United States highway bus_stop 0.101 United States us Americas Northern America
+us national institute of standards and technology 2021-02-03 103001988 way National Institute of Standards and Technology, Montgomery County, Maryland, 20899, United States landuse industrial 0.8 United States us Americas Northern America
+exelon 2021-02-03 158115010 way Exelon, Winfield Road, Warrenville, DuPage County, Illinois, 60563, United States office company 0.101 United States us Americas Northern America
+pioneer hi-bred international 2021-02-03 259591250 relation Pioneer Hi-Bred International Inc., 19456, Victory Drive, Southhaven, Mankato, Blue Earth County, Minnesota, 56001, United States building commercial 0.401 United States us Americas Northern America
+memorial sloan-kettering cancer center 2021-02-03 210339215 way Memorial Sloan Kettering Cancer Center, 1275, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States amenity hospital 0.894052338771708 United States us Americas Northern America
+sfb 2021-02-03 146097502 way Orlando Sanford International Airport, Summerlin Avenue, Wynwood, Sanford, Seminole County, Florida, 32773, United States aeroway aerodrome 0.402243537687533 United States us Americas Northern America
+kingsbrook jewish medical center 2021-02-03 209315997 way Kingsbrook Jewish Medical Center, 585, Schenectady Avenue, East Flatbush, Brooklyn, Kings County, New York, 11203, United States amenity hospital 0.653363019766637 United States us Americas Northern America
+new democratic party 2021-02-03 229030677 way Democratic Party, 46, South Main Street, Marshall, Madison County, North Carolina, 28753, United States office political_party 0.201 United States us Americas Northern America
+vocs 2021-02-03 302296009 node Voc's Westside Pizza, 273, West Main Street, Thamesville, Norwich, New London County, Connecticut, 06360, United States amenity restaurant 0.001 United States us Americas Northern America
+university of georgia 2021-02-03 259130044 relation University of Georgia, East Green Street, Athens-Clarke County Unified Government, Athens-Clarke County, Georgia, 30602, United States amenity university 0.854309471737941 United States us Americas Northern America
+tufts university school of medicine 2021-02-03 69247818 node Tufts University School of Medicine, 136, Harrison Avenue, Chinatown, Financial District, Boston, Suffolk County, Massachusetts, 02111, United States amenity college 0.835161875786798 United States us Americas Northern America
+usfws 2021-02-03 126924258 way USFWS, Gallatin County, Montana, United States boundary protected_area 0.225 United States us Americas Northern America
+university of genoa 2021-02-03 208081496 way Cleary University, 3750, Cleary Drive, Howell, Livingston County, Michigan, 48843, United States building university 0.408817475555606 United States us Americas Northern America
+hubble 2021-02-03 417215 node Hubble, Lincoln County, Kentucky, United States place hamlet 0.307534521399027 United States us Americas Northern America
+georgia 2021-02-03 258375785 relation Georgia, United States boundary administrative 0.829577897122545 United States us Americas Northern America
+arc 2021-02-03 101560700 way Ames Research Center, Santa Clara County, California, 94035-0016, United States landuse industrial 0.567592905439716 United States us Americas Northern America
+university of utah 2021-02-03 149037043 way University of Utah, 201, Presidents Circle, Salt Lake City, Salt Lake County, Utah, 84112, United States amenity university 0.845769418466942 United States us Americas Northern America
+school of health professions 2021-02-03 216286733 way School of Health Professions, 9th Avenue South, Five Points South, Birmingham, Jefferson County, Alabama, 35294, United States building university 0.401 United States us Americas Northern America
+university of pittsburgh medical center 2021-02-03 258622513 relation University of Pittsburgh, Strip District, Pittsburgh, Allegheny County, Pennsylvania, United States amenity university 0.870726964523873 United States us Americas Northern America
+us census bureau 2021-02-03 64680847 node US Census Bureau, 32, Old Slip, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10005, United States office government 0.567719150556049 United States us Americas Northern America
+oklahoma state university 2021-02-03 140754357 way Oklahoma State University, North Jefferson Street, Downtown Stillwater, Stillwater, Payne County, Oklahoma, 74078, United States amenity university 0.764352569168409 United States us Americas Northern America
+calif 2021-02-03 258350986 relation California, United States boundary administrative 0.912136384157707 United States us Americas Northern America
+hudson institute 2021-02-03 3044001 node Hudson Institute, Quaker Ridge Road, Cortlandt, Westchester, New York, 10520, United States building yes 0.201 United States us Americas Northern America
+iridium 2021-02-03 69858803 node Iridium, 1330, North Milwaukee Avenue, Wicker Park, West Town, Chicago, Cook County, Illinois, 60622, United States shop clothes 0.101 United States us Americas Northern America
+depaul university 2021-02-03 95148601 way DePaul University, North Bissell Street, Lincoln Park, Chicago, Cook County, Illinois, 60614, United States amenity university 0.695671053119323 United States us Americas Northern America
+us ski and snowboard association 2021-02-03 253409560 way Nichols Ski and Snowboard, 21938, Michigan Avenue, Morley Area Residents Association, Dearborn, Wayne County, Michigan, 48124, United States shop sports 0.401 United States us Americas Northern America
+us government 2021-02-03 135061647 way US Government, Blaine County, Montana, United States boundary protected_area 0.325 United States us Americas Northern America
+phoenix medical school 2021-02-03 66777927 node Phoenix Medical, 176, Merrick Road, Lynbrook, Hempstead, Nassau County, New York, 11563, United States place house 0.201 United States us Americas Northern America
+congressional 2021-02-03 85947506 way Congressional, La Quinta, Riverside County, California, 92247, United States highway residential 0.2 United States us Americas Northern America
+florida state university 2021-02-03 121104541 way Florida State University, 600, West College Avenue, Tallahassee, Leon County, Florida, 32306-1058, United States amenity university 0.851225835831412 United States us Americas Northern America
+gsr 2021-02-03 123444071 way Graduate School & Research Building, Bosque Street, San Antonio, Bexar County, Texas, 78249-1620, United States building university 0.001 United States us Americas Northern America
+republican 2021-02-03 468223 node Republican, Bertie County, North Carolina, United States place hamlet 0.35 United States us Americas Northern America
+mount holyoke college 2021-02-03 96922935 way Mount Holyoke College, Ferry Street, South Hadley, Hampshire County, Massachusetts, 01075, United States amenity college 0.761796795268744 United States us Americas Northern America
+geneva university hospitals 2021-02-03 203412230 way University Hospitals Geneva Medical Center, 870, West Main Street, Geneva, Ashtabula County, Ohio, 44041, United States amenity hospital 0.301 United States us Americas Northern America
+fermilab 2021-02-03 99059145 way Fermi National Accelerator Laboratory, DuPage County, Illinois, United States landuse industrial 0.463054296170656 United States us Americas Northern America
+board of regents 2021-02-03 213673109 way Georgia Museum of Art, 90, Carlton Street, Athens-Clarke County Unified Government, Athens-Clarke County, Georgia, 30602, United States tourism museum 0.380014158487789 United States us Americas Northern America
+human health 2021-02-03 94919022 way Western Human Nutrition Research Center, West Health Sciences Drive, Yolo County, California, 95616-5270, United States building university 0.201 United States us Americas Northern America
+institute for advanced study 2021-02-03 96388432 way Institute for Advanced Study, Goldman Lane, Princeton, Mercer County, New Jersey, 08540, United States amenity university 0.9343793531708 United States us Americas Northern America
+north dakota 2021-02-03 258332531 relation North Dakota, United States boundary administrative 0.889102339362075 United States us Americas Northern America
+earth system research laboratory 2021-02-03 153944153 way NOAA - Earth System Research Laboratory, 325, Broadway, Boulder, Boulder County, Colorado, 80305, United States office government 0.401 United States us Americas Northern America
+animal and plant health inspection service 2021-02-03 27351108 node Animal & Plant Health Inspection Service, Concourse Drive, Thornecrest, Roanoke County, Virginia, 24017, United States office government 0.501 United States us Americas Northern America
+kibble 2021-02-03 2423509 node Kibble Hill, Monroe County, West Virginia, United States natural peak 0.4 United States us Americas Northern America
+harvey mudd college 2021-02-03 98492541 way Harvey Mudd College, East Foothill Boulevard, Claremont, Los Angeles County, California, 91711, United States amenity university 0.700782553145287 United States us Americas Northern America
+arkansas 2021-02-03 257460053 relation Arkansas, United States boundary administrative 0.804692261310712 United States us Americas Northern America
+purdue university 2021-02-03 107976847 way Purdue University, South River Road, West Lafayette, Tippecanoe County, Indiana, 47907, United States amenity university 0.759762689800642 United States us Americas Northern America
+columbus 2021-02-03 258190114 relation Columbus, Franklin, Ohio, United States boundary administrative 0.729439910682055 United States us Americas Northern America
+center for infectious disease research 2021-02-03 53565038 node Center for Infectious Disease Research, 307, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States office research 0.501 United States us Americas Northern America
+university of alaska anchorage 2021-02-03 230804355 way University of Alaska Anchorage, 3211, Providence Drive, Anchorage, Alaska, 99508, United States amenity university 0.795478606702112 United States us Americas Northern America
+miss 2021-02-03 258375642 relation Mississippi, United States boundary administrative 0.800391778545257 United States us Americas Northern America
+us environmental protection agency 2021-02-03 258100172 relation Environmental Protection Agency, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20004, United States office government 0.301 United States us Americas Northern America
+weill cornell medical college 2021-02-03 2627269 node Weill Cornell Medical College, 1300, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10128, United States amenity university 0.773868796445932 United States us Americas Northern America
+life sciences 2021-02-03 252383599 way Life Sciences, Suffolk County, New York, 11794-5252, United States highway footway 0.275 United States us Americas Northern America
+conservation biology 2021-02-03 259518942 relation Smithsonian Conservation Biology Institute, Front Royal, Warren County, Virginia, United States boundary national_park 0.534080577887678 United States us Americas Northern America
+rockefeller foundation 2021-02-03 302150637 node Rockefeller Foundation, 420, 5th Avenue, Midtown South, Manhattan Community Board 5, Manhattan, New York County, New York, 10035, United States office foundation 0.201 United States us Americas Northern America
+colgate university in hamilton 2021-02-03 172145457 way Colgate University, Campus Footpaths, Hamilton, Town of Hamilton, Madison County, New York, 13346, United States amenity university 0.777980138982284 United States us Americas Northern America
+curie institute 2021-02-03 62876393 node Marie Curie Institute of Engineering and Communication, Curie Lane, City of Amsterdam, Montgomery County, New York, United States amenity school 0.201 United States us Americas Northern America
+devon energy 2021-02-03 121803437 way Devon Energy, Central Business District, Oklahoma City, Oklahoma County, Oklahoma, United States landuse commercial 0.4 United States us Americas Northern America
+utah 2021-02-03 257844025 relation Utah, United States boundary administrative 0.803765430740067 United States us Americas Northern America
+chaco canyon 2021-02-03 90959436 way Chaco Canyon, Cedar Park, Williamson County, Texas, 78613, United States highway residential 0.3 United States us Americas Northern America
+national science board 2021-02-03 12578717 node NYU School of Medicine, 562, 1st Avenue, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10017-6927, United States amenity university 0.499286093607089 United States us Americas Northern America
+sanford underground research facility 2021-02-03 182033784 way 630, Sanford Underground Research Facility, Lead, Lawrence County, South Dakota, 57754, United States landuse industrial 0.6 United States us Americas Northern America
+rsc 2021-02-03 122940481 way RSC, Chambers Avenue, Eagle, Eagle County, Colorado, 81631, United States building yes 0.101 United States us Americas Northern America
+american statistical association 2021-02-03 144357197 way American Statistical Association, 732, North Washington Street, Jefferson Houston, Alexandria, Virginia, 22314, United States office foundation 0.301 United States us Americas Northern America
+awm 2021-02-03 3175077 node West Memphis Municipal Airport, South College Boulevard, West Memphis, Crittenden County, Arkansas, 72301, United States aeroway aerodrome 0.233228686818865 United States us Americas Northern America
+indian national trust 2021-02-03 102851004 way Woodbridge Conservation Trust (35 Indian Trail), Woodbridge, New Haven County, Connecticut, United States natural wood 0.4 United States us Americas Northern America
+brain institute 2021-02-03 157960992 way McKnight Brain Institute, 1149, Newell Drive, Gainesville, Alachua County, Florida, 32610, United States office research 0.528069876897978 United States us Americas Northern America
+university of parma 2021-02-03 207662730 way University Hospitals Parma Medical Center, 7007, Powers Boulevard, Cleveland, Cuyahoga County, Ohio, 44129, United States amenity hospital 0.201 United States us Americas Northern America
+minnesota department of natural resources 2021-02-03 79363327 node Minnesota Department of Natural Resources, County Road 21, Jameson, Ranier, Koochiching County, Minnesota, 56649, United States office government 0.501 United States us Americas Northern America
+columbia university medical center 2021-02-03 235180475 way Columbia University, Reunion Plaza, Morningside Heights, Manhattan Community Board 9, Manhattan, New York County, New York, United States amenity university 0.872550278643288 United States us Americas Northern America
+sta 2021-02-03 257939822 relation Stark County, Ohio, United States boundary administrative 0.622815857577427 United States us Americas Northern America
+lafayette college 2021-02-03 259082367 relation Lafayette College, 730, High Street, College Hill, Easton, Northampton County, Pennsylvania, 18042, United States amenity university 0.659772446157665 United States us Americas Northern America
+campbell 2021-02-03 259236537 relation Campbell, Santa Clara County, California, 95008, United States boundary administrative 0.580261160940683 United States us Americas Northern America
+spacex falcon 2021-02-03 207518194 way Falcon 9 Booster B1019, Jack Northrop Avenue, Hawthorne, Los Angeles County, California, 90250-4638, United States tourism attraction 0.101 United States us Americas Northern America
+albert einstein college of medicine 2021-02-03 203373692 way Albert Einstein College of Medicine, Rhinelander Avenue, The Bronx, Bronx County, New York, 10461, United States amenity college 0.91305789785603 United States us Americas Northern America
+u.s. 2021-02-03 158313324 way U.S., State Highway 55, Sunny Waters, Town of Wolf River, Langlade County, Wisconsin, 54462, United States amenity fuel 0.201 United States us Americas Northern America
+baystate medical center 2021-02-03 198191111 way Baystate Medical Center, 759, Chestnut Street, North End, Springfield, Hampden County, Massachusetts, 01199, United States amenity hospital 0.528876356713622 United States us Americas Northern America
+ibm thomas j. watson research center 2021-02-03 110787015 way IBM Yorktown research lab, Adams Road, Town of New Castle, Town of Yorktown, Westchester, New York, 10562, United States office research 0.201 United States us Americas Northern America
+massachusetts institute of technology 2021-02-03 258016252 relation Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States amenity university 1.04674262776464 United States us Americas Northern America
+yerkes national primate research center 2021-02-03 3028732 node Yerkes Primate Research Center, Gatewood Road Northeast, Druid Hills, DeKalb County, Georgia, 30329, United States building yes 0.401 United States us Americas Northern America
+los angeles county superior court 2021-02-03 19959088 node Los Angeles County Superior Court, South Commonwealth Avenue, Westlake, Los Angeles, Los Angeles County, California, 90005, United States amenity courthouse 0.501 United States us Americas Northern America
+associated press 2021-02-03 152093424 way Associated Press, 1299, Broadway, Bushwick, Brooklyn, Kings County, New York, 11221, United States shop supermarket 0.201 United States us Americas Northern America
+general mills 2021-02-03 254985713 way General Mills, Great Falls, Cascade County, Montana, United States landuse industrial 0.4 United States us Americas Northern America
+institute of international education 2021-02-03 2555719 node Institute of International Education, 809, 1st Avenue, Tudor City, Manhattan Community Board 6, Manhattan, New York County, New York, 10017, United States place house 0.401 United States us Americas Northern America
+american university 2021-02-03 99772807 way American University, 4400, Massachusetts Avenue Northwest, Cathedral Heights, Washington, District of Columbia, 20016, United States amenity university 0.717014338477232 United States us Americas Northern America
+johns hopkins bloomberg school of public health 2021-02-03 258664201 relation Johns Hopkins Bloomberg School of Public Health, McElderry Street, Butchers Hill, Baltimore, Maryland, 21205, United States building yes 1.06277471441433 United States us Americas Northern America
+university of houston 2021-02-03 154516059 way University of Houston, 4800, Calhoun Road, Houston, Harris County, Texas, 77004, United States amenity university 0.831411414196818 United States us Americas Northern America
+kansas state university 2021-02-03 258613534 relation Kansas State University, College Avenue, Manhattan, Riley County, Kansas, 66506â€<90>1600, United States amenity university 0.807972174654867 United States us Americas Northern America
+office of technology assessment 2021-02-03 65556891 node Research, Technology & Assessment, 1001, East Wooster Street, Bentwood Estates, Bowling Green, Wood County, Ohio, 43403, United States office educational_institution 0.201 United States us Americas Northern America
+international union 2021-02-03 123308556 way Newark Liberty International Airport, Basilone Road, Elizabeth, Union County, New Jersey, 07114, United States aeroway aerodrome 0.707744508540787 United States us Americas Northern America
+trump 2021-02-03 445769 node Trump, Baltimore County, Maryland, 21161, United States place hamlet 0.375244632729739 United States us Americas Northern America
+seton hall university 2021-02-03 98909108 way Seton Hall University, Seton Drive, South Orange, Essex County, New Jersey, 61, United States amenity university 0.774893814120778 United States us Americas Northern America
+department of health and human services 2021-02-03 197997224 way Department of Health and Human Services, 242, State Street, Augusta, Kennebec County, Maine, 04330, United States building yes 0.601 United States us Americas Northern America
+ksu 2021-02-03 134730614 way Kent State University, Health Center Drive, Kent, Portage County, Ohio, 44242-0001, United States amenity university 0.481992451472996 United States us Americas Northern America
+triceratops 2021-02-03 7673484 node Triceratops, 940, Skyline Drive, Rapid City, Pennington County, South Dakota, 57702-8170, United States tourism artwork 0.101 United States us Americas Northern America
+federation of american societies 2021-02-03 154221123 way FGAS Cultural Center, 150, Spencerport Road, Rochester, Gates, Monroe County, New York, 14606, United States building house 0.001 United States us Americas Northern America
+pandora 2021-02-03 258361127 relation Pandora, Putnam County, Ohio, 45877, United States boundary administrative 0.41689306175332 United States us Americas Northern America
+virginia commonwealth university 2021-02-03 151896182 way Virginia Commonwealth University, South Harrison Street, Oregon Hill, Richmond, Virginia, 23220, United States amenity university 0.782362468990463 United States us Americas Northern America
+national academy of sciences 2021-02-03 106787905 way National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States office ngo 1.00593943258948 United States us Americas Northern America
+cedars-sinai medical center 2021-02-03 205008828 way Cedars-Sinai Medical Center, 8700, Beverly Boulevard, Beverly Grove, Los Angeles, Los Angeles County, California, 90048, United States amenity hospital 0.820535495325755 United States us Americas Northern America
+ieee 2021-02-03 258920692 relation IEEE, 445, Hoes Lane, Piscataway Township, Middlesex County, New Jersey, 08854, United States building yes 0.101 United States us Americas Northern America
+melinda gates foundation 2021-02-03 177964409 way Bill & Melinda Gates Foundation, 500, 5th Avenue North, Lower Queen Anne, Belltown, Seattle, King County, Washington, 98109, United States office foundation 0.733000783214492 United States us Americas Northern America
+american institute of physics 2021-02-03 210348591 way American Institute of Physics, 500, Sunnyside Boulevard, Oyster Bay, Nassau County, New York, 11797, United States building university 0.401 United States us Americas Northern America
+mary lyon centre 2021-02-03 684057 node Mary Lyon, 50, Beechcroft Street, Faneuil, Brighton, Boston, Suffolk County, Massachusetts, 02135, United States amenity school 0.201 United States us Americas Northern America
+manoa 2021-02-03 7215417 node Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States place suburb 0.412408728172101 United States us Americas Northern America
+institute for advanced study in princeton 2021-02-03 96388432 way Institute for Advanced Study, Goldman Lane, Princeton, Mercer County, New Jersey, 08540, United States amenity university 1.1343793531708 United States us Americas Northern America
+illinois state university 2021-02-03 259445049 relation Illinois State University, North Main Street, Normal, McLean County, Illinois, 61761, United States amenity university 0.301 United States us Americas Northern America
+neptune 2021-02-03 22534659 node Neptune, Neptune Township, Monmouth County, New Jersey, 07753, United States place town 0.4 United States us Americas Northern America
+myriad genetics 2021-02-03 99496081 way Myriad Genetics, Wakara Way, Research Park, Salt Lake City, Salt Lake County, Utah, 84113, United States building yes 0.201 United States us Americas Northern America
+cmu 2021-02-03 258357673 relation Carnegie Mellon University, Warwick Terrace, Squirrel Hill North, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States amenity university 0.561734322664205 United States us Americas Northern America
+mcdonald 2021-02-03 258498766 relation McDonald County, Missouri, United States boundary administrative 0.61392452822884 United States us Americas Northern America
+university of california irvine 2021-02-03 99651593 way University of California, Irvine, Mesa View Drive, Newport Beach, Orange County, California, 92617-5135, United States amenity university 0.932750585799837 United States us Americas Northern America
+virginia 2021-02-03 257877023 relation Virginia, United States boundary administrative 0.837428557079075 United States us Americas Northern America
+stennis space center 2021-02-03 225894763 way John C. Stennis Space Center, Hancock County, Mississippi, 39529, United States amenity research_institute 0.720736361552565 United States us Americas Northern America
+time 2021-02-03 258313454 relation Time, Pike County, Illinois, United States boundary administrative 0.524684773212593 United States us Americas Northern America
+louisiana state university 2021-02-03 100338394 way Louisiana State University, West Lakeshore Drive, College Town, Baton Rouge, East Baton Rouge Parish, Louisiana, 70802, United States amenity university 0.850358843721885 United States us Americas Northern America
+yale university in new haven 2021-02-03 258788418 relation Yale University, West Haven, New Haven County, Connecticut, 06516, United States amenity university 1.05963616015799 United States us Americas Northern America
+ancestry.com 2021-02-03 183450633 way Ancestry.com, Carterville Trail, Riverbottoms, Provo, Utah County, Utah, 84604, United States building commercial 0.201 United States us Americas Northern America
+swarthmore college 2021-02-03 258051478 relation Swarthmore College, 500, College Avenue, Swarthmore, Delaware County, Pennsylvania, 19081, United States amenity university 0.691042593901044 United States us Americas Northern America
+california academy of sciences 2021-02-03 97642823 way California Academy of Sciences, 55, Music Concourse Drive, San Francisco, San Francisco City and County, California, 94118, United States tourism museum 0.401 United States us Americas Northern America
+alaska department of natural resources 2021-02-03 29679173 node Vitus Lake Cabin, Yakutat, Alaska, United States tourism wilderness_hut 0.101 United States us Americas Northern America
+penn state university 2021-02-03 258601905 relation Penn State University, Mount Nittany Expressway, Houserville, College Township, Centre County, Pennsylvania, 16802-2604, United States amenity university 0.862656889872636 United States us Americas Northern America
+university of connecticut 2021-02-03 150779544 way University of Connecticut, Middle Turnpike, Mansfield Four Corners, Mansfield, Tolland County, Connecticut, 06269, United States amenity university 0.845434458950227 United States us Americas Northern America
+university of california, santa cruz 2021-02-03 75590962 node University of California, Santa Cruz, Coolidge Drive, Santa Cruz, Santa Cruz County, California, 95064, United States tourism information 0.501 United States us Americas Northern America
+sharp 2021-02-03 258286474 relation Sharp County, Arkansas, United States boundary administrative 0.596809881048835 United States us Americas Northern America
+national weather service 2021-02-03 226762473 way National Weather Service, Valley, Douglas County, Nebraska, United States landuse commercial 0.5 United States us Americas Northern America
+mount sinai medical center 2021-02-03 167167559 way Mount Sinai Medical Center, 4300, Alton Road, Miami Beach, Miami-Dade County, Florida, 33140, United States amenity hospital 0.633228686818865 United States us Americas Northern America
+utah state university 2021-02-03 258918205 relation Utah State University, Bullen Hall, Logan, Cache County, Utah, 84341, United States amenity university 0.779183015674592 United States us Americas Northern America
+joslin diabetes center 2021-02-03 147408996 way Joslin Diabetes Center, 1, Joslin Place, Boston, Suffolk County, Massachusetts, 02215, United States amenity clinic 0.557277503353622 United States us Americas Northern America
+silver spring networks 2021-02-03 138261973 way Silver Spring Networks, 230, West Tasman Drive, San Jose, Santa Clara County, California, 95134-1358, United States building office 0.301 United States us Americas Northern America
+ellis 2021-02-03 258432178 relation Ellis County, Texas, United States boundary administrative 0.657733133901671 United States us Americas Northern America
+plasma science and fusion center 2021-02-03 98018371 way Plasma Fusion & Science Ctr, 167, Albany Street, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States building university 0.301 United States us Americas Northern America
+review committee 2021-02-03 65256602 node JLARC - Joint Legislative Audit and Review Committee, 11th Avenue Southwest, Olympia, Thurston County, Washington, 98504, United States office research 0.201 United States us Americas Northern America
+office of management and budget 2021-02-03 152300809 way Office of Management and Budget, 254, Calle Cruz, La Perla, San Juan Antiguo, San Juan, Puerto Rico, 00901, United States office government 0.501 United States us Americas Northern America
+decc 2021-02-03 129379664 way Duluth Entertainment Convention Center, Railroad Street, Duluth, Saint Louis County, Minnesota, 55802, United States building yes 0.317609725634953 United States us Americas Northern America
+mo 2021-02-03 258150217 relation Missouri, United States boundary administrative 0.73288134470033 United States us Americas Northern America
+university of mississippi 2021-02-03 99276437 way University of Mississippi, Rebel Drive, University, Lafayette County, Mississippi, 38677, United States amenity university 0.811795442599009 United States us Americas Northern America
+national air and space museum 2021-02-03 106698268 way National Air and Space Museum, 655, Jefferson Drive Southwest, Washington, District of Columbia, 20560, United States tourism museum 0.942899315724623 United States us Americas Northern America
+center for research 2021-02-03 100783959 way National Center for Atmospheric Research Mesa Lab, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States building government 0.691849073716688 United States us Americas Northern America
+california academy of science 2021-02-03 196077698 way California Academy of Mathematics and Science, 1000, East Victoria Street, Carson, Los Angeles County, California, 90747, United States amenity school 0.401 United States us Americas Northern America
+keystone 2021-02-03 257787992 relation Keystone, Benton County, Iowa, 52249, United States boundary administrative 0.534676120369013 United States us Americas Northern America
+uprm 2021-02-03 203932623 way UPRM Solar house project, Paseo Magas, Miradero, Mayagüez, Puerto Rico, 00680, United States building house 0.101 United States us Americas Northern America
+rochelle diamond 2021-02-03 26235794 node Rochelle Diamond Lodge, 215, North 9th Street, Rochelle, Ogle County, Illinois, 61068, United States tourism motel 0.201 United States us Americas Northern America
+oak ridge national laboratory 2021-02-03 162828025 way Oak Ridge National Laboratory, Oak Ridge, Roane County, Tennessee, United States landuse industrial 0.6 United States us Americas Northern America
+kenyon college 2021-02-03 174692957 way Kenyon College, Gambier Road, Gambier, College Township, Knox County, Ohio, 43022, United States amenity college 0.640956111033812 United States us Americas Northern America
+woods hole 2021-02-03 489384 node Woods Hole, Falmouth, Barnstable County, Massachusetts, 02543, United States place village 0.599945269937336 United States us Americas Northern America
+rhic 2021-02-03 100399334 way Renaissance Circle, Brookhaven National Laboratory, Suffolk County, New York, United States highway residential 0.392697726015046 United States us Americas Northern America
+cornell university library 2021-02-03 259012417 relation Johnson Museum of Art, 114, Central Avenue, Ithaca, Ithaca Town, Tompkins County, New York, 14853, United States tourism museum 0.378680902821112 United States us Americas Northern America
+us government accountability office 2021-02-03 103419777 way Government Accountability Office, 441, G Street Northwest, Penn Quarter, Washington, District of Columbia, 20548, United States building house 0.435420222661424 United States us Americas Northern America
+rocky mountain institute 2021-02-03 67076208 node Rocky Mountain Institute/RMI, 2490, Junction Place, Boulder Junction, Boulder, Boulder County, Colorado, 80301, United States office association 0.301 United States us Americas Northern America
+university of california in berkeley 2021-02-03 258416614 relation University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States amenity university 1.0481943782617 United States us Americas Northern America
+binghamton university 2021-02-03 217349557 way Binghamton University Nature Preserve, Vestal Town, Broome County, New York, United States leisure park 0.35 United States us Americas Northern America
+bloom 2021-02-03 366194 node Bloom, Ford County, Kansas, United States place village 0.41356076917903 United States us Americas Northern America
+bigelow aerospace 2021-02-03 161499859 way Bigelow Aerospace, LLC, 1899, West Brooks Avenue, North Las Vegas, Clark County, Nevada, 89032, United States man_made works 0.60124284206117 United States us Americas Northern America
+rti international 2021-02-03 161347827 way RTI International, Durham County, North Carolina, United States landuse commercial 0.4 United States us Americas Northern America
+ann & robert h. lurie children's hospital of chicago 2021-02-03 102467870 way Ann & Robert H. Lurie Children's Hospital, 225, East Chicago Avenue, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States amenity hospital 1.04352463088163 United States us Americas Northern America
+colorado state university 2021-02-03 259127396 relation Colorado State University, Spring Park Drive, Fort Collins, Larimer County, Colorado, 80525-1424, United States amenity university 0.794853132594755 United States us Americas Northern America
+state department 2021-02-03 69248957 node C Street & 20th Street Northwest (State Department), C Street Northwest, Washington, District of Columbia, 20037, United States highway bus_stop 0.201 United States us Americas Northern America
+vandenberg air force base 2021-02-03 121001923 way Vandenberg Air Force Base, 13th Street, Vandenberg AFB, Santa Barbara County, California, 93437, United States aeroway aerodrome 0.885549616017841 United States us Americas Northern America
+lockheed 2021-02-03 87602610 way Lockheed, Willow Park, Parker County, Texas, United States highway residential 0.2 United States us Americas Northern America
+electric power research institute 2021-02-03 236587227 way Electric Power Research Institute, Corridor Park Boulevard, Knox County, Tennessee, 37932, United States office research 0.401 United States us Americas Northern America
+twitter 2021-02-03 18817852 node Twitter, 1355, Market Street, Civic Center, San Francisco, San Francisco City and County, California, 94102, United States office company 0.798653680040316 United States us Americas Northern America
+institute for systems biology 2021-02-03 73935850 node Institute for Systems Biology, 401, Terry Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109-5210, United States office association 0.401 United States us Americas Northern America
+united states food and drug administration 2021-02-03 161684229 way Food and Drug Administration, San Juan Antiguo, San Juan, Puerto Rico, United States landuse industrial 0.8 United States us Americas Northern America
+boston marathon 2021-02-03 80407008 node Boston Marathon Memorial, Boylston Street, Newbury Street, Back Bay, Boston, Suffolk County, Massachusetts, 02116, United States historic memorial 0.656343487668219 United States us Americas Northern America
+tulane university 2021-02-03 97823120 way Tulane University, South Claiborne Avenue, Broadmoor, Uptown, New Orleans, Orleans Parish, Louisiana, 70118, United States amenity university 0.72920861071119 United States us Americas Northern America
+rocky mountain laboratories 2021-02-03 214062263 way Rocky Mountain Laboratories, Leisure Village, Hamilton, Ravalli County, Montana, United States landuse commercial 0.5 United States us Americas Northern America
+university of texas 2021-02-03 175807465 way Sam Rayburn Museum, West 5th Street, Bonham, Fannin County, Texas, 75418, United States tourism museum 0.101 United States us Americas Northern America
+office of research and development 2021-02-03 174203885 way Office of Research and Development, Basil Street, Mobile, Mobile County, Alabama, 36603, United States building college 0.501 United States us Americas Northern America
+ames research center 2021-02-03 101560700 way Ames Research Center, Santa Clara County, California, 94035-0016, United States landuse industrial 0.767592905439716 United States us Americas Northern America
+king kong 2021-02-03 89019482 way King Kong, Bexar County, Texas, 78236, United States highway residential 0.3 United States us Americas Northern America
+magdalena ridge observatory 2021-02-03 210665019 way Magdalena Ridge Observatory 2.4 m Telescope, Water Canyon Road, Socorro County, New Mexico, United States man_made telescope 0.301 United States us Americas Northern America
+vi-systems 2021-02-03 173136088 way Systems, Berry Street, South Beach, San Francisco, San Francisco City and County, California, 94158, United States tourism artwork 0.101 United States us Americas Northern America
+massachusetts institute of technology in cambridge 2021-02-03 258016252 relation Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States amenity university 1.24674262776464 United States us Americas Northern America
+sky news 2021-02-03 42369599 node Blue Sky Cafe, Covered Walkway, Newport News, Virginia, 23602, United States amenity restaurant 0.201 United States us Americas Northern America
+university of new hampshire 2021-02-03 97073744 way University of New Hampshire, Main Street, Durham, Strafford County, New Hampshire, 03824, United States amenity university 0.874977044922586 United States us Americas Northern America
+dora 2021-02-03 258379011 relation Dora, Walker County, Alabama, 35038, United States boundary administrative 0.525494508146147 United States us Americas Northern America
+xcor 2021-02-03 296995407 way Xcor Aerospace, Earhart Drive, Midland Spaceport Business Park, Midland, Midland County, Texas, United States aeroway hangar 0.101 United States us Americas Northern America
+harvard 2021-02-03 258370425 relation Harvard University, Kingsley Street, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134-1420, United States amenity university 0.877190722653673 United States us Americas Northern America
+oregon national primate research center 2021-02-03 210428336 way Oregon National Primate Research Center, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, United States landuse commercial 0.7 United States us Americas Northern America
+museum of natural history 2021-02-03 2968697 node Museum of Natural History, 17, North Clinton Street, Iowa City, Johnson County, Iowa, 52245, United States tourism museum 0.659145294756841 United States us Americas Northern America
+national nuclear laboratory 2021-02-03 3063674 node Vallecitos Nuclear Center, Vallecitos Road, Alameda County, California, 94586, United States building yes 0.469114061872155 United States us Americas Northern America
+humboldt university 2021-02-03 209573488 way William Howard Taft Road, University Village Business District, Mount Auburn, Cincinnati, Hamilton County, Ohio, 45219, United States highway secondary 0.2 United States us Americas Northern America
+center for astrophysics 2021-02-03 257732815 relation Center for Astrophysics, 60, Observatory Access Road, Old Cambridge, Cambridge, Middlesex County, Massachusetts, 02138-2706, United States building university 0.301 United States us Americas Northern America
+johns hopkins 2021-02-03 70591573 node John's Hopkins, 2112, Dundalk Avenue, Norwood Park, Dundalk, Baltimore County, Maryland, 21222:21224, United States amenity doctors 0.101 United States us Americas Northern America
+amo 2021-02-03 258145410 relation Amo, Hendricks County, Indiana, 46103, United States boundary administrative 0.415802194348805 United States us Americas Northern America
+saint anselm college 2021-02-03 255793083 way Saint Anselm College, Eaton Road, Pinardville, Goffstown, Hillsborough County, New Hampshire, 03102, United States amenity university 0.301 United States us Americas Northern America
+la jolla institute for immunology 2021-02-03 149701516 way La Jolla Institute for Allergy and Immunology, Athena Circle, Science Research Park, University City, San Diego, San Diego County, California, 92039, United States building university 0.501 United States us Americas Northern America
+cleveland biolabs 2021-02-03 192431632 way Cleveland BioLabs, North Oak Street, Buffalo Niagara Medical Campus, Buffalo, Erie County, New York, 14209, United States building yes 0.201 United States us Americas Northern America
+'america first 2021-02-03 172127774 way Bank of America Financial Center, 100, North Tryon Street, First Ward, 1st Ward, Charlotte, Mecklenburg County, North Carolina, 28202, United States amenity bank 0.562086077089553 United States us Americas Northern America
+jpl 2021-02-03 178071948 way Jet Propulsion Laboratory, 4800, Oak Grove Drive, Pasadena, Los Angeles County, California, 91109, United States office research 0.697556545369086 United States us Americas Northern America
+abbott laboratories 2021-02-03 214402852 way Abbott Laboratories, North Chicago, Lake County, Illinois, United States landuse industrial 0.660548150210851 United States us Americas Northern America
+stanford 2021-02-03 258528651 relation Stanford, Palo Alto, Santa Clara County, California, United States boundary census 0.627221804640549 United States us Americas Northern America
+natural history museum of utah 2021-02-03 126656490 way Natural History Museum Of Utah, 301, Wakara Way, Research Park, Salt Lake City, Salt Lake County, Utah, 84108, United States tourism museum 0.787418940697571 United States us Americas Northern America
+drew university 2021-02-03 104995030 way Drew University, Vinal Place, Fairwoods, Madison, Morris County, New Jersey, 07940, United States amenity university 0.631278630270434 United States us Americas Northern America
+university of pittsburgh 2021-02-03 258622513 relation University of Pittsburgh, Strip District, Pittsburgh, Allegheny County, Pennsylvania, United States amenity university 0.870726964523873 United States us Americas Northern America
+gettysburg college 2021-02-03 162608659 way Gettysburg College, Carlisle Street, Gettysburg, Adams County, Pennsylvania, 17325, United States amenity university 0.634194405720176 United States us Americas Northern America
+us library of congress 2021-02-03 257979591 relation Library of Congress, Thomas Jefferson Building, 2nd Street Southeast, Washington, District of Columbia, 20003, United States tourism attraction 1.05445651415754 United States us Americas Northern America
+wake forest university 2021-02-03 2618233 node Wake Forest University, 1834, Wake Forest Road, Reynolda Village, Winston-Salem, Forsyth County, North Carolina, 27106, United States amenity university 0.804120989443361 United States us Americas Northern America
+white house 2021-02-03 147370893 way White House, 1600, Pennsylvania Avenue Northwest, Washington, District of Columbia, 20500, United States historic castle 0.83472115416811 United States us Americas Northern America
+missouri university of science and technology 2021-02-03 259052765 relation Missouri University of Science and Technology, North Walker Avenue, Rolla, Phelps County, Missouri, 65409, United States amenity university 1.00078255314529 United States us Americas Northern America
+roger williams park zoo 2021-02-03 162060422 way Roger Williams Park Zoo, 1000, Elmwood Avenue, Providence, Providence County, Rhode Island, 02907, United States tourism zoo 0.615498150437213 United States us Americas Northern America
+broad and berkeley 2021-02-03 100963106 way Broad Ax Branch, Berkeley County, South Carolina, United States waterway stream 0.4 United States us Americas Northern America
+double star 2021-02-03 226790102 way Double Star, Tyler, Smith County, Texas, United States landuse residential 0.4 United States us Americas Northern America
+nau 2021-02-03 138822770 way Northern Arizona University, South Beaver Street, Flagstaff Normal Addition, Flagstaff, Coconino County, Arizona, 86001, United States amenity university 0.451100009026849 United States us Americas Northern America
+texas a&m university in college station 2021-02-03 259129741 relation Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States amenity university 1.25527727305854 United States us Americas Northern America
+nssc 2021-02-03 153141063 way NSSC, CSS-1, CSS-3, Clark Street, Waipahu, Honolulu County, Hawaii, 9818, United States office government 0.101 United States us Americas Northern America
+navy 2021-02-03 471848 node Navy, Fairfax County, Virginia, 22033, United States place hamlet 0.35 United States us Americas Northern America
+wyss institute 2021-02-03 22973651 node Wyss Institute, 3, Blackfan Street, Boston, Suffolk County, Massachusetts, 02120, United States office research 0.201 United States us Americas Northern America
+gaston berger university 2021-02-03 190185049 way Mary Gaston Residence Hall, South Drive, University Heights, Greenville, Greenville County, South Carolina, 29614, United States building residential 0.201 United States us Americas Northern America
+us district court 2021-02-03 133238357 way US District Court, 401, Courthouse Square, Lyles-Crouch, Alexandria, Virginia, 22314, United States amenity courthouse 0.301 United States us Americas Northern America
+r street institute 2021-02-03 451003 node Institute, Jefferson, Kanawha County, West Virginia, 25064, United States place hamlet 0.554934934074513 United States us Americas Northern America
+esvelt 2021-02-03 85834685 way Esvelt Road, Daisy, Stevens County, Washington, United States highway residential 0.2 United States us Americas Northern America
+mit press of cambridge 2021-02-03 63902179 node The MIT Press Bookstore, 297, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States shop books 0.301 United States us Americas Northern America
+republican party 2021-02-03 147349004 way Ohio Republican Party, South Fifth Street, Market Mohawk District, Columbus, Franklin, Ohio, 43216, United States office political_party 0.582152257727352 United States us Americas Northern America
+national intelligence 2021-02-03 23760341 node Intelligence, Babson Boulder Trail, Gloucester, Essex County, Massachusetts, 01930-3540, United States historic archaeological_site 0.101 United States us Americas Northern America
+lyft 2021-02-03 157118156 way Lyft, 26th Street, Potrero Terrace, San Francisco, San Francisco City and County, California, 94124, United States building yes 0.101 United States us Americas Northern America
+goldman 2021-02-03 386477 node Goldman, Jefferson County, Missouri, United States place hamlet 0.370074815609084 United States us Americas Northern America
+vermont 2021-02-03 257728022 relation Vermont, United States boundary administrative 0.790877987357213 United States us Americas Northern America
+university of alabama 2021-02-03 110391765 way University of Alabama, 9th Street, Tuscaloosa, Tuscaloosa County, Alabama, 35487, United States amenity university 0.849900181888843 United States us Americas Northern America
+american association for the advancement of science 2021-02-03 8123167 node AAAS / Science, 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States tourism attraction 0.201 United States us Americas Northern America
+institute of forensic science 2021-02-03 149986396 way Forensic Science Institute, East 2nd Street, Edmond, Oklahoma County, Oklahoma, 73083, United States building yes 0.301 United States us Americas Northern America
+montana state university 2021-02-03 165822886 way Montana State University, West College Street, Bozeman, Gallatin County, Montana, 59715, United States amenity university 0.729796188420265 United States us Americas Northern America
+climate central 2021-02-03 78587650 node Climate, 5282, Monahans Avenue, The Shops at Clearfork, Fort Worth, Tarrant County, Texas, 76109, United States shop sports 0.101 United States us Americas Northern America
+us department of homeland security 2021-02-03 137867886 way US Department of Homeland Security, Randolph Road Southeast, Kirtland Addition, Albuquerque, Bernalillo County, New Mexico, 87106-5117, United States building yes 0.501 United States us Americas Northern America
+national bureau of economic research 2021-02-03 97970473 way National Bureau of Economic Research, 1050, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02138, United States building yes 0.934032993844314 United States us Americas Northern America
+occupational safety and health administration 2021-02-03 216527579 way Occupational Safety & Health, Shuler Loop Trailhead, Durant, Bryan County, Oklahoma, 74701, United States building yes 0.301 United States us Americas Northern America
+liberal-national 2021-02-03 258136520 relation Liberal, Seward County, Kansas, United States boundary administrative 0.57453184281069 United States us Americas Northern America
+cold spring harbor laboratory 2021-02-03 217475644 way Cold Spring Harbor Laboratory, Moores Hill Road, Laurel Hollow, Oyster Bay, Nassau County, New York, 11724, United States amenity university 0.401 United States us Americas Northern America
+greens 2021-02-03 447523 node The Greens, Fayetteville, Cumberland County, North Carolina, 28311, United States place hamlet 0.35 United States us Americas Northern America
+university of massachusetts 2021-02-03 75830459 node Cold Spring Orchard, 391, Sabin Street, Cold Spring, Belchertown, Hampshire County, Massachusetts, 01009, United States shop farm 0.101 United States us Americas Northern America
+pacific gas and electric company 2021-02-03 144924090 way Pacific Gas and Electric Company, 6121, Bollinger Canyon Road, Bishop Ranch Business Park, San Ramon, Contra Costa County, California, 94583, United States building yes 0.501 United States us Americas Northern America
+texas a&m university at college station 2021-02-03 259129741 relation Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States amenity university 1.35527727305854 United States us Americas Northern America
+rush university medical center 2021-02-03 150024552 way Rush University Medical Center, 1653, West Congress Parkway, Near West Side, Illinois Medical District, Chicago, Illinois Medical District, Illinois, 60612, United States amenity hospital 0.689701883147039 United States us Americas Northern America
+yale law school 2021-02-03 258747361 relation Yale Law School, 127, Wall Street, Downtown, New Haven, New Haven County, Connecticut, 06511-8918, United States building university 0.301 United States us Americas Northern America
+howard university 2021-02-03 258484447 relation Howard University, Howard Place Northwest, Howard University, Washington, District of Columbia, 20001, United States amenity university 0.719338807988632 United States us Americas Northern America
+nasa 2021-02-03 99133114 way Lyndon B. Johnson Space Center, 2101, NASA Parkway, Houston, Harris County, Texas, 77058, United States tourism attraction 0.618056742388072 United States us Americas Northern America
+medicine foundation 2021-02-03 10663071 node OU Physicians Reproductive Medicine, 840, Research Parkway, Presbyterian Health Foundation, Oklahoma City, Oklahoma County, Oklahoma, 73104, United States amenity doctors 0.201 United States us Americas Northern America
+penn state 2021-02-03 258601905 relation Penn State University, Mount Nittany Expressway, Houserville, College Township, Centre County, Pennsylvania, 16802-2604, United States amenity university 0.762656889872636 United States us Americas Northern America
+university of wyoming 2021-02-03 197878304 way University of Wyoming, North 30th Street, Laramie, Albany County, Wyoming, 82071, United States amenity university 0.790871452105903 United States us Americas Northern America
+sanford burnham prebys medical discovery institute 2021-02-03 2879170 node Sanford Burnham Prebys Medical Discovery Institute, N Coast Highway, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States office research 0.601 United States us Americas Northern America
+nicholls state university 2021-02-03 100200943 way Nicholls State University, 906, East 1st Street, Thibodaux, Lafourche Parish, Louisiana, 70301, United States amenity university 0.69394918828843 United States us Americas Northern America
+department of enterprise 2021-02-03 3043821 node Enterprise Fire Department, South Main Street, Singing Brook, Enterprise, Coffee County, Alabama, 36330-1915, United States amenity fire_station 0.301 United States us Americas Northern America
+gallaudet 2021-02-03 49650415 node Bison Shop, Lincoln Circle, Ivy City, Washington, District of Columbia, 20242, United States shop books 0.001 United States us Americas Northern America
+occidental 2021-02-03 100208097 way Occidental, Sonoma County, California, 95465, United States boundary administrative 0.475700293936422 United States us Americas Northern America
+usda 2021-02-03 257848060 relation U.S. Department of Agriculture South Building, 12th Street Southwest, Southwest Employment Area, Washington, District of Columbia, 20013, United States office government 0.609737594390182 United States us Americas Northern America
+us national hurricane center 2021-02-03 212513790 way National Hurricane Center, Miami-Dade County, Florida, 33199, United States highway service 0.375 United States us Americas Northern America
+union college 2021-02-03 107146317 way Union College, Seward Place, Schenectady, Schenectady County, New York, 12305:12309, United States amenity university 0.670997532660143 United States us Americas Northern America
+american meteorological society 2021-02-03 80718663 node American Meteorological Society, 45, Beacon Street, Downtown Crossing, Beacon Hill, Boston, Suffolk County, Massachusetts, 02108, United States office association 0.301 United States us Americas Northern America
+circuit court 2021-02-03 20736035 node Circuit Court, Maryland Avenue, Croydon Park, Rockville, Montgomery County, Maryland, 20850, United States amenity courthouse 0.403130333992136 United States us Americas Northern America
+district of columbia 2021-02-03 258375899 relation District of Columbia, United States boundary administrative 0.712065652038613 United States us Americas Northern America
+central south university 2021-02-03 151708639 way South University, 709, Mall Boulevard, Grove Park, Savannah, Chatham County, Georgia, 31406-4805, United States amenity schoolgrounds 0.201 United States us Americas Northern America
+smith college 2021-02-03 213618475 way Smith College, Main Street, Northampton, Hampshire County, Massachusetts, 01060, United States amenity college 0.201 United States us Americas Northern America
+courant institute 2021-02-03 55398385 node Courant Institute of Mathematical Sciences, 251, Mercer Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States amenity university 0.622385266730329 United States us Americas Northern America
+slac national accelerator laboratory 2021-02-03 299175282 way Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States amenity research_center 0.727082745074033 United States us Americas Northern America
+w. m. keck observatory 2021-02-03 102803081 way W. M. Keck Observatory, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States man_made observatory 0.890613845045925 United States us Americas Northern America
+california state polytechnic university 2021-02-03 259490882 relation California State Polytechnic University, Pomona, 3801, Temple Avenue, Pomona, Los Angeles County, California, 91768, United States amenity university 0.401 United States us Americas Northern America
+southern illinois university 2021-02-03 196119226 way Southern Illinois University, University Park Drive, Edwardsville, Madison County, Illinois, 62025, United States amenity university 0.301 United States us Americas Northern America
+starcraft 2021-02-03 52644991 node Starcraft, Northeast 4th Street, Bellevue, King County, Washington, 98004-5002, United States tourism artwork 0.101 United States us Americas Northern America
+clark university 2021-02-03 259488327 relation Clark University, Rosslare Drive, Botany Bay, Columbus Park, Worcester, Worcester County, Massachusetts, 01602, United States amenity university 0.660196767278603 United States us Americas Northern America
+fort collins 2021-02-03 258131035 relation Fort Collins, Larimer County, Colorado, United States boundary administrative 0.726613055164061 United States us Americas Northern America
+university of cincinnati 2021-02-03 258441379 relation University of Cincinnati, Elland Avenue, Pill Hill, Corryville, Cincinnati, Hamilton County, Ohio, 45229-3026, United States amenity university 0.81920367879753 United States us Americas Northern America
+brain research institute 2021-02-03 133163876 way Brain Research Institute, 670, Charles E Young Drive South, Westwood, Los Angeles, Los Angeles County, California, 90095, United States amenity research_institute 0.301 United States us Americas Northern America
+doherty earth observatory 2021-02-03 101655405 way Lamont-Doherty Earth Observatory, Ludlow Lane, Palisades, Town of Orangetown, Rockland County, New York, 10964, United States amenity university 0.301 United States us Americas Northern America
+scb 2021-02-03 3028939 node Scribner State Airport, 1574, Road 15, Hooper, Dodge County, Nebraska, 68031, United States aeroway aerodrome 0.178140546517606 United States us Americas Northern America
+information power 2021-02-03 2959862 node Fish Ladder and New England Power Company Information Center, Bridge Street, Bellows Falls Downtown Historic District, Bellows Falls, Rockingham, Windham County, Vermont, 03609, United States tourism information 0.201 United States us Americas Northern America
+scripps research institute 2021-02-03 2879141 node Scripps Research Institute, 10666, Coast Highway, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States office research 0.301 United States us Americas Northern America
+imperial 2021-02-03 258271306 relation Imperial County, California, United States boundary administrative 0.649875514128109 United States us Americas Northern America
+college of american pathologists 2021-02-03 53752747 node College Of American Pathologists, 325, Waukegan Road, Northfield, Northfield Township, Cook County, Illinois, 60093, United States amenity college 0.401 United States us Americas Northern America
+connecticut 2021-02-03 258171713 relation Connecticut, United States boundary administrative 0.818771933111505 United States us Americas Northern America
+baylor college of medicine 2021-02-03 145245721 way Baylor College of Medicine, 1, Baylor Plaza, Texas Medical Center, Houston, Harris County, Texas, 77030, United States building college 0.801517374360847 United States us Americas Northern America
+us agricultural research service 2021-02-03 48071247 node USDA, Agricultural Research Service, Phemister Road, Fort Collins, Larimer County, Colorado, 80525-1424, United States office government 0.401 United States us Americas Northern America
+has 2021-02-03 257963057 relation Harrison County, Ohio, United States boundary administrative 0.518837343149246 United States us Americas Northern America
+exxon 2021-02-03 101855069 way Exxon, Flower Mound, Denton County, Texas, United States landuse retail 0.3 United States us Americas Northern America
+american civil liberties union 2021-02-03 61017923 node American Civil Liberties Union, 125, Broad Street, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10004, United States office association 0.401 United States us Americas Northern America
+new york university 2021-02-03 114164826 way New York University, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States amenity university 0.934621425344776 United States us Americas Northern America
+environmental law institute 2021-02-03 67439590 node Environmental Law Institute, 1730, M Street Northwest, Golden Triangle, Washington, District of Columbia, 20036, United States office association 0.301 United States us Americas Northern America
+isle royale 2021-02-03 258888859 relation Isle Royale, Keweenaw County, Michigan, United States place island 0.55796975755477 United States us Americas Northern America
+park service 2021-02-03 120606840 way Park Service, Groveton, Fairfax County, Virginia, 22310-6299, United States highway service 0.275 United States us Americas Northern America
+santa clara 2021-02-03 258271205 relation Santa Clara County, California, United States boundary administrative 0.764168809666577 United States us Americas Northern America
+columbia sportswear 2021-02-03 160437176 way Columbia, 3, Monroe Parkway, Mountain Park, Lake Oswego, Metro, Oregon, 97035, United States shop clothes 0.101 United States us Americas Northern America
+hawaii 2021-02-03 258372128 relation Hawaii, United States boundary administrative 0.820432643396309 United States us Americas Northern America
+us bureau of reclamation 2021-02-03 81194393 node US Bureau of Reclamation, 4th Avenue North, West Downtown, Billings, Yellowstone County, Montana, 59101, United States office government 0.401 United States us Americas Northern America
+american diabetes association 2021-02-03 3050591 node American Diabetes Association Building, Penn Center Boulevard, Penn Center East, Oak Hill, Wilkins Township, Allegheny County, Pennsylvania, 15145, United States building yes 0.301 United States us Americas Northern America
+brothers 2021-02-03 2865253 node The Brothers, Humboldt County, California, United States place island 0.425 United States us Americas Northern America
+colorado college 2021-02-03 258559117 relation Colorado College, 14, East Cache la Poudre Street, Colorado Springs, El Paso County, Colorado, 80903, United States amenity university 0.652672658024048 United States us Americas Northern America
+moe 2021-02-03 258150217 relation Missouri, United States boundary administrative 0.73288134470033 United States us Americas Northern America
+san diego natural history museum 2021-02-03 108650649 way San Diego Natural History Museum, Plaza de Balboa, San Diego, San Diego County, California, United States tourism museum 0.83489332460211 United States us Americas Northern America
+jackson state university 2021-02-03 118809848 way Jackson State University, Saint Louis Street, Jackson, Hinds County, Mississippi, 39203, United States amenity university 0.721467320409497 United States us Americas Northern America
+hawaiian volcano observatory 2021-02-03 102153617 way Hawaiian Volcano Observatory, Crater Rim Trail, Hawaiʻi County, Hawaii, 96718, United States building yes 0.301 United States us Americas Northern America
+new harvest 2021-02-03 176266386 way New Harvest, Spruce Street, Spruce Hill, Philadelphia, Philadelphia County, Pennsylvania, 19139, United States amenity fast_food 0.201 United States us Americas Northern America
+american university washington college of law 2021-02-03 106829662 way American University- Washington College of Law, Tenley Circle Northwest, Tenleytown, American University Park, Washington, District of Columbia, 20016-2137, United States amenity university 0.601 United States us Americas Northern America
+igm 2021-02-03 214200010 way Kingman Airport, Mohave Airport Drive, Mohave County, Arizona, United States aeroway aerodrome 0.2885709817045 United States us Americas Northern America
+green bank telescope 2021-02-03 102881650 way Green Bank Telescope, Slavin Hollow Road, Pocahontas County, West Virginia, 24944, United States man_made telescope 0.690988572487363 United States us Americas Northern America
+university of california at santa barbara 2021-02-03 205319990 way University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States place locality 0.725 United States us Americas Northern America
+cincinnati children's hospital medical center 2021-02-03 104904209 way Cincinnati Children’s Hospital Medical Center, 3333, Burnet Avenue, Pill Hill, Corryville, Cincinnati, Hamilton County, Ohio, 45229-3026, United States amenity hospital 0.883827688081076 United States us Americas Northern America
+genentech 2021-02-03 168391805 way Genentech, 4625, Northeast Brookwood Parkway, Northeast Hillsboro, Hillsboro, Metro, Northeast Hillsboro Industrial District, Oregon, 97124, United States building yes 0.101 United States us Americas Northern America
+massachusetts general hospital 2021-02-03 117945499 way Massachusetts General Hospital, 55, Fruit Street, Beacon Hill, Boston, Suffolk County, Massachusetts, 02114, United States amenity hospital 0.76012624965149 United States us Americas Northern America
+national agency 2021-02-03 258146830 relation Agency, Wapello County, Iowa, 52530, United States boundary administrative 0.53283621062172 United States us Americas Northern America
+yahoo 2021-02-03 259181165 relation Yahoo, Sunnyvale, Santa Clara County, California, United States landuse commercial 0.3 United States us Americas Northern America
+university of central florida 2021-02-03 258129364 relation University of Central Florida, Mercury Circle, Alafaya, Orange County, Florida, 32816, United States amenity university 0.896770959418636 United States us Americas Northern America
+helios 2021-02-03 111625127 way Helios, 1600, 2nd Avenue, Pike Place Market Area, Belltown, Seattle, King County, Washington, 98101, United States building apartments 0.361844955490085 United States us Americas Northern America
+university of minnesota, morris 2021-02-03 259054108 relation University of Minnesota, Morris, Avenida de Cesar Chavez, Morris, Stevens County, Minnesota, 56267, United States amenity university 0.401 United States us Americas Northern America
+agios pharmaceuticals 2021-02-03 43500306 node Agios Pharmaceuticals, 38, Sidney Street, University Park, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States place house 0.201 United States us Americas Northern America
+xcor aerospace 2021-02-03 296995407 way Xcor Aerospace, Earhart Drive, Midland Spaceport Business Park, Midland, Midland County, Texas, United States aeroway hangar 0.201 United States us Americas Northern America
+west virginia 2021-02-03 257993887 relation West Virginia, United States boundary administrative 0.895386507122709 United States us Americas Northern America
+indiana university bloomington 2021-02-03 107215239 way Indiana University Bloomington, East 3rd Street, Bloomington, Monroe County, Indiana, 47401-6124, United States amenity university 0.301 United States us Americas Northern America
+office of criminal investigations 2021-02-03 3040663 node Criminal Investigations, South Park Avenue, Titusville, Brevard County, Florida, 32780, United States building public 0.201 United States us Americas Northern America
+emory 2021-02-03 259132524 relation Emory, Rains County, Texas, United States boundary administrative 0.565817363739394 United States us Americas Northern America
+books & arts 2021-02-03 137492216 way Plaza: Cake Arts, Nevermore Books, Tombstone Tattoo, Twice But Nice, 2852, West Sylvania Avenue, Deaveaux, Fitch, Toledo, Lucas County, Ohio, 43613, United States building yes 0.201 United States us Americas Northern America
+government accountability office 2021-02-03 103419777 way Government Accountability Office, 441, G Street Northwest, Penn Quarter, Washington, District of Columbia, 20548, United States building house 0.435420222661424 United States us Americas Northern America
+western washington university 2021-02-03 16114905 node Campus Services, 2001, Bill McDonald Parkway, WWU, Bellingham, Whatcom County, Washington, 98225-8225, United States tourism information 0.101 United States us Americas Northern America
+boston college 2021-02-03 168144245 way Boston College, 140, Commonwealth Avenue, Newton Centre, Newton, Middlesex County, Massachusetts, 02467, United States amenity university 0.743540689832249 United States us Americas Northern America
+energy 2021-02-03 257952569 relation Energy, Williamson County, Illinois, 62933, United States boundary administrative 0.523032671836241 United States us Americas Northern America
+seattle 2021-02-03 258415102 relation Seattle, King County, Washington, United States boundary administrative 0.772979173564379 United States us Americas Northern America
+pleiades 2021-02-03 2294942 node The Pleiades, Whatcom County, Washington, United States natural peak 0.4 United States us Americas Northern America
+vassar college 2021-02-03 2621574 node Vassar College, 124, Raymond Avenue, Town of Poughkeepsie, Dutchess County, New York, 12604, United States amenity college 0.707352256464993 United States us Americas Northern America
+working group 2021-02-03 52307556 node Fresenius Kidney Care Working Group, 200, West Pleasant Street, Schlitz Park, Milwaukee, Milwaukee County, Wisconsin, 53212-3942, United States amenity clinic 0.201 United States us Americas Northern America
+spirit cave 2021-02-03 210761029 way Cades Spirit Bend, Bee Cave, Travis County, Texas, 78733, United States highway residential 0.3 United States us Americas Northern America
+wisconsin national primate research center 2021-02-03 131313097 way Wisconsin National Primate Research Center, 1220, Capitol Court, South Campus, Bowens Addition, Madison, Dane County, Wisconsin, 53715, United States building university 0.501 United States us Americas Northern America
+southern company 2021-02-03 156893714 way Southern Company, 30, Ivan Allen Jr Boulevard, Atlanta, Fulton County, Georgia, 30313, United States building commercial 0.201 United States us Americas Northern America
+mit 2021-02-03 258016252 relation Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States amenity university 0.646742627764641 United States us Americas Northern America
+international commission 2021-02-03 71043842 node Great Commission Church International, 16152, Gale Avenue, Hacienda Heights, Industry, Los Angeles County, California, 91745, United States amenity place_of_worship 0.201 United States us Americas Northern America
+michigan 2021-02-03 258403790 relation Michigan, United States boundary administrative 0.837851453380433 United States us Americas Northern America
+plato 2021-02-03 258393720 relation Plato, McLeod County, Minnesota, United States boundary administrative 0.52505981939652 United States us Americas Northern America
+allen brain institute 2021-02-03 176152346 way Allen Institute for Brain Science, 615, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States office research 0.301 United States us Americas Northern America
+santa fe institute 2021-02-03 259309786 relation Santa Fe Institute, Ann Nitze Hiking Trail, Santa Fe, Santa Fe County, New Mexico, 87501, United States office educational_institution 0.301 United States us Americas Northern America
+national renewable energy laboratory 2021-02-03 136641314 way Solar Energy Research Facility, Denver West Parkway, Pleasant View, Jefferson County, Colorado, 80401-4015, United States building yes 0.101 United States us Americas Northern America
+the institute of mathematical sciences 2021-02-03 55398385 node Courant Institute of Mathematical Sciences, 251, Mercer Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States amenity university 0.922385266730329 United States us Americas Northern America
+hewlett foundation 2021-02-03 258952342 relation Hewlett Foundation, 2121, Sand Hill Road, Stanford Hills, Menlo Park, San Mateo County, California, 94028, United States office ngo 0.201 United States us Americas Northern America
+rice university 2021-02-03 103588283 way Rice University, Shakespeare Street, Houston, Harris County, Texas, 77030, United States amenity university 0.734727351217308 United States us Americas Northern America
+university of new hampshire school of law 2021-02-03 240177061 way University of New Hampshire School of Law, Blanchard Street, West End, Concord, Merrimack County, New Hampshire, 03301, United States amenity university 0.701 United States us Americas Northern America
+grinnell college 2021-02-03 97140884 way Grinnell College, 1115, 8th Avenue, Grinnell, Poweshiek County, Iowa, 50112, United States amenity university 0.634194405720176 United States us Americas Northern America
+university of ulster 2021-02-03 43591523 node University Police, Southside Loop Road, New Paltz, Town of New Paltz, Ulster County, New York, 12561, United States amenity police 0.301 United States us Americas Northern America
+fairview health services 2021-02-03 158126320 way Health Services, McMIllan Road, La Loma Park, Berkeley, Alameda County, California, 94720, United States building yes 0.201 United States us Americas Northern America
+university of new mexico 2021-02-03 163763522 way University of New Mexico, Las Lomas Road Northeast, Martinez Town, Albuquerque, Bernalillo County, New Mexico, 87102-2622, United States amenity university 0.914482025763995 United States us Americas Northern America
+florida fish and wildlife conservation commission 2021-02-03 59942908 node Split Oak Forest Wildlife & Environmental, Clapp Simms Duda Road, Orange County, Florida, 34771-9208, United States tourism information 0.201 United States us Americas Northern America
+brookings institution 2021-02-03 42626050 node The Brookings Institution, 1755, Massachusetts Avenue Northwest, Dupont Circle and surrunding block, Dupont Circle, Washington, District of Columbia, 20036, United States place house 0.201 United States us Americas Northern America
+jason 2021-02-03 454400 node Jason, Greene County, North Carolina, 28551:28580, United States place hamlet 0.35 United States us Americas Northern America
+gemini observatory 2021-02-03 163883937 way Gemini Observatory, 670, North Aohoku Place, Hilo CDP, Hawaiʻi County, Hawaii, 96720, United States building yes 0.201 United States us Americas Northern America
+pnnl 2021-02-03 47080016 node PNNL Guesthouse/ User Housing Facility, Battelle Boulevard, Tri-Cities, Benton County, Washington, 99354-2303, United States tourism guest_house 0.101 United States us Americas Northern America
+tennessee 2021-02-03 257213963 relation Tennessee, United States boundary administrative 0.820268105343983 United States us Americas Northern America
+university of nebraska-lincoln 2021-02-03 105525403 way Sheldon Museum of Art, North 12th Street, Downtown, Haymarket, Lincoln, Lancaster County, Nebraska, 68588-0300, United States tourism gallery 0.603230229325644 United States us Americas Northern America
+wakemed 2021-02-03 116051721 way WakeMed Soccer Park, Cary, Wake County, North Carolina, United States leisure park 0.515288505579639 United States us Americas Northern America
+bell 2021-02-03 258273678 relation Bell County, Texas, United States boundary administrative 0.658702837946413 United States us Americas Northern America
+cloud health 2021-02-03 192444442 way Cloud County Health Center, 1100, Highland Drive, Concordia, Cloud County, Kansas, 66956, United States amenity hospital 0.347788039106501 United States us Americas Northern America
+md anderson cancer center 2021-02-03 103450497 way University of Texas MD Anderson Cancer Center, 1515, Holcombe Boulevard, Texas Medical Center, Houston, Harris County, Texas, 77030, United States amenity hospital 0.743190432299382 United States us Americas Northern America
+fred hutchinson research center 2021-02-03 179513052 way Fred Hutchinson Cancer Research Center, 1100, Fairview Avenue North, South Lake Union, Capitol Hill, Seattle, King County, Washington, 98109, United States amenity research_institute 0.731005307834616 United States us Americas Northern America
+baruch college 2021-02-03 105392869 way Baruch College, Kelly Drive, Suffolk County, New York, 11794, United States building dormitory 0.201 United States us Americas Northern America
+us department of interior 2021-02-03 148880750 way Rincon Mountain Visitor Center, 3693, South Old Spanish Trail, Tucson, Pima County, Arizona, 85748, United States tourism information 0.001 United States us Americas Northern America
+city college of new york 2021-02-03 115546934 way The City College of New York, 160, Convent Avenue, Sugar Hill, Manhattan Community Board 9, Manhattan, New York County, New York, 10031, United States amenity university 1.01231196067725 United States us Americas Northern America
+the university of california at berkeley 2021-02-03 258416614 relation University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States amenity university 1.1481943782617 United States us Americas Northern America
+university of vermont 2021-02-03 258538939 relation University of Vermont, South Prospect Street, Burlington, Chittenden County, Vermont, 05401, United States amenity university 0.80032620600642 United States us Americas Northern America
+wri 2021-02-03 229580679 way McGuire Air Force Base, Polking Road, New Hanover Township, Burlington County, New Jersey, 08641, United States aeroway aerodrome 0.461279597273909 United States us Americas Northern America
+nyu school of medicine 2021-02-03 12578717 node NYU School of Medicine, 562, 1st Avenue, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10017-6927, United States amenity university 0.799286093607089 United States us Americas Northern America
+relampago 2021-02-03 368618 node Relampago, Hidalgo County, Texas, United States place hamlet 0.455899467051989 United States us Americas Northern America
+the university of pennsylvania 2021-02-03 258680341 relation University of Pennsylvania, Market Street, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19139, United States amenity university 0.926036457903365 United States us Americas Northern America
+carnegie institution 2021-02-03 106777669 way Carnegie Institution Building, 1530, P Street Northwest, Logan Circle/Shaw, Dupont Circle, Washington, District of Columbia, 2005, United States building yes 0.374617736328324 United States us Americas Northern America
+university of colorado anschutz medical campus 2021-02-03 37514871 node University of Colorado Anschutz Medical Campus, East 17th Place, Aurora, Adams County, Colorado, 80045, United States amenity university 0.601 United States us Americas Northern America
+nature news 2021-02-03 95688403 way Sandy Bottom Nature Park, 1255, Morrison, Hampton, Newport News, Virginia, 23666, United States boundary national_park 0.325 United States us Americas Northern America
+florida international university 2021-02-03 116704484 way Florida International University, East Campus Circle, Miami-Dade County, Florida, 33199, United States amenity university 0.842176759304101 United States us Americas Northern America
+vaccine research center 2021-02-03 213549295 way Vaccine Research Center, Convent Drive, National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, 20891, United States building yes 0.301 United States us Americas Northern America
+cornell university 2021-02-03 259012417 relation Johnson Museum of Art, 114, Central Avenue, Ithaca, Ithaca Town, Tompkins County, New York, 14853, United States tourism museum 0.378680902821112 United States us Americas Northern America
+massachusetts institute of technology lincoln laboratory 2021-02-03 20038570 node Massachusetts Institute of Technology Lincoln Laboratory, 244, Wood Street, Lexington, Middlesex County, Massachusetts, 01731, United States building industrial 0.601 United States us Americas Northern America
+house appropriations committee 2021-02-03 81345390 node House Appropriations Committee, North 9th Street, Shockoe Slip, Richmond, Virginia, 23219, United States office government 0.301 United States us Americas Northern America
+walgreens 2021-02-03 210267533 way Walgreens, Westwood Manor, Ardencroft, New Castle County, Delaware, United States landuse retail 0.3 United States us Americas Northern America
+sandia national laboratories 2021-02-03 100715239 way Sandia National Laboratories, Oakville Lane, Livermore, Alameda County, California, 94550, United States amenity science_park 0.744009006305759 United States us Americas Northern America
+enserch 2021-02-03 187679938 way Enserch Corporation, Gregg County, Texas, United States landuse industrial 0.3 United States us Americas Northern America
+american veterinary medical association 2021-02-03 75706148 node AHVMA, 37, Kensington Parkway, Box Hill North, Harford County, Maryland, 21009, United States office yes 0.001 United States us Americas Northern America
+academy of natural sciences 2021-02-03 171334462 way Academy of Natural Sciences of Drexel University, 1900, Benjamin Franklin Parkway, Philadelphia, Philadelphia County, Pennsylvania, 19103, United States tourism museum 0.786028263148971 United States us Americas Northern America
+joint global change research institute 2021-02-03 24146752 node Joint Global Change Research Institute, 5825, University Research Court, University of Maryland Research Park, Riverdale Park, Prince George's County, Maryland, 20740, United States amenity research_institute 0.635420222661424 United States us Americas Northern America
+local motors 2021-02-03 51604923 node Local Motors, 151, Saint George Boulevard, National Harbor, Potomac Vista, Fort Washington, Prince George's County, Maryland, 20745, United States office company 0.201 United States us Americas Northern America
+lawrence berkeley national laboratory 2021-02-03 201093023 way Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States amenity research_institute 0.401 United States us Americas Northern America
+world commission 2021-02-03 69631578 node Calhoun County Participation in World War II, South Ann Street, Port Lavaca, Calhoun County, Texas, 77979, United States tourism information 0.101 United States us Americas Northern America
+ball aerospace 2021-02-03 249881855 way Ball Aerospace, 48th Street, Boulder, Boulder County, Colorado, 80303-1229, United States office company 0.201 United States us Americas Northern America
+lille university hospital 2021-02-03 169772928 way Friedberg Lifelong Learning Center (LL-31C), West University Drive, Boca Raton, Palm Beach County, Florida, 33431, United States building university 0.101 United States us Americas Northern America
+laboratory of virology 2021-02-03 133911148 way Primate Virology & Immunology Laboratory, 188, County Road 98, Plainfield, Davis, Yolo County, California, 95616, United States building university 0.201 United States us Americas Northern America
+multiple sclerosis foundation 2021-02-03 57425651 node Multiple Sclerosis Foundation, 6520, North Andrews Avenue, Fort Lauderdale, Broward County, Florida, 33309, United States office company 0.301 United States us Americas Northern America
+university of mississippi medical center 2021-02-03 198707196 way University of Mississippi Medical Center, 2500, North State Street, Woodland Hills, Jackson, Hinds County, Mississippi, 39216, United States amenity hospital 0.820054390558144 United States us Americas Northern America
+lick observatory 2021-02-03 251428619 way Lick Observatory, Mount Hamilton Road, Santa Clara County, California, 95140, United States leisure nature_reserve 0.201 United States us Americas Northern America
+yale university 2021-02-03 258788418 relation Yale University, West Haven, New Haven County, Connecticut, 06516, United States amenity university 0.859636160157988 United States us Americas Northern America
+lamont-doherty earth observatory 2021-02-03 101655405 way Lamont-Doherty Earth Observatory, Ludlow Lane, Palisades, Town of Orangetown, Rockland County, New York, 10964, United States amenity university 0.401 United States us Americas Northern America
+purdue 2021-02-03 87684719 way Purdue, Auburn Heights, Auburn Hills, Oakland County, Michigan, 48326-2766, United States highway residential 0.2 United States us Americas Northern America
+children's national medical center 2021-02-03 156002689 way Children's National Medical Center, 111, Michigan Avenue Northwest, McMillan Filter Plant & Reservoir, Washington, District of Columbia, 20010, United States amenity hospital 0.501 United States us Americas Northern America
+united states of america 2021-02-03 257984054 relation United States boundary administrative 1.13569136745759 United States us Americas Northern America
+seaworld entertainment 2021-02-03 112132633 way Aquatica: SeaWorld's Waterpark San Diego, 2052, Entertainment Circle, Chula Vista, San Diego County, California, 92154, United States tourism theme_park 0.201 United States us Americas Northern America
+aero-acoustic propulsion laboratory 2021-02-03 150820880 way Aero-Acoustic Propulsion Laboratory, Road K, Brook Park, Cuyahoga County, Ohio, 44142, United States building government 0.401 United States us Americas Northern America
+perelman school of medicine 2021-02-03 103925708 way Perelman Center for Advanced Medicine, East Service Drive, University City, Philadelphia, Philadelphia County, Pennsylvania, 19104, United States building yes 0.405371759161912 United States us Americas Northern America
+needham & company 2021-02-03 97473265 way Needham, Choctaw County, Alabama, United States place town 0.507183702790066 United States us Americas Northern America
+lowell observatory 2021-02-03 138722097 way Lowell Observatory, 1400, West Mars Hill Road, Flagstaff Townsite, Flagstaff, Coconino County, Arizona, 86001, United States tourism attraction 0.720435832121165 United States us Americas Northern America
+wake forest school of medicine 2021-02-03 33980201 node Wake Forest School of Medicine, 1, Medical Center Boulevard, Ardmore, Winston-Salem, Forsyth County, North Carolina, 27157, United States amenity university 0.755351334110971 United States us Americas Northern America
+alnylam 2021-02-03 43655569 node Alnylam Pharmaceuticals, 300, Third Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States office research 0.101 United States us Americas Northern America
+lehman college of the city university of new york 2021-02-03 107135502 way Lehman College of the City University of New York, 250, Bedford Park Boulevard West, The Bronx, Bronx County, New York, 10468, United States amenity university 1.2697288539961 United States us Americas Northern America
+scopus 2021-02-03 416620 node Scopus, Bollinger County, Missouri, United States place hamlet 0.35 United States us Americas Northern America
+foundation medicine 2021-02-03 43539867 node Foundation Medicine, Inc. Headquarters, 150, Second Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States office research 0.201 United States us Americas Northern America
+newport news 2021-02-03 488126 node Newport News, Virginia, 23607, United States place city 0.686660556787456 United States us Americas Northern America
+centre for research 2021-02-03 100783959 way National Center for Atmospheric Research Mesa Lab, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States building government 0.591849073716688 United States us Americas Northern America
+autism research centre 2021-02-03 171350220 way Burkhart Center for Autism Education & Research, 2902, 18th Street, Lubbock, Lubbock County, Texas, 79409, United States building college 0.201 United States us Americas Northern America
+eagle 2021-02-03 258059994 relation Eagle County, Colorado, United States boundary administrative 0.607744508540787 United States us Americas Northern America
+army corps of engineers 2021-02-03 184369940 way Army Corps of Engineers, Fort Street, Norfolk Redevelopment and Housing Authority, Norfolk, Virginia, 23510, United States building garage 0.401 United States us Americas Northern America
+ocean and atmosphere 2021-02-03 179780174 way W.M. Keck Foundation Center for Ocean Atmosphere Research, San Diego, San Diego County, California, United States landuse industrial 0.4 United States us Americas Northern America
+smc 2021-02-03 154928635 way Space and Missile Systems Center, North Douglas Street, El Segundo, Los Angeles County, California, 90245, United States office government 0.332141421099015 United States us Americas Northern America
+broomfield 2021-02-03 354302 node Broomfield, City and County of Broomfield, Colorado, 80020, United States place town 0.609273128324911 United States us Americas Northern America
+general conference 2021-02-03 149079985 way Center for Christian Ministries Churches of God, General Conference, 700, East Melrose Avenue, Bent Tree, Findlay, Hancock County, Ohio, 45840, United States building yes 0.201 United States us Americas Northern America
+texas a & m university in college station 2021-02-03 259129741 relation Texas A&M University, South Harvey Mitchell Parkway, College Station, Brazos County, Texas, 77845-5357, United States amenity university 1.25527727305854 United States us Americas Northern America
+south carolina 2021-02-03 257325089 relation South Carolina, United States boundary administrative 0.90345926227768 United States us Americas Northern America
+canadian forest service 2021-02-03 259077830 relation Canadian, Hemphill County, Texas, United States boundary administrative 0.575446574770995 United States us Americas Northern America
+university of nevada las vegas 2021-02-03 127461263 way University of Nevada, Las Vegas, 4505, Maryland Circle, Midtown UNLV, Las Vegas, Clark County, Nevada, 89154, United States amenity university 0.983772660357429 United States us Americas Northern America
+cross 2021-02-03 258347599 relation Cross County, Arkansas, United States boundary administrative 0.598270979527558 United States us Americas Northern America
+obstetrics and gynecology 2021-02-03 2345795 node Obstetrics and Gynecology, 1015, Union Street, Boone, Boone County, Iowa, 50036, United States amenity doctors 0.301 United States us Americas Northern America
+jst 2021-02-03 146469981 way Johnstown-Cambria County Airport, Airport Road, Richland Township, Cambria County, Pennsylvania, 15904, United States aeroway aerodrome 0.217338060184506 United States us Americas Northern America
+philip diamond 2021-02-03 108999433 way St. Philip the Apostle Church, 725, Diamond Street, Noe Valley, San Francisco, San Francisco City and County, California, 94114, United States amenity place_of_worship 0.201 United States us Americas Northern America
+wichita state university 2021-02-03 2785487 node Wichita State University, Perimeter Road, Wichita, Sedgwick County, Kansas, 67260-0074, United States amenity university 0.755054694349514 United States us Americas Northern America
+kids 2021-02-03 123412820 way Kids, Gunnison County, Colorado, 81230, United States highway path 0.175 United States us Americas Northern America
+university of hawai'i 2021-02-03 158423062 way University of Hawaiʻi, Lower Campus, Woodlawn Drive, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States amenity parking 0.401 United States us Americas Northern America
+david geffen school of medicine 2021-02-03 147422515 way David Geffen School of Medicine, Tiverton Drive, Westwood Village, Westwood, Los Angeles, Los Angeles County, California, 90095, United States amenity university 0.842480646342894 United States us Americas Northern America
+earth system science center 2021-02-03 54925314 node Center for Science in the Earth System, 3737, Brooklyn Avenue Northeast, University District, Seattle, King County, Washington, 98105-6286, United States office research 0.401 United States us Americas Northern America
+beaumont health 2021-02-03 240362052 way Beaumont Health, 26901, Beaumont Boulevard, Southfield, Oakland County, Michigan, 48033, United States building commercial 0.201 United States us Americas Northern America
+gates foundation 2021-02-03 177964409 way Bill & Melinda Gates Foundation, 500, 5th Avenue North, Lower Queen Anne, Belltown, Seattle, King County, Washington, 98109, United States office foundation 0.633000783214491 United States us Americas Northern America
+keck observatory 2021-02-03 215780342 way Keck Observatory, 124th Street South, Pierce County, Washington, 98447, United States man_made observatory 0.201 United States us Americas Northern America
+lawrence berkeley national laboratory in berkeley 2021-02-03 201093023 way Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States amenity research_institute 0.501 United States us Americas Northern America
+inter-american development bank 2021-02-03 102806036 way Inter-American Development Bank, 1300, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States office government 0.883362660493124 United States us Americas Northern America
+long island university 2021-02-03 142291190 way The Island, 4213, 5th Avenue Northeast, University District, Seattle, King County, Washington, 98105, United States building yes 0.201 United States us Americas Northern America
+hewlett 2021-02-03 257852582 relation Hewlett, Hempstead, Nassau County, New York, United States boundary administrative 0.498524014044495 United States us Americas Northern America
+exeter university 2021-02-03 89930509 way Exeter, University Town Center, Irvine, Orange County, California, 92612, United States highway residential 0.3 United States us Americas Northern America
+university of columbia 2021-02-03 105725399 way Georgetown University, 3700, O Street Northwest, Georgetown, Washington, District of Columbia, 20057, United States amenity university 0.887586492717596 United States us Americas Northern America
+pacific lutheran university 2021-02-03 95404782 way Pacific Lutheran University, 12180, Park Avenue South, Parkland, Tacoma, Pierce County, Washington, 98447, United States amenity university 0.686028263148971 United States us Americas Northern America
+heritage foundation 2021-02-03 104211345 way The Heritage Foundation, 214, Massachusetts Avenue Northeast, Stanton Park, Washington, District of Columbia, 20002, United States building yes 0.201 United States us Americas Northern America
+janelia farm research campus 2021-02-03 258401070 relation Janelia Research Campus, 19700, Helix Drive, Ashburn, Loudoun County, Virginia, 20147, United States amenity research_institute 0.546981559290857 United States us Americas Northern America
+hunter college 2021-02-03 113732474 way Hunter College, 695, Park Avenue, Carnegie Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States amenity college 0.682460766298975 United States us Americas Northern America
+california state university 2021-02-03 140128410 way California State University, Long Beach, East Bixby Hill Road, Long Beach, Los Angeles County, California, 90815, United States amenity university 0.781345777911708 United States us Americas Northern America
+canada-france-hawaii telescope 2021-02-03 102686691 way Canada-France-Hawaii Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States man_made telescope 0.773004776697036 United States us Americas Northern America
+university of california, merced 2021-02-03 129779241 way University of California, Merced, 5200, Mineral King Road, Merced County, California, 95343, United States amenity university 0.813735597530124 United States us Americas Northern America
+bidmc 2021-02-03 39717217 node Blue Bikes - BIDMC - Brookline at Burlington St, Burlington Avenue, Audubon Square, Boston, Suffolk County, Massachusetts, 02215, United States amenity bicycle_rental 0.101 United States us Americas Northern America
+new york times 2021-02-03 138755486 way The New York Times, Woodbridge Avenue, Bonhamtown, Edison, Middlesex County, New Jersey, 08818, United States building warehouse 0.301 United States us Americas Northern America
+stantec consulting 2021-02-03 302290273 node Stantec Consulting, 584, West 5th Avenue, Naperville, DuPage County, Illinois, 60563, United States place house 0.201 United States us Americas Northern America
+ucla ronald reagan medical center 2021-02-03 258368083 relation Ronald Reagan UCLA Medical Center, 757, Westwood Plaza, Westwood, Los Angeles, Los Angeles County, California, 90095, United States amenity hospital 0.883144349963485 United States us Americas Northern America
+democratic party 2021-02-03 227065873 way Democratic Party, 42, South Main Street, Marshall, Madison County, North Carolina, 28753, United States office political_party 0.201 United States us Americas Northern America
+columbia university irving medical center 2021-02-03 121491710 way Columbia University Irving Medical Center, 630, West 168th Street, Washington Heights, Manhattan Community Board 12, Manhattan, New York County, New York, 10031, United States amenity hospital 0.855322560505529 United States us Americas Northern America
+caltech 2021-02-03 97237039 way California Institute of Technology, East Del Mar Boulevard, Pasadena, Los Angeles County, California, 91106, United States amenity university 0.58591368499579 United States us Americas Northern America
+university of rhode island 2021-02-03 147160757 way University of Rhode Island, Old North Road, Kingston, South Kingstown, South County, Rhode Island, 02881, United States amenity university 0.860862691066137 United States us Americas Northern America
+epri 2021-02-03 149351356 way EPRI High Voltage Lab, New Lenox, Lenox, Berkshire County, Massachusetts, United States landuse industrial 0.3 United States us Americas Northern America
+astronomical observatory of milan 2021-02-03 41593478 node Astronomical Observatory, Cats Path, Academic Core, University of Kentucky, Lexington, Fayette County, Kentucky, 40506, United States man_made tower 0.301 United States us Americas Northern America
+red crescent 2021-02-03 258176473 relation Red Creek, Wolcott Town, Wayne County, New York, United States boundary administrative 0.498906231699698 United States us Americas Northern America
+stowers institute for medical research 2021-02-03 174674425 way Stowers Institute for Medical Research, 1000, East 50th Street, Kansas City, Jackson County, Missouri, 64110, United States office research 0.715498150437213 United States us Americas Northern America
+university of virginia 2021-02-03 258891172 relation University of Virginia, Albemarle County, Virginia, United States amenity university 0.893364107518662 United States us Americas Northern America
+sonoma state university 2021-02-03 136713211 way Sonoma State University, 1801, East Cotati Avenue, C Section, Rohnert Park, Sonoma County, California, 94928, United States amenity university 0.720803171748129 United States us Americas Northern America
+regeneron 2021-02-03 155139757 way Regeneron, 1, Rockwood Road, Archville, Town of Mount Pleasant, Westchester, New York, 10591, United States building yes 0.101 United States us Americas Northern America
+pik 2021-02-03 258470779 relation Pike County, Ohio, United States boundary administrative 0.617433418056826 United States us Americas Northern America
+university of connecticut avery point 2021-02-03 258603549 relation University of Connecticut Avery Point, 1084, Shennecossett Road, Groton, New London County, Connecticut, 06340, United States amenity university 0.501 United States us Americas Northern America
+university of maryland, college park 2021-02-03 198712103 way University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States amenity university 1.05966453785279 United States us Americas Northern America
+us national academies 2021-02-03 158007717 way Bergen County Academies, NJ 4, Hackensack, Bergen County, New Jersey, 07646:07666, United States amenity school 0.451332014915526 United States us Americas Northern America
+cato institute 2021-02-03 159055081 way Cato Center & Halsey Institute of Contemporary Art, Saint Phillip Street, Charleston, Charleston County, South Carolina, 29401, United States building college 0.201 United States us Americas Northern America
+dana farber cancer institute 2021-02-03 145616376 way Dana-Farber Cancer Institute, 450, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States amenity hospital 0.71689306175332 United States us Americas Northern America
+princeton university press 2021-02-03 99832796 way Princeton University Press, William Street, Princeton, Mercer County, New Jersey, 08540, United States building university 0.301 United States us Americas Northern America
+rand corporation 2021-02-03 259211702 relation RAND Corporation, Main Street, Santa Monica, Los Angeles County, California, 90401-2405, United States building office 0.201 United States us Americas Northern America
+wildlife department 2021-02-03 235737387 way Red Rock Wildlife Management Area, Game Department Road, Grant County, New Mexico, United States leisure nature_reserve 0.201 United States us Americas Northern America
+us fish and wildlife service 2021-02-03 166257913 way US Fish and Wildlife Service, Linn County, Oregon, United States landuse commercial 0.7 United States us Americas Northern America
+school of natural resources 2021-02-03 26489221 node Natural Resources, 1367, Valencia Street, Liberty Street Historic District, San Francisco, San Francisco City and County, California, 94110, United States amenity social_facility 0.201 United States us Americas Northern America
+dartmouth college 2021-02-03 236828980 way Dartmouth College, River Road, Norwich, Windsor County, Vermont, 03755, United States amenity college 0.769183253746589 United States us Americas Northern America
+alpert medical school 2021-02-03 259282365 relation Warren Alpert Medical School, 222, Richmond Street, Jewelry District, Providence, Providence County, Rhode Island, 02903, United States building office 0.301 United States us Americas Northern America
+mclean hospital 2021-02-03 200768064 way McLean Hospital, 115, Mill Street, Kendall Gardens, Belmont, Middlesex County, Massachusetts, 02478, United States amenity hospital 0.526548011937258 United States us Americas Northern America
+national foundation 2021-02-03 49534292 node Foundation, Monahans, Ward County, Texas, 79756, United States place neighbourhood 0.35 United States us Americas Northern America
+whitehead institute 2021-02-03 300475537 way Whitehead Institute, 455, Main Street, East Cambridge, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02142, United States building office 0.533532730730458 United States us Americas Northern America
+new york 2021-02-03 258355858 relation New York, United States boundary administrative 1.01757661145185 United States us Americas Northern America
+national hurricane center 2021-02-03 212513790 way National Hurricane Center, Miami-Dade County, Florida, 33199, United States highway service 0.375 United States us Americas Northern America
+indiana 2021-02-03 257993413 relation Indiana, United States boundary administrative 0.817836972596621 United States us Americas Northern America
+jupiter 2021-02-03 258426556 relation Jupiter, Palm Beach County, Florida, United States boundary administrative 0.570373326511065 United States us Americas Northern America
+columbia university 2021-02-03 235180475 way Columbia University, Reunion Plaza, Morningside Heights, Manhattan Community Board 9, Manhattan, New York County, New York, United States amenity university 0.872550278643288 United States us Americas Northern America
+grinnell 2021-02-03 258144015 relation Grinnell, Gove County, Kansas, 67738, United States boundary administrative 0.51550718966255 United States us Americas Northern America
+university of kansas 2021-02-03 226545942 way University of Kansas, Louisiana Street, Malls Shopping Center, Lawrence, Douglas County, Kansas, 66046, United States amenity university 0.862696980333312 United States us Americas Northern America
+incorporated research institutions for seismology 2021-02-03 127043663 way IRIS PASSCAL Offices, South Road, Socorro, Socorro County, New Mexico, 87801, United States office research 0.001 United States us Americas Northern America
+university of pennsylvania 2021-02-03 258680341 relation University of Pennsylvania, Market Street, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19139, United States amenity university 0.926036457903365 United States us Americas Northern America
+us national academy of sciences 2021-02-03 106787905 way National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States office ngo 1.00593943258948 United States us Americas Northern America
+dana-farber cancer institute 2021-02-03 145616376 way Dana-Farber Cancer Institute, 450, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States amenity hospital 0.71689306175332 United States us Americas Northern America
+us central intelligence agency 2021-02-03 134865123 way Central Intelligence Agency, Clearview Manor, McLean, Fairfax County, Virginia, United States landuse government 0.5 United States us Americas Northern America
+aerb 2021-02-03 259296849 relation Nichols Arboretum, Ann Arbor, Washtenaw County, Michigan, United States leisure park 0.316531580368862 United States us Americas Northern America
+university of florida 2021-02-03 119795320 way University of Florida, Southwest 20th Street, Idylwild, Gainesville, Alachua County, Florida, 32611, United States amenity university 0.890538725277712 United States us Americas Northern America
+kaiser foundation hospitals 2021-02-03 195863008 way MetroHealth Parma Medical Office, 12031, Snow Road, Parma, Cuyahoga County, Ohio, 44130, United States amenity hospital 0.001 United States us Americas Northern America
+genome research 2021-02-03 100166139 way Genome Research Institute, Ronald Reagan Cross County Highway, Reading, Hamilton County, Ohio, 45215-5417, United States amenity research_institute 0.201 United States us Americas Northern America
+illumina 2021-02-03 105132630 way Illumina, San Diego, San Diego County, California, United States landuse commercial 0.3 United States us Americas Northern America
+scientific research 2021-02-03 220155051 way Thermo Fisher Scientific, 5781, Van Allen Way, Carlsbad Research Center, Carlsbad, San Diego County, California, 92011, United States building industrial 0.201 United States us Americas Northern America
+national wildlife federation 2021-02-03 232820332 way National Wildlife Federation, Business Center Drive, Pinecrest, Reston, Fairfax County, Virginia, 20190, United States man_made works 0.301 United States us Americas Northern America
+house of representative 2021-02-03 87659921 way 2 Portland Fish Pier Portland ME Representative Pingrees Office, Old Port, Downtown, Portland, Cumberland County, Maine, 04101-4145, United States highway residential 0.3 United States us Americas Northern America
+integrated research facility 2021-02-03 158319264 way Integrated Biorefinery Research Facility, Denver West Parkway, Pleasant View, Jefferson County, Colorado, 80401-4015, United States building yes 0.301 United States us Americas Northern America
+texas tech university 2021-02-03 193845831 way Texas Tech University, 2500, Broadway Street, Lubbock, Lubbock County, Texas, 79409, United States amenity university 0.809795372861755 United States us Americas Northern America
+locus biosciences 2021-02-03 73461690 node Locus Biosciences, 523, Davis Drive, Research Triangle Park, Morrisville, Durham County, North Carolina, 27560, United States office company 0.201 United States us Americas Northern America
+healthcare 2021-02-03 257378484 way Healthcare, Shiloh, Lancaster County, South Carolina, 29720-2135, United States highway service 0.175 United States us Americas Northern America
+lehigh university 2021-02-03 2597738 node Lehigh University, Library Drive, Sayre Park, Bethlehem, Northampton County, Pennsylvania, 18015, United States amenity school 0.201 United States us Americas Northern America
+northwestern university feinberg school of medicine 2021-02-03 2270537 node Northwestern University Feinberg School of Medicine, East Superior Street, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States amenity school 0.945725205949526 United States us Americas Northern America
+planet labs 2021-02-03 154551012 way Planet Labs, 346, 9th Street, West SoMa, San Francisco, San Francisco City and County, California, 94103, United States building yes 0.201 United States us Americas Northern America
+arch street 2021-02-03 87129318 way Arch Street, Northwest Triangle, York, York County, Pennsylvania, 17403, United States highway tertiary 0.3 United States us Americas Northern America
+cooper's ferry 2021-02-03 299474742 way Cooper's Ferry Park, Monticello, Lawrence County, Mississippi, United States leisure park 0.45 United States us Americas Northern America
+bryan cave 2021-02-03 54504450 node Bryan Cave, 211 #3600, North Broadway, Downtown, City of Saint Louis, Missouri, 63102, United States office lawyer 0.201 United States us Americas Northern America
+bayer crop science 2021-02-03 194221252 way Bayer Crop Science, East 50th Street, Lubbock, Lubbock County, Texas, 79404, United States building yes 0.301 United States us Americas Northern America
+navajo nation 2021-02-03 259240483 relation Navajo Nation, United States boundary aboriginal_lands 0.692311230103081 United States us Americas Northern America
+mauna kea 2021-02-03 21157190 node Mauna Kea, Hawaiʻi County, Hawaii, United States natural volcano 0.69306006360707 United States us Americas Northern America
+alpha 2021-02-03 257837726 relation Alpha, Warren County, New Jersey, United States boundary administrative 0.458705675544455 United States us Americas Northern America
+california polytechnic state university 2021-02-03 160705772 way California Polytechnic State University, North Santa Rosa Street, San Luis Obispo, San Luis Obispo County, California, 93407-0283, United States amenity university 0.877289721429052 United States us Americas Northern America
+us postal service 2021-02-03 224813157 way US Postal Service, Sutton, Matanuska-Susitna, Alaska, United States landuse industrial 0.5 United States us Americas Northern America
+university of washington bothell 2021-02-03 101052625 way University of Washington-Bothell, South Campus Way, Bothell, King County, Washington, 98011, United States amenity university 0.702778707896871 United States us Americas Northern America
+georgetown university 2021-02-03 105725399 way Georgetown University, 3700, O Street Northwest, Georgetown, Washington, District of Columbia, 20057, United States amenity university 0.787586492717596 United States us Americas Northern America
+first solar 2021-02-03 61379150 node First Solar, 350, West Washington Street, Tempe, Maricopa County, Arizona, 85281, United States office yes 0.593222260239594 United States us Americas Northern America
+jefferson community and technical college 2021-02-03 181934405 way Eastern Gateway Community College, Jefferson County Campus, 4000, Sunset Boulevard, Braybarton Boulevard Historic District, Becker Highlands, Steubenville, Jefferson County, Ohio, 43952, United States amenity college 0.672343749103071 United States us Americas Northern America
+la parguera 2021-02-03 51134028 node La Parguera, Parguera, Lajas, Puerto Rico, United States place suburb 0.475 United States us Americas Northern America
+university of puerto rico-mayagüez 2021-02-03 144582128 way Universidad de Puerto Rico - Recinto Universitario de Mayagüez, Calle Ceiba, Ensanche ParÃs, Barrio Pueblo, Mayagüez, Puerto Rico, 00680, United States amenity university 0.648376470606964 United States us Americas Northern America
+apache point observatory 2021-02-03 100736830 way Apache Point Observatory, Otero County, New Mexico, United States landuse observatory 0.777953726983006 United States us Americas Northern America
+ucsd 2021-02-03 94305187 way University of California, San Diego, 9500, Gilman Drive, San Diego, San Diego County, California, 92093, United States amenity university 0.549388364219268 United States us Americas Northern America
+institute of human virology 2021-02-03 171936676 way Institute of Human Virology, 725, West Lombard Street, Ridgely's Delight, Baltimore, Maryland, 21201, United States building university 0.401 United States us Americas Northern America
+nrg 2021-02-03 6784494 node NRG, 3600, South Broad Street, Packer Park, South Philadelphia, Philadelphia, Philadelphia County, Pennsylvania, 19112, United States railway station 0.401865618613023 United States us Americas Northern America
+new jersey institute of technology 2021-02-03 185826691 way New Jersey Institute of Technology, Wickliffe Street, University Heights, Newark, Essex County, New Jersey, 07103, United States amenity university 0.913510524610342 United States us Americas Northern America
+babcock 2021-02-03 257473949 way Babcock, Miller County, Georgia, United States boundary administrative 0.45 United States us Americas Northern America
+mo. 2021-02-03 258150217 relation Missouri, United States boundary administrative 0.73288134470033 United States us Americas Northern America
+university of mons 2021-02-03 118474741 way Alabama State University, 915, South Jackson Street, Montgomery, Montgomery County, Alabama, 36104, United States amenity university 0.509712984743276 United States us Americas Northern America
+cms 2021-02-03 118801821 way Centers for Medicare & Medicaid Services, Baltimore County, Maryland, United States landuse commercial 0.384962546693336 United States us Americas Northern America
+huffington post 2021-02-03 301205265 way Beaver-Huffington Dam, Mesa County, Colorado, United States waterway dam 0.35 United States us Americas Northern America
+millipore 2021-02-03 202253346 way Millipore, 11, Prescott Road, Squantum, Jaffrey, Cheshire County, New Hampshire, 03452, United States building commercial 0.101 United States us Americas Northern America
+von kleinsmid center 2021-02-03 259003738 relation Von Kleinsmid Center for International and Public Affairs, 3518, Trousdale Parkway, University Park, Los Angeles, Los Angeles County, California, 90089, United States building university 0.301 United States us Americas Northern America
+montana 2021-02-03 258349675 relation Montana, United States boundary administrative 0.801736049923475 United States us Americas Northern America
+princeton hydro 2021-02-03 258173845 relation Hydro, Caddo County, Oklahoma, United States boundary administrative 0.383208261767925 United States us Americas Northern America
+arecibo observatory 2021-02-03 184420154 way Arecibo Observatory, Carretera al Observatorio de Arecibo, Cienaga, Esperanza, Arecibo, Puerto Rico, United States building yes 0.201 United States us Americas Northern America
+planetary sciences 2021-02-03 39668919 node Earth, Atmospheric, and Planetary Sciences Library, 550, West Stadium Avenue, West Lafayette, Tippecanoe County, Indiana, 47907, United States amenity library 0.201 United States us Americas Northern America
+us state department 2021-02-03 69248957 node C Street & 20th Street Northwest (State Department), C Street Northwest, Washington, District of Columbia, 20037, United States highway bus_stop 0.201 United States us Americas Northern America
+us national optical astronomy observatory 2021-02-03 39657118 node National Optical Astronomy Observatory, 950, North Cherry Avenue, Tucson, Pima County, Arizona, 85721, United States amenity research_institute 0.401 United States us Americas Northern America
+lockheed martin space systems 2021-02-03 22515675 node Lockheed Martin Space Company Fire Department, Empire Grade, Lockheed Martin Space Systems Company, Santa Cruz County, California, United States amenity fire_station 0.401 United States us Americas Northern America
+washington post 2021-02-03 259037983 relation Washington, District of Columbia, United States boundary administrative 0.849288898611582 United States us Americas Northern America
+university of california hastings college 2021-02-03 163487930 way University of California, Hastings College of the Law, Larkin Street, Civic Center, San Francisco, San Francisco City and County, California, 94102, United States amenity university 0.882401781952281 United States us Americas Northern America
+brookhaven 2021-02-03 259194909 relation Brookhaven, Lincoln County, Mississippi, 39601, United States boundary administrative 0.571820093574305 United States us Americas Northern America
+energy and minerals 2021-02-03 24228476 node Pathfinder energy service, 1111, Southern Minerals Road, Corpus Christi, Nueces County, Texas, 78409, United States building industrial 0.201 United States us Americas Northern America
+whoi 2021-02-03 190610226 way WHOI - Rose Garden, Falmouth, Barnstable County, Massachusetts, United States leisure park 0.25 United States us Americas Northern America
+illinois natural history survey 2021-02-03 2344232 node Illinois Natural History Survey Area, Moultrie County, Illinois, 61951, United States leisure park 0.55 United States us Americas Northern America
+university of arizona 2021-02-03 117399379 way University of Arizona, East Polk Street, Central City, Phoenix, Maricopa County, Arizona, 85004, United States amenity university 0.301 United States us Americas Northern America
+california state university in chico 2021-02-03 96242249 way California State University, Chico, 400, West 1st Street, Chico, Butte County, California, 95929, United States amenity university 0.842852642190115 United States us Americas Northern America
+mount discovery 2021-02-03 2597020 node Mount Discovery, Essex County, New York, 12950, United States natural peak 0.5 United States us Americas Northern America
+jefferson parish 2021-02-03 258214613 relation Jefferson Parish, Louisiana, United States boundary administrative 0.685339066716717 United States us Americas Northern America
+rutgers university 2021-02-03 153113578 way Zimmerli Art Museum, 71, Hamilton Street, New Brunswick, Middlesex County, New Jersey, 08901-1248, United States tourism museum 0.313940046679794 United States us Americas Northern America
+hawks 2021-02-03 435217 node Hawks, Bismark Township, Presque Isle County, Michigan, 49743, United States place hamlet 0.35 United States us Americas Northern America
+hopewell 2021-02-03 259361968 relation Hopewell, Virginia, United States boundary administrative 0.579389836000794 United States us Americas Northern America
+university of puget sound 2021-02-03 95240431 way University of Puget Sound, 1500, North Warner Street, Tacoma, Pierce County, Washington, 98416, United States amenity university 0.841004242546897 United States us Americas Northern America
+university of denver 2021-02-03 14604373 node University of Denver, 1901, East Buchtel Boulevard, Denver, Denver County, Colorado, 80210, United States railway station 0.466903631515068 United States us Americas Northern America
+council on foreign relations 2021-02-03 2638895 node Council on Foreign Relations, 58, East 68th Street, Upper East Side, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States office association 0.401 United States us Americas Northern America
+university of south alabama in mobile 2021-02-03 2909833 node University of South Alabama, USA South Drive, West Hill, Mobile, Mobile County, Alabama, 36688, United States amenity university 0.501 United States us Americas Northern America
+ncar 2021-02-03 100783959 way National Center for Atmospheric Research Mesa Lab, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States building government 0.491849073716688 United States us Americas Northern America
+pacific northwest 2021-02-03 257884713 relation Pacific, King County, Washington, United States boundary administrative 0.511447002935904 United States us Americas Northern America
+illinois institute of technology 2021-02-03 127098290 way Illinois Institute of Technology, East 30th Street, Douglas, Chicago, Cook County, Illinois, 60616, United States amenity university 0.879673085462407 United States us Americas Northern America
+national heart 2021-02-03 356190 node Heart, Fulton County, Arkansas, 72539, United States place hamlet 0.35 United States us Americas Northern America
+university of north carolina 2021-02-03 258459202 relation University of North Carolina, South Columbia Street, Downtown, Chapel Hill, Orange County, North Carolina, 27516, United States amenity university 0.982889212190386 United States us Americas Northern America
+university of nebraska medical center 2021-02-03 243858337 way University of Nebraska Medical Center, Dewey Avenue, Omaha, Douglas County, Nebraska, 68198, United States amenity university 0.501 United States us Americas Northern America
+nasa ames research center 2021-02-03 298990599 way NASA Ames Conference Center (NACC) Building 3, South Akron Road, Ames Research Center, Santa Clara County, California, 94035-0016, United States building yes 0.401 United States us Americas Northern America
+national academy of sciences usa 2021-02-03 106787905 way National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States office ngo 1.00593943258948 United States us Americas Northern America
+college of wooster 2021-02-03 162127042 way College of Wooster, 1189, Beall Avenue, Wooster Public Square Historic District, Wooster, Wayne County, Ohio, 44691, United States amenity college 0.72322557465216 United States us Americas Northern America
+jci 2021-02-03 254337932 way 1100, JCI, Selma, Johnston County, North Carolina, 27576, United States landuse industrial 0.3 United States us Americas Northern America
+ucla medical center 2021-02-03 19477330 node UCLA Medical Center, Westwood Plaza, Westwood Village, Westwood, Los Angeles, Los Angeles County, California, 90095, United States highway bus_stop 0.301 United States us Americas Northern America
+institute of immunology 2021-02-03 54695744 node Allergy Asthma & Immunology Institute: Laura Ispas-Ponas, MD, 19455, Deerfield Avenue, Lansdowne Woods of Virginia, Lansdowne, Loudoun County, Virginia, 20176, United States amenity doctors 0.301 United States us Americas Northern America
+greenwood genetic center 2021-02-03 121423652 way Greenwood Genetic Center, Columbia Office, 1911, Pulaski Street, Elmwood, Columbia, Richland County, South Carolina, 29201, United States building yes 0.301 United States us Americas Northern America
+u.s. national academy of sciences 2021-02-03 106787905 way National Academy of Sciences, C Street Northwest, Washington, District of Columbia, 20520, United States office ngo 1.20593943258948 United States us Americas Northern America
+j. craig venter institute 2021-02-03 183799690 way J. Craig Venter Institute, Capricorn Lane, San Diego, San Diego County, California, 92093, United States building university 0.401 United States us Americas Northern America
+university of nebraska omaha 2021-02-03 133934557 way University of Nebraska at Omaha, University Drive South, Omaha, Douglas County, Nebraska, 68182, United States amenity university 0.784723197268746 United States us Americas Northern America
+seven sons 2021-02-03 89368026 way Seven Sons Road, Grant County, New Mexico, 88026, United States highway residential 0.3 United States us Americas Northern America
+university of southern california 2021-02-03 128225751 way University of Southern California, West Jefferson Boulevard, University Park, Los Angeles, Los Angeles County, California, 90089, United States amenity university 1.01587616839984 United States us Americas Northern America
+colorado school of mines 2021-02-03 98946169 way Colorado School of Mines, 1500, Illinois Street, Golden, Jefferson County, Colorado, 80401, United States amenity university 0.401 United States us Americas Northern America
+royal scientific society 2021-02-03 174783944 way Rensselaer Society of Engineers, 1501, Sage Avenue, City of Troy, Rensselaer County, New York, 12180, United States building house 0.101 United States us Americas Northern America
+venter institute 2021-02-03 183799690 way J. Craig Venter Institute, Capricorn Lane, San Diego, San Diego County, California, 92093, United States building university 0.201 United States us Americas Northern America
+uw medicine 2021-02-03 151366370 way UW Medicine, North 205th Street - 244th Street Southwest, Edmonds, Snohomish County, Washington, 98026, United States building yes 0.201 United States us Americas Northern America
+environmental progress 2021-02-03 151121616 way ACF Environmental, 25, Progress Avenue, Nashua, Hillsborough County, New Hampshire, 03062, United States building yes 0.201 United States us Americas Northern America
+university of maine 2021-02-03 129690497 way University of Maine Orono, Charles Street, Orono, Penobscot County, Maine, 04473, United States amenity university 0.782803577509063 United States us Americas Northern America
+unavco 2021-02-03 125153322 way UNAVCO, Inc, 6350, Nautilus Drive, Boulder, Boulder County, Colorado, 80301, United States building office 0.26265143530573 United States us Americas Northern America
+new york university langone medical center 2021-02-03 125494622 way NYU Langone Medical Center, East 30th Street, Kips Bay, Manhattan Community Board 6, Manhattan, New York County, New York, 10016, United States amenity hospital 0.853159798268413 United States us Americas Northern America
+washington times 2021-02-03 162772326 way Washington Times, 3600, New York Avenue Northeast, Washington, District of Columbia, 20002, United States office newspaper 0.201 United States us Americas Northern America
+smithsonian 2021-02-03 5566830 node Smithsonian American Art Museum, 750, 9th Street Northwest, Penn Quarter, Washington, District of Columbia, 20001, United States tourism museum 0.591127986916952 United States us Americas Northern America
+center for ethics 2021-02-03 78586365 node Center for Applied Ethics, 221, 10th Avenue East, Menomonie, Dunn County, Wisconsin, 54751, United States office research 0.301 United States us Americas Northern America
+national academies 2021-02-03 158007717 way Bergen County Academies, NJ 4, Hackensack, Bergen County, New Jersey, 07646:07666, United States amenity school 0.451332014915526 United States us Americas Northern America
+overlea high school 2021-02-03 111694033 way Overlea High School, Wildwood Avenue, Linhigh, Overlea, Baltimore County, Maryland, 21206, United States amenity school 0.301 United States us Americas Northern America
+mission blue 2021-02-03 258451463 relation Mission, Umatilla County, Oregon, United States boundary administrative 0.424032054467804 United States us Americas Northern America
+acceleron 2021-02-03 169075485 way 24, Acceleron Pharma, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States landuse commercial 0.3 United States us Americas Northern America
+woodrow wilson international center for scholars 2021-02-03 47333285 node Woodrow Wilson International Center for Scholars, 1300, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20004, United States office government 1.00659791861715 United States us Americas Northern America
+department of labor 2021-02-03 196192727 way Department of Labor, 550, South 16th Street, Capitol View, Haymarket, Lincoln, Lancaster County, Nebraska, 68508, United States office government 0.301 United States us Americas Northern America
+snyder 2021-02-03 259276147 relation Snyder, Scurry County, Texas, United States boundary administrative 0.571174722238935 United States us Americas Northern America
+merck, johnson & johnson 2021-02-03 210048712 way Merck Campus, De Soto, Johnson County, Kansas, United States landuse industrial 0.5 United States us Americas Northern America
+future of research 2021-02-03 258950849 relation Future Energy and Advanced Manufacturing, Technology Trail, GE Global Research Center, Niskayuna, Schenectady County, New York, 12309, United States building industrial 0.201 United States us Americas Northern America
+bu 2021-02-03 258894158 relation Boston University, Brighton Avenue, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134, United States amenity university 0.582119069629869 United States us Americas Northern America
+national ecological observatory network 2021-02-03 39615877 node National Ecological Observatory Network, 1685, 38th Street, Boulder, Boulder County, Colorado, 80301, United States office research 0.401 United States us Americas Northern America
+children's hospital boston 2021-02-03 146447101 way Boston Children's Hospital, 300, Blackfan Street, Boston, Suffolk County, Massachusetts, 02115, United States amenity hospital 0.763455742331178 United States us Americas Northern America
+houston methodist research institute 2021-02-03 147281798 way Houston Methodist Research Institute, 6670, Bertner Avenue, Texas Medical Center, Houston, Harris County, Texas, 77030, United States building hospital 0.401 United States us Americas Northern America
+lund university 2021-02-03 141557155 way Lund Building, University Drive, Duluth, Saint Louis County, Minnesota, 55812, United States building yes 0.201 United States us Americas Northern America
+university of texas health science center 2021-02-03 2459452 node The University of Texas Health Science Center, 7000, Fannin Street, Texas Medical Center, Houston, Harris County, Texas, 77030, United States amenity university 0.938041195081873 United States us Americas Northern America
+weeden 2021-02-03 2424327 node Weeden Hill, Windsor, Windsor County, Vermont, United States natural peak 0.4 United States us Americas Northern America
+harvard school of public health 2021-02-03 146383535 way Harvard School of Public Health, Huntington Avenue, Roxbury, Boston, Suffolk County, Massachusetts, 02120, United States amenity university 0.885556884947779 United States us Americas Northern America
+georgia state university 2021-02-03 212195433 way Georgia State University, 33, Gilmer Street Southeast, Five Points, Atlanta, Fulton County, Georgia, 30303, United States amenity university 0.76661634303041 United States us Americas Northern America
+office of new drugs 2021-02-03 43881066 node Drugs, 1st Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States amenity pharmacy 0.201 United States us Americas Northern America
+covanta 2021-02-03 108431439 way Covanta, Hempstead, Nassau County, New York, United States landuse industrial 0.3 United States us Americas Northern America
+argonne 2021-02-03 396960 node Argonne, Town of Argonne, Forest County, Wisconsin, 54511, United States place village 0.356321943137092 United States us Americas Northern America
+corte madera 2021-02-03 258504269 relation Corte Madera, Marin County, California, 94925, United States boundary administrative 0.633600484003591 United States us Americas Northern America
+humane society 2021-02-03 38478592 node The Humane Society, 7115, Georgia Avenue Northwest, Shepherd Park, Washington, District of Columbia, 20012, United States shop pet 0.201 United States us Americas Northern America
+georgia institute of technology 2021-02-03 258761291 relation Georgia Institute of Technology, West Peachtree Street Northwest, Atlanta, Fulton County, Georgia, 30309, United States amenity university 0.951690746237686 United States us Americas Northern America
+nebraska 2021-02-03 257963338 relation Nebraska, United States boundary administrative 0.799657112825905 United States us Americas Northern America
+california 2021-02-03 258350986 relation California, United States boundary administrative 0.912136384157707 United States us Americas Northern America
+los alamos 2021-02-03 257505561 relation Los Alamos, Los Alamos County, New Mexico, United States boundary administrative 0.677156057530702 United States us Americas Northern America
+delta 2021-02-03 258432495 relation Delta County, Texas, United States boundary administrative 0.656415995814331 United States us Americas Northern America
+osaka university 2021-02-03 74378542 node Osaka, University Mall, University Place, Orem, Utah County, Utah, 84604, United States amenity restaurant 0.201 United States us Americas Northern America
+agency 2021-02-03 258146830 relation Agency, Wapello County, Iowa, 52530, United States boundary administrative 0.53283621062172 United States us Americas Northern America
+aphis 2021-02-03 259242165 relation Lake Aphis, Klamath County, Oregon, United States natural water 0.3 United States us Americas Northern America
+us massachusetts institute of technology 2021-02-03 258016252 relation Massachusetts Institute of Technology, Bishop Allen Drive, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States amenity university 1.14674262776464 United States us Americas Northern America
+space and technology 2021-02-03 177657788 way Holding Space Gallery, 3546, Michigan Avenue, Clark Street Technology Park, Detroit, Wayne County, Michigan, 48216, United States building commercial 0.201 United States us Americas Northern America
+florida state 2021-02-03 257824147 relation Florida, United States boundary administrative 0.951213972798062 United States us Americas Northern America
+foundation 2021-02-03 49534292 node Foundation, Monahans, Ward County, Texas, 79756, United States place neighbourhood 0.35 United States us Americas Northern America
+ohio state university medical center 2021-02-03 178969993 way Wexner Medical Center at The Ohio State University, 410, West Tenth Avenue, University District District 4, Columbus, Franklin, Ohio, 43210, United States amenity hospital 0.700804307025448 United States us Americas Northern America
+humane society of the united states 2021-02-03 38478592 node The Humane Society, 7115, Georgia Avenue Northwest, Shepherd Park, Washington, District of Columbia, 20012, United States shop pet 0.601 United States us Americas Northern America
+clinical center 2021-02-03 97490319 way Clinical Center, Deaconess Road, Boston, Suffolk County, Massachusetts, 02120, United States building yes 0.201 United States us Americas Northern America
+philip campbell 2021-02-03 141178973 way Saint Philip School, North Campbell Avenue, West Ridge, Rogers Park, Chicago, Jefferson Township, Cook County, Illinois, 60645, United States amenity school 0.201 United States us Americas Northern America
+university of valencia 2021-02-03 2809389 node Loyola University, Valencia Street, Westlake South, Westlake, Los Angeles, Los Angeles County, California, 90057-4101, United States amenity school 0.565618504568294 United States us Americas Northern America
+slac 2021-02-03 299175282 way Stanford Linear Accelerator Center National Accelerator Laboratory, Sand Hill Road, Menlo Park, San Mateo County, California, 94028, United States amenity research_center 0.427082745074033 United States us Americas Northern America
+twas 2021-02-03 298656564 way Twas the Night Before Christmas, Spirit of Christmas Lane, Jefferson Township, Berks County, Pennsylvania, United States tourism attraction 0.101 United States us Americas Northern America
+carnegie institution of washington dc 2021-02-03 106777669 way Carnegie Institution Building, 1530, P Street Northwest, Logan Circle/Shaw, Dupont Circle, Washington, District of Columbia, 2005, United States building yes 0.574617736328324 United States us Americas Northern America
+funk 2021-02-03 258441607 relation Funk, Phelps County, Nebraska, United States boundary administrative 0.437009666411203 United States us Americas Northern America
+parker foundation 2021-02-03 185560955 way Allen Park, Metropolitan, Monahans, Ward County, Texas, United States leisure park 0.15 United States us Americas Northern America
+university of nevada 2021-02-03 253996236 way University of Nevada, Las Vegas, 4505, East Tropicana Avenue, Midtown UNLV, Las Vegas, Clark County, Nevada, 89154, United States amenity university 0.783772660357429 United States us Americas Northern America
+task force for global health 2021-02-03 103398915 way The Task Force for Global Health, 325, Swanton Way, Oakhurst, Decatur, DeKalb County, Georgia, 30030, United States building office 0.501 United States us Americas Northern America
+university of california, berkeley 2021-02-03 258416614 relation University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States amenity university 1.0481943782617 United States us Americas Northern America
+pixar 2021-02-03 70771733 node Pixar, Park Avenue, Emeryville, Alameda County, California, 94608, United States highway bus_stop 0.101 United States us Americas Northern America
+stanford medical center 2021-02-03 63574186 node Stanford Medical Center, Quarry Road Extension, Stanford, Palo Alto, Santa Clara County, California, 94305-6015, United States highway bus_stop 0.301 United States us Americas Northern America
+opal 2021-02-03 258462411 relation Opal, Lincoln County, Wyoming, United States boundary administrative 0.446398790789336 United States us Americas Northern America
+white oak conservation center 2021-02-03 253782332 way Conservation Center, Inner Loop, Houston, Harris County, Texas, 77024-8022, United States building yes 0.201 United States us Americas Northern America
+national institutes of health 2021-02-03 102178084 way National Institutes of Health, Glenwood, Bethesda, Montgomery County, Maryland, United States landuse commercial 0.6 United States us Americas Northern America
+university of alaska 2021-02-03 208243462 way University of Alaska, 45, Baranov Road, Cold Bay, Aleutians East, Alaska, 99571, United States amenity university 0.301 United States us Americas Northern America
+arizona state 2021-02-03 257489274 relation Arizona, United States boundary administrative 0.923799492478004 United States us Americas Northern America
+lb myrtle 2021-02-03 89847089 way Myrtle, Houston, Harris County, Texas, 77054, United States highway residential 0.2 United States us Americas Northern America
+pennsylvania state university 2021-02-03 147721263 way Air Quality Learning and Demonstration Center, Air Quality Lane, Ferguson Township, Centre County, Pennsylvania, 16803, United States tourism attraction 0.201 United States us Americas Northern America
+yale 2021-02-03 257391646 relation Yale, Guthrie County, Iowa, United States boundary administrative 0.531727684347105 United States us Americas Northern America
+office for science 2021-02-03 3035430 node The Mary Baker Eddy Library for the Betterment of Humanity, Christian Science Plaza, South End, Boston, Suffolk County, Massachusetts, 02115, United States amenity library 0.470074815609084 United States us Americas Northern America
+harvard business school 2021-02-03 2751379 node Harvard Business School, Harvard Way, Allston, Boston, Suffolk County, Massachusetts, 02138-3824, United States amenity university 0.839985702342783 United States us Americas Northern America
+us air force 2021-02-03 226151743 way US Air Force, East Steamboat Avenue, Aurora, Arapahoe County, Colorado, 80017, United States tourism camp_site 0.301 United States us Americas Northern America
+nature 2021-02-03 106841545 way Nature, Woodbury Lane, Woodbury, Irvine, Orange County, California, 92620, United States highway residential 0.2 United States us Americas Northern America
+eli lilly of indianapolis 2021-02-03 149502343 way Eli Lilly Aviation, 2800, South High School Road, Indianapolis, Indiana, 46241, United States aeroway hangar 0.301 United States us Americas Northern America
+nih clinical center 2021-02-03 101358622 way NIH Clinical Center, 10, Center Drive, National Institutes of Health, Maplewood, Bethesda, Montgomery County, Maryland, 20892, United States building hospital 0.615064072959253 United States us Americas Northern America
+sutter health 2021-02-03 17827506 node Sutter Health, Garden Highway, Sacramento, Sacramento County, California, 95605, United States building office 0.201 United States us Americas Northern America
+colorado state university in fort collins 2021-02-03 259127396 relation Colorado State University, Spring Park Drive, Fort Collins, Larimer County, Colorado, 80525-1424, United States amenity university 1.09485313259475 United States us Americas Northern America
+temple university 2021-02-03 202219991 way Temple University, Dondill Place, Yorktown, Philadelphia, Philadelphia County, Pennsylvania, 19122, United States amenity university 0.73236936447695 United States us Americas Northern America
+council 2021-02-03 257438176 relation Council, Adams County, Idaho, United States boundary administrative 0.474154132137857 United States us Americas Northern America
+louisiana state university in baton rouge 2021-02-03 100338394 way Louisiana State University, West Lakeshore Drive, College Town, Baton Rouge, East Baton Rouge Parish, Louisiana, 70802, United States amenity university 1.05035884372188 United States us Americas Northern America
+jefferson 2021-02-03 258358929 relation Jefferson County, Texas, United States boundary administrative 0.657913863605315 United States us Americas Northern America
+ohsu 2021-02-03 200879490 way OHSU Center For Health And Healing, 3303, Southwest Bond Avenue, South Portland, Portland, Metro, Oregon, 97239, United States building yes 0.307534521399027 United States us Americas Northern America
+colville 2021-02-03 257341974 relation Colville, Stevens County, Washington, United States boundary administrative 0.47774807032046 United States us Americas Northern America
+biogen idec 2021-02-03 249632722 way Biogen Idec, 115, Broadway, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States building commercial 0.201 United States us Americas Northern America
+university of california berkeley 2021-02-03 258416614 relation University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States amenity university 1.0481943782617 United States us Americas Northern America
+oxford west 2021-02-03 196505852 way Oxford West, Paramount Estates, Auburn Hills, Oakland County, Michigan, 48309-4427, United States highway residential 0.3 United States us Americas Northern America
+san diego zoo 2021-02-03 98616149 way San Diego Zoo, 2920, Zoo Drive, Hillcrest, San Diego, San Diego County, California, 92103-3607, United States tourism zoo 0.736514462001523 United States us Americas Northern America
+northrop 2021-02-03 258364217 relation Northrop, Martin County, Minnesota, 56075, United States boundary administrative 0.527022409876486 United States us Americas Northern America
+american geophysical union 2021-02-03 34377963 node American Geophysical Union, 2000, Florida Avenue Northwest, Washington, District of Columbia, 20009, United States office research 0.765817363739393 United States us Americas Northern America
+jupiters 2021-02-03 151252671 way Jupiter's, 1350, Smith Avenue, Mt Washington Mill, Baltimore, Maryland, 21209, United States amenity restaurant 0.001 United States us Americas Northern America
+university of nebraska 2021-02-03 150693073 way University of Nebraska, Lincoln - Practice Field, Avery Avenue, North Bottoms, Haymarket, Lincoln, Lancaster County, Nebraska, 68588, United States leisure pitch 0.301 United States us Americas Northern America
+emory university 2021-02-03 104443074 way Emory University, Healthgate Drive, Emory Highlands, Druid Hills, DeKalb County, Georgia, 30322, United States amenity university 0.722006836447408 United States us Americas Northern America
+cornell 2021-02-03 257370146 relation Cornell, Livingston County, Illinois, United States boundary administrative 0.526110221552319 United States us Americas Northern America
+national center for atmospheric research 2021-02-03 47686315 node NCAR Exhibits, 1850, Table Mesa Drive, National Center for Atmospheric Research (NCAR), Boulder, Boulder County, Colorado, 80305, United States tourism museum 0.501 United States us Americas Northern America
+black lives matter 2021-02-03 193863362 way Black Lives Matter Plaza Northwest, Golden Triangle, Washington, District of Columbia, 20012, United States highway secondary 0.4 United States us Americas Northern America
+ccdc 2021-02-03 103502726 way Child Care Development Center, West Van Week Street, Edinburg, Hidalgo County, Texas, 78539, United States building yes 0.001 United States us Americas Northern America
+piper jaffray 2021-02-03 11509658 node Piper Jaffray, 53, Vantis Drive, Vantis, Aliso Viejo, Orange County, California, 92656, United States shop financial_services 0.201 United States us Americas Northern America
+university of north carolina-chapel hill 2021-02-03 258459202 relation University of North Carolina, South Columbia Street, Downtown, Chapel Hill, Orange County, North Carolina, 27516, United States amenity university 1.18288921219039 United States us Americas Northern America
+janssen pharmaceuticals 2021-02-03 171007297 way Janssen Pharmaceuticals, Ortho Drive, Raritan, Somerset County, New Jersey, 08869, United States building yes 0.201 United States us Americas Northern America
+tama 2021-02-03 258588234 relation Tama County, Iowa, United States boundary administrative 0.608199002879145 United States us Americas Northern America
+university of minnesota 2021-02-03 100997326 way Bell Museum of Natural History, 10, Southeast Church Street, Minneapolis, Hennepin County, Minnesota, 55455, United States tourism museum 0.523386683132434 United States us Americas Northern America
+hopewell culture national historical park 2021-02-03 259178645 relation Hopewell Culture National Historical Park, Ross County, Ohio, United States leisure park 0.92962282009393 United States us Americas Northern America
+lsu 2021-02-03 100338394 way Louisiana State University, West Lakeshore Drive, College Town, Baton Rouge, East Baton Rouge Parish, Louisiana, 70802, United States amenity university 0.550358843721885 United States us Americas Northern America
+tucson 2021-02-03 258050070 relation Tucson, Pima County, Arizona, United States boundary administrative 0.70803284036725 United States us Americas Northern America
+mitre corporation 2021-02-03 103399470 way The MITRE Corporation, 202, Burlington Road, Bedford, Middlesex County, Massachusetts, 01730, United States building office 0.201 United States us Americas Northern America
+national engineering technology research center 2021-02-03 105357679 way Engineering Systems Building, Technology Trail, GE Global Research Center, Niskayuna, Schenectady County, New York, 12309, United States building industrial 0.401 United States us Americas Northern America
+masten space systems of mojave 2021-02-03 82389889 node Masten Space Systems, 1570, Sabovich Street, Mojave, Kern County, California, 93501, United States office company 0.744815486121403 United States us Americas Northern America
+national mining association 2021-02-03 3185607 node Western Minnesota Mining Association Placer Mine, Mazourka Canyon Road, Inyo County, California, United States landuse quarry 0.201 United States us Americas Northern America
+national institute of food and agriculture 2021-02-03 102637103 way National Institute of Food and Agriculture, Waterfront Centre, 9th Street Southwest, Southwest Waterfront, Washington, District of Columbia, 20024, United States building yes 0.906728041583383 United States us Americas Northern America
+boston university school of medicine 2021-02-03 14708091 node Boston University School of Medicine, Harrison Avenue, South End, Boston, Suffolk County, Massachusetts, 02118, United States amenity university 0.501 United States us Americas Northern America
+thirty meter telescope 2021-02-03 5539908 node Thirty Meter Telescope, Mauna Kea Access Road, Hawaiʻi County, Hawaii, United States man_made telescope 0.654348884656857 United States us Americas Northern America
+across mexico 2021-02-03 238602315 way RMZ 1 Cut Across Road, San Juan County, New Mexico, United States highway service 0.275 United States us Americas Northern America
+cornell laboratory of ornithology 2021-02-03 544921 node 159, Cornell Laboratory of Ornithology, Lansing, Lansing Town, Tompkins County, New York, 14850, United States place locality 0.525 United States us Americas Northern America
+raven aerostar 2021-02-03 241681489 way Raven Aerostar, Northeast 3rd Street, Madison, Lake County, South Dakota, 57042, United States building industrial 0.201 United States us Americas Northern America
+missouri 2021-02-03 258150217 relation Missouri, United States boundary administrative 0.832881344700329 United States us Americas Northern America
+national center for health research 2021-02-03 182466192 way CHER, West 2nd Street, Morehead, Rowan County, Kentucky, 40351, United States building school 0.001 United States us Americas Northern America
+csh vienna 2021-02-03 70048369 node Vienna, Recreation Drive, Sunnyvale, Santa Clara County, California, 94089-2701, United States railway station 0.383208261767925 United States us Americas Northern America
+american meteorological society 2021-02-03 80718663 node American Meteorological Society, 45, Beacon Street, Downtown Crossing, Beacon Hill, Boston, Suffolk County, Massachusetts, 02108, United States office association 0.301 United States us Americas Northern America
+university of wisconsin-madison 2021-02-03 259436351 relation University of Wisconsin-Madison, Lake Mendota Drive, Madison, Dane County, Wisconsin, 53705, United States amenity university 0.980768897517013 United States us Americas Northern America
+national research foundation 2021-02-03 123853626 way Research Parkway, Presbyterian Health Foundation, Oklahoma City, Oklahoma County, Oklahoma, 73104, United States highway unclassified 0.3 United States us Americas Northern America
+abbott 2021-02-03 258779362 relation Abbott, Hill County, Texas, 76621, United States boundary administrative 0.53646269181841 United States us Americas Northern America
+fallon paiute-shoshone tribe 2021-02-03 231265905 way Fallon Paiute - Shoshone Tribe, Fallon, Churchill County, Nevada, United States boundary aboriginal_lands 0.525 United States us Americas Northern America
+bureau of land management 2021-02-03 83548763 node Bureau of Land Management, 1849, C Street Northwest, Washington, District of Columbia, 20240, United States office government 0.910062690742063 United States us Americas Northern America
+college of southern nevada 2021-02-03 112597747 way College of Southern Nevada, Mosswood Drive, Henderson, Clark County, Nevada, 89015, United States amenity college 0.401 United States us Americas Northern America
+genome analysis centre 2021-02-03 170711270 way Genome Analysis Center, 830, West Campus Drive, West Haven, New Haven County, Connecticut, 06516, United States building university 0.201 United States us Americas Northern America
+university of southern california in los angeles 2021-02-03 128225751 way University of Southern California, West Jefferson Boulevard, University Park, Los Angeles, Los Angeles County, California, 90089, United States amenity university 1.21587616839984 United States us Americas Northern America
+building opportunities for self-sufficiency 2021-02-03 68032222 node BOSS, 1916;1918, University Avenue, Downtown Berkeley, Berkeley, Alameda County, California, 94704, United States office ngo 0.101 United States us Americas Northern America
+exxon mobil 2021-02-03 242205522 way Exxon Mobil, Helena, Lewis and Clark County, Montana, United States landuse industrial 0.4 United States us Americas Northern America
+earth system science centre 2021-02-03 54925314 node Center for Science in the Earth System, 3737, Brooklyn Avenue Northeast, University District, Seattle, King County, Washington, 98105-6286, United States office research 0.301 United States us Americas Northern America
+institute of mathematical sciences 2021-02-03 55398385 node Courant Institute of Mathematical Sciences, 251, Mercer Street, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10012, United States amenity university 0.822385266730329 United States us Americas Northern America
+foundation for biomedical research 2021-02-03 2988264 node Worcester Foundation for Biomedical Research, 222, Maple Avenue, Fairlawn, Shrewsbury, Worcester County, Massachusetts, 01545, United States building yes 0.401 United States us Americas Northern America
+williams college 2021-02-03 2700617 node Williams College, Hopkins Hall Drive, Williamstown, Berkshire County, Massachusetts, 01267, United States amenity college 0.705335713109323 United States us Americas Northern America
+the washington times 2021-02-03 162772326 way Washington Times, 3600, New York Avenue Northeast, Washington, District of Columbia, 20002, United States office newspaper 0.301 United States us Americas Northern America
+un children's fund 2021-02-03 3035691 node Children's Trust Fund Resource Library, 350, Washington Street, Downtown Crossing, Financial District, Boston, Suffolk County, Massachusetts, 02110-1301, United States amenity library 0.401 United States us Americas Northern America
+the university of california 2021-02-03 258416614 relation University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States amenity university 0.948194378261701 United States us Americas Northern America
+alphabet 2021-02-03 225684906 way Alphabet, Horace Mann, Japantown, San Jose, Santa Clara County, California, 95112-3580, United States highway footway 0.175 United States us Americas Northern America
+university of notre dame 2021-02-03 148464630 way University of Notre Dame du Lac, West Pokagon Street, North Shore Triangle, South Bend, Saint Joseph County, Indiana, 46556, United States amenity university 0.970403619291787 United States us Americas Northern America
+web of science 2021-02-03 64913555 node Web Science and Digital Libraries Research Group, 4600, Elkhorn Avenue, Norfolk, Virginia, 23508, United States office yes 0.201 United States us Americas Northern America
+quest diagnostics 2021-02-03 80813530 node Quest Diagnostics, 319, Longwood Avenue, Boston, Suffolk County, Massachusetts, 02115, United States place house 0.481311730611622 United States us Americas Northern America
+wellesley college 2021-02-03 119472640 way Wellesley College, Cross Street, College Heights, Wellesley, Norfolk County, Massachusetts, 02482, United States amenity college 0.70312816120194 United States us Americas Northern America
+carnegie observatories 2021-02-03 158103230 way The Carnegie Observatories, 813, Santa Barbara Street, Bungalow Heaven, Pasadena, Los Angeles County, California, 91101, United States office research 0.201 United States us Americas Northern America
+bronx zoo 2021-02-03 101896162 way Bronx Zoo, Bronx River Parkway, The Bronx, Bronx County, New York, 10460, United States tourism zoo 0.641531223132584 United States us Americas Northern America
+university of north carolina greensboro 2021-02-03 198171825 way University of North Carolina - Greensboro, West Market Street, Westerwood, Greensboro, Guilford County, North Carolina, 27403, United States amenity university 0.501 United States us Americas Northern America
+texas 2021-02-03 257418219 relation Texas, United States boundary administrative 0.858052139534058 United States us Americas Northern America
+virginia tech 2021-02-03 258252884 relation Virginia Polytechnic Institute and State University, Drillfield Drive, Blacksburg, Montgomery County, Virginia, 24061, United States amenity university 0.724377849520944 United States us Americas Northern America
+boston university 2021-02-03 258894158 relation Boston University, Brighton Avenue, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134, United States amenity university 0.782119069629869 United States us Americas Northern America
+cu boulder 2021-02-03 102922622 way CU Events Center, 950, Regent Drive, Boulder, Boulder County, Colorado, 80310, United States leisure sports_centre 0.562945678183792 United States us Americas Northern America
+irving 2021-02-03 258777731 relation Irving, Dallas County, Texas, United States boundary administrative 0.616662915473728 United States us Americas Northern America
+b612 foundation of mill valley 2021-02-03 80081794 node B612 Foundation, 20, Sunnyside Avenue, Mill Valley, Marin County, California, 94941, United States office foundation 0.401 United States us Americas Northern America
+university of colorado boulder 2021-02-03 103270225 way Museum of Natural History - Henderson Building, 1030, Broadway, The Hill, Boulder, Boulder County, Colorado, 80802, United States tourism museum 0.556321943137092 United States us Americas Northern America
+jackson laboratory 2021-02-03 100308447 way The Jackson Laboratory, 600, Main Street, Bar Harbor, Hancock County, Maine, 04609, United States amenity research_institute 0.201 United States us Americas Northern America
+gadzooks 2021-02-03 163941067 way Gadzooks Drive, Silver Ridge, Sandy, Salt Lake County, Utah, 84020, United States highway residential 0.2 United States us Americas Northern America
+uta 2021-02-03 257844025 relation Utah, United States boundary administrative 0.803765430740067 United States us Americas Northern America
+liberal 2021-02-03 258136520 relation Liberal, Seward County, Kansas, United States boundary administrative 0.57453184281069 United States us Americas Northern America
+university of california los angeles 2021-02-03 258998179 relation University of California, Los Angeles, Westholme Avenue, Westwood, Los Angeles, Los Angeles County, California, 90095, United States amenity university 0.501 United States us Americas Northern America
+cwru 2021-02-03 259081536 relation Case Western Reserve University, 10900, Euclid Avenue, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States amenity university 0.514467419199317 United States us Americas Northern America
+joint institute 2021-02-03 96516634 way Joint Institute for Lab Astrophysics, 1900, Colorado Avenue, The Hill, Boulder, Boulder County, Colorado, 80309, United States building university 0.526239076957718 United States us Americas Northern America
+university of california, santa barbara 2021-02-03 205319990 way University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States place locality 0.625 United States us Americas Northern America
+gallaher 2021-02-03 387807 node Gallaher, Curry County, New Mexico, 88103, United States place hamlet 0.35 United States us Americas Northern America
+lockheed martin of denver 2021-02-03 69800309 node Lockheed Martin, North Mathilda Avenue, Sunnyvale, Santa Clara County, California, 94089, United States railway station 0.51689306175332 United States us Americas Northern America
+maharishi university of management 2021-02-03 232195936 way Maharishi International University, 1000, North 4th Street, Fairfield, Jefferson County, Iowa, 52557, United States amenity university 0.201 United States us Americas Northern America
+university of bergen 2021-02-03 158650789 way Fairleigh Dickinson University, Northumberland Road, Teaneck Township, Bergen County, New Jersey, 07666, United States amenity university 0.636721108965853 United States us Americas Northern America
+multidisciplinary association for psychedelic studies 2021-02-03 45297575 node Multidisciplinary Association for Psychedelic Studies (MAPS), Mission Street, Mission Street Commercial Corridor, Westside, Santa Cruz, Santa Cruz County, California, 95060, United States office financial 0.501 United States us Americas Northern America
+california department of public health 2021-02-03 178363904 way California Department of Public Health, Capitol Avenue, Sacramento, Sacramento County, California, 95811, United States building commercial 0.501 United States us Americas Northern America
+community and public sector union 2021-02-03 172957567 way The Center for Community and Public Safety, University Drive, North Union Township, Fayette County, Pennsylvania, 15465, United States building university 0.401 United States us Americas Northern America
+large binocular telescope observatory 2021-02-03 104893463 way Large Binocular Telescope, Mount Graham International Observatory Road, Old Columbine, Graham County, Arizona, United States man_made observatory 0.829506969685059 United States us Americas Northern America
+newhall 2021-02-03 257449480 relation Newhall, Benton County, Iowa, United States boundary administrative 0.53504820152981 United States us Americas Northern America
+concord university 2021-02-03 181466493 way Concord University, Oxley Road, Mercer County, West Virginia, 24712, United States amenity university 0.533256970094253 United States us Americas Northern America
+us national marine fisheries service 2021-02-03 98716401 way National Marine Fisheries Service, Santa Cruz, Santa Cruz County, California, United States boundary administrative 0.525 United States us Americas Northern America
+southern poverty law center 2021-02-03 48759870 node Southern Poverty Law Center, 400, Washington Avenue, Montgomery, Montgomery County, Alabama, 36104, United States office association 0.876048939755188 United States us Americas Northern America
+jefferies 2021-02-03 487880 node Jefferis, Menallen Township, Fayette County, Pennsylvania, 15484, United States place hamlet 0.25 United States us Americas Northern America
+monell 2021-02-03 370315 node Monell, Sweetwater County, Wyoming, United States place hamlet 0.35 United States us Americas Northern America
+university of maryland at college park 2021-02-03 198712103 way University of Maryland, College Park, Baltimore Avenue, Old Town, College Park, Prince George's County, Maryland, 20742, United States amenity university 1.15966453785279 United States us Americas Northern America
+warner 2021-02-03 257311026 relation Warner, Brown County, South Dakota, 57479, United States boundary administrative 0.448159836291227 United States us Americas Northern America
+western environmental law center 2021-02-03 45649564 node Western Environmental Law Center: Northern Rockies Office, Reeders Alley, Last Chance Gulch, Helena, Lewis and Clark County, Montana, 59601, United States office lawyer 0.401 United States us Americas Northern America
+national climate service 2021-02-03 78587650 node Climate, 5282, Monahans Avenue, The Shops at Clearfork, Fort Worth, Tarrant County, Texas, 76109, United States shop sports 0.101 United States us Americas Northern America
+duke university medical center 2021-02-03 259450641 relation Duke University, 15th Street, 9th Street District, Durham, Durham County, North Carolina, 27705, United States amenity university 0.793140337132867 United States us Americas Northern America
+monsanto 2021-02-03 336874 node Monsanto, Contra Costa County, California, 94520, United States place hamlet 0.457598476917669 United States us Americas Northern America
+department of space 2021-02-03 2969423 node Houston Fire Department Station 71, Space Center Boulevard, Houston, Harris County, Texas, 77058, United States amenity fire_station 0.201 United States us Americas Northern America
+wesleyan 2021-02-03 433666 node Wesleyan, Macon, Bibb County, Georgia, 31210, United States place neighbourhood 0.35 United States us Americas Northern America
+haverford 2021-02-03 447354 node Haverford, Lower Merion Township, Montgomery County, Pennsylvania, 19003, United States place hamlet 0.503670690295642 United States us Americas Northern America
+bruins 2021-02-03 354197 node Bruins, Crittenden County, Arkansas, United States place hamlet 0.35 United States us Americas Northern America
+oklahoma medical research foundation 2021-02-03 133234335 way Oklahoma Medical Research Foundation, Northeast 15th Street, Howes Capitol, Oklahoma City, Oklahoma County, Oklahoma, 73104, United States amenity social_facility 0.401 United States us Americas Northern America
+texas a&m university in corpus christi 2021-02-03 81754693 node Texas A&M University, Ocean Drive, Corpus Christi, Nueces County, Texas, 78418, United States highway bus_stop 0.601 United States us Americas Northern America
+us coast guard 2021-02-03 164331997 way US Coast Guard, Berlin, Worcester County, Maryland, United States landuse military 0.5 United States us Americas Northern America
+cornell lab of ornithology 2021-02-03 544921 node 159, Cornell Laboratory of Ornithology, Lansing, Lansing Town, Tompkins County, New York, 14850, United States place locality 0.525 United States us Americas Northern America
+revolutionary court 2021-02-03 89870391 way Revolutionary Court, East Pikeland Township, Chester County, Pennsylvania, 19460, United States highway residential 0.3 United States us Americas Northern America
+research university 2021-02-03 2953848 node Davies Family Research Library, 1200, Southwest Park Avenue, University District, Downtown, Portland, Metro, Oregon, 97205, United States amenity library 0.637845445938682 United States us Americas Northern America
+hawc 2021-02-03 225795834 way Gym / HAWC, Telluride Street, Aurora, Arapahoe County, Colorado, 80017, United States leisure fitness_centre 0.101 United States us Americas Northern America
+rockefeller university 2021-02-03 114891432 way Rockefeller University, 1230, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States amenity university 0.696458698335865 United States us Americas Northern America
+dupont 2021-02-03 257884857 relation DuPont, Pierce County, Washington, 98327, United States boundary administrative 0.487992348356751 United States us Americas Northern America
+ohio 2021-02-03 295875618 relation Ohio, United States boundary administrative 0.8407357649767 United States us Americas Northern America
+defenders of wildlife 2021-02-03 57901658 node Defenders of Wildlife, 1130, N Street Northwest, Dupont Circle, Washington, District of Columbia, 20037, United States tourism information 0.301 United States us Americas Northern America
+archbold biological station 2021-02-03 259248207 relation Archbold Biological Station, Highlands County, Florida, United States boundary protected_area 0.425 United States us Americas Northern America
+lockheed martin 2021-02-03 69800309 node Lockheed Martin, North Mathilda Avenue, Sunnyvale, Santa Clara County, California, 94089, United States railway station 0.51689306175332 United States us Americas Northern America
+abraxis 2021-02-03 205714967 way Pharmacia & Pfizer & Abraxis, Carretera Militar, Florida Afuera, Barceloneta, Puerto Rico, 00617, United States man_made works 0.101 United States us Americas Northern America
+bell labs 2021-02-03 177283205 way Bell Labs Sewage Treatment, Ramanessin Trail, Holmdel, Holmdel Township, Monmouth County, New Jersey, 07733, United States man_made wastewater_plant 0.201 United States us Americas Northern America
+masten space systems 2021-02-03 82389889 node Masten Space Systems, 1570, Sabovich Street, Mojave, Kern County, California, 93501, United States office company 0.644815486121403 United States us Americas Northern America
+xavier university of louisiana 2021-02-03 296045405 way Xavier University of Louisiana, 1, Drexel Drive, Mid-City, New Orleans, Orleans Parish, Louisiana, 70135, United States amenity university 0.801059138797379 United States us Americas Northern America
+youtube 2021-02-03 107269264 way YouTube, 900, Cherry Avenue, YouTube, San Bruno, San Mateo County, California, 94066, United States building commercial 0.815565438604185 United States us Americas Northern America
+kic 2021-02-03 101634590 way Mesa Del Rey Airport, Bitterwater Road, King City, Monterey County, California, 93930, United States aeroway aerodrome 0.18463416789672 United States us Americas Northern America
+high point university 2021-02-03 2719486 node High Point University, North University Parkway, High Point, Guilford County, North Carolina, 27262, United States amenity school 0.701151058873139 United States us Americas Northern America
+memorial sloan kettering cancer center 2021-02-03 210339215 way Memorial Sloan Kettering Cancer Center, 1275, York Avenue, Lenox Hill, Manhattan Community Board 8, Manhattan, New York County, New York, 10065, United States amenity hospital 0.894052338771708 United States us Americas Northern America
+battelle memorial institute 2021-02-03 194506873 way Battelle Memorial Institute, 505, King Avenue, University District District 4, Columbus, Franklin, Ohio, 43201, United States building office 0.66833684603196 United States us Americas Northern America
+southern illinois university in carbondale 2021-02-03 178049913 way Southern Illinois University at Carbondale, Susan Schumake Memorial Overpass, East Campus Housing Area, Lake Shore Drive Area, Carbondale, Jackson County, Illinois, 62901, United States amenity university 0.501 United States us Americas Northern America
+las cumbres observatory 2021-02-03 81379623 node Las Cumbres Observatory, Skyline Trail, Maui County, Hawaii, United States man_made observatory 0.50962395537125 United States us Americas Northern America
+san francisco state university 2021-02-03 96725450 way San Francisco State University, 19th Avenue, San Francisco, San Francisco City and County, California, 94132, United States amenity university 0.902969926456814 United States us Americas Northern America
+minnesota 2021-02-03 258377215 relation Minnesota, United States boundary administrative 0.831102000252045 United States us Americas Northern America
+biocurious 2021-02-03 20734454 node BioCurious, Stewart Drive, Sunnyvale, Santa Clara County, California, 94088-3453, United States leisure hackerspace 0.167710111330712 United States us Americas Northern America
+environmental justice 2021-02-03 225124870 way Literacy For Environmental Justice, 1150, Carroll Avenue, San Francisco, San Francisco City and County, California, 94188, United States building yes 0.201 United States us Americas Northern America
+citadel 2021-02-03 195543970 way The Citadel, 171, Moultrie Street, Charleston, Charleston County, South Carolina, 29409, United States amenity university 0.531222267761364 United States us Americas Northern America
+us federal communications commission 2021-02-03 301202937 node Federal Communications Commission, 45, L Street Northeast, NoMa, Near Northeast, Washington, District of Columbia, 20554, United States office government 0.894765406107107 United States us Americas Northern America
+cdcr 2021-02-03 100211824 way Prado Conservation Camp, 14467, Central Avenue, Chino, San Bernardino County, California, 91710, United States amenity fire_station 0.001 United States us Americas Northern America
+forensic science service 2021-02-03 145457220 way Forensic Science, Merton Minter, South Texas Medical Center, San Antonio, Bexar County, Texas, 78229, United States building yes 0.201 United States us Americas Northern America
+capitol hill 2021-02-03 2913454 node Capitol Hill, Washington, District of Columbia, 20540, United States place locality 0.633871158129342 United States us Americas Northern America
+ericsson 2021-02-03 258529699 relation Ericsson, Nokomis, Minneapolis, Hennepin County, Minnesota, United States boundary administrative 0.395064603083614 United States us Americas Northern America
+department of environmental quality 2021-02-03 220675454 way Department of Environmental Quality, Aspen Street, Helena, Lewis and Clark County, Montana, 59602-1217, United States office government 0.401 United States us Americas Northern America
+nevada 2021-02-03 258160832 relation Nevada, United States boundary administrative 0.808101044486331 United States us Americas Northern America
+dias 2021-02-03 100102213 way Diaz, Jackson County, Arkansas, United States boundary administrative 0.376527586886318 United States us Americas Northern America
+lunar reconnaissance orbiter 2021-02-03 16186893 node Lunar Reconnaissance Orbiter Camera Visitor Gallery, 1100, South Cady Mall, Tempe, Maricopa County, Arizona, 85287, United States tourism information 0.301 United States us Americas Northern America
+texas commission on environmental quality 2021-02-03 134581871 way Texas Commission on Environmental Quality, South Interstate 35, Parker Lane, Austin, Travis County, Texas, 78704-5639, United States building yes 0.501 United States us Americas Northern America
+nps 2021-02-03 132103655 way Martin Luther King Jr. National Historic Site, 450, Auburn Avenue Northeast, Sweet Auburn, Atlanta, Fulton County, Georgia, 30312, United States tourism museum 0.387764501888856 United States us Americas Northern America
+brigham & women's hospital 2021-02-03 258770706 relation Brigham and Women's Hospital, 75, Francis Street, Roxbury, Boston, Suffolk County, Massachusetts, 02115, United States amenity hospital 0.77720861480317 United States us Americas Northern America
+bradley university 2021-02-03 113901474 way Bradley University, 1501, West Bradley Avenue, St. James Apartments, Peoria, Peoria County, Illinois, 61625, United States amenity university 0.641769278273552 United States us Americas Northern America
+cabell 2021-02-03 399746 node Cabell, Wayne County, Kentucky, United States place hamlet 0.35 United States us Americas Northern America
+university of nebraska state museum 2021-02-03 54350454 node University of Nebraska State Museum, 645, North 14th Street, Downtown, Haymarket, Lincoln, Lancaster County, Nebraska, 68588, United States tourism museum 0.781950414040809 United States us Americas Northern America
+city college 2021-02-03 115546934 way The City College of New York, 160, Convent Avenue, Sugar Hill, Manhattan Community Board 9, Manhattan, New York County, New York, 10031, United States amenity university 0.71231196067725 United States us Americas Northern America
+aerospace corporation 2021-02-03 258788014 relation The Aerospace Corporation, 2310, East El Segundo Boulevard, El Segundo, Los Angeles County, California, 90245, United States office research 0.506728041583383 United States us Americas Northern America
+nasa federal credit union 2021-02-03 74145150 node NASA Federal Credit Union, 2452, Solomons Island Road, Dorsey Heights, Parole, Anne Arundel County, Maryland, 20776:21037, United States amenity bank 0.401 United States us Americas Northern America
+university of kansas in lawrence 2021-02-03 226545942 way University of Kansas, Louisiana Street, Malls Shopping Center, Lawrence, Douglas County, Kansas, 66046, United States amenity university 1.06269698033331 United States us Americas Northern America
+arnold 2021-02-03 257968026 relation Arnold, Jefferson County, Missouri, 63010, United States boundary administrative 0.513360018065774 United States us Americas Northern America
+morehouse school of medicine 2021-02-03 296931474 node Morehouse School of Medicine, 720, Westview Drive Southwest, Joel Chandler Harris Homes, Atlanta, Fulton County, Georgia, 30310, United States amenity university 0.740791981823335 United States us Americas Northern America
+audubon alaska 2021-02-03 86079238 way Audubon Drive, Anchorage, Alaska, 99516, United States highway residential 0.3 United States us Americas Northern America
+north-west university 2021-02-03 133962677 way Northwest University, 5520, 108th Avenue Northeast, Kirkland, King County, Washington, 98033, United States amenity university 0.64030088440925 United States us Americas Northern America
+morgan mitchell 2021-02-03 2475110 node Morgan Peak, Mitchell County, Texas, 79565, United States natural peak 0.5 United States us Americas Northern America
+manchester university 2021-02-03 182019486 way Manchester University, 604, East College Avenue, North Manchester, Wabash County, Indiana, 46962, United States amenity university 0.534623598134972 United States us Americas Northern America
+internal medicine 2021-02-03 209636367 way Internal Medicine, Chestnut Avenue, Dansville, North Dansville, Livingston County, New York, 14437, United States amenity doctors 0.201 United States us Americas Northern America
+dallas cowboys 2021-02-03 102618220 way AT&T Stadium, 900, East Randol Mill Road, Arlington, Tarrant County, Texas, 76011, United States tourism attraction 0.484986544882205 United States us Americas Northern America
+uniformed services university of the health sciences 2021-02-03 161336966 way Uniformed Services University of the Health Sciences, 4301, Jones Bridge Road, Bethesda, Montgomery County, Maryland, 20814, United States place house 1.13919785679115 United States us Americas Northern America
+oregon health and science university 2021-02-03 258885522 relation Oregon Health & Science University, Robert Hugh Baldock Freeway, South Portland, Portland, Metro, Oregon, 97258, United States amenity university 0.876527586886318 United States us Americas Northern America
+smithsonian national air and space museum 2021-02-03 106698268 way National Air and Space Museum, 655, Jefferson Drive Southwest, Washington, District of Columbia, 20560, United States tourism museum 0.942899315724623 United States us Americas Northern America
+the george washington university 2021-02-03 106978219 way George Washington University, I Street Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States amenity university 0.861031504404982 United States us Americas Northern America
+university of hawaii 2021-02-03 158423062 way University of Hawaiʻi, Lower Campus, Woodlawn Drive, Manoa, Honolulu, Honolulu County, Hawaii, 96822, United States amenity parking 0.301 United States us Americas Northern America
+moffitt cancer center 2021-02-03 196997535 way H. Lee Moffitt Cancer Center, 12902, USF Magnolia Drive, Tampa, Hillsborough County, Florida, 33612, United States amenity hospital 0.64030088440925 United States us Americas Northern America
+hoover institution 2021-02-03 103143878 way Hoover Institution on War, Revolution and Peace, Galvez Street, Stanford, Santa Clara County, California, 94305-6015, United States amenity college 0.65558864174307 United States us Americas Northern America
+society islands 2021-02-03 68173148 node Audobon Society Wildlife & Marine Sanctuary, Cruz Bay, Saint Thomas - Saint John District, United States Virgin Islands, 000830, United States leisure park 0.35 United States us Americas Northern America
+broad institute of m.i.t. 2021-02-03 97512477 way Broad Institute, Charles Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02141, United States building university 0.893012981942171 United States us Americas Northern America
+bell laboratories 2021-02-03 18501662 node Bell Laboratories, Berkeley Heights, Union County, New Jersey, 07974, United States place locality 0.325 United States us Americas Northern America
+appalachian state university 2021-02-03 202064702 way Appalachian State University, Blowing Rock Road, Downtown, Boone, Watauga County, North Carolina, 28607, United States amenity university 0.739395713780889 United States us Americas Northern America
+nmfs 2021-02-03 248605045 way NMFS, Cottage Street, Fort Trumbull, Milford, New Haven County, Connecticut, 06461, United States building service 0.101 United States us Americas Northern America
+avac 2021-02-03 126885480 way AVAC Equipment Control Building, 4930, Caribbean Way, Bay Lake, Reedy Creek Improvement District, Orange County, Florida, 32830, United States craft hvac 0.101 United States us Americas Northern America
+uc berkeley 2021-02-03 258416614 relation University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States amenity university 0.748194378261701 United States us Americas Northern America
+carnegie museum of natural history 2021-02-03 126423240 way Carnegie Museum of Natural History, 4400, Forbes Avenue, North Oakland, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States tourism museum 0.903846782985069 United States us Americas Northern America
+simons center 2021-02-03 160830886 way Simons Center, John S Toll Drive, Suffolk County, New York, 11794, United States building university 0.201 United States us Americas Northern America
+ihs energy 2021-02-03 17408922 node Texaco, Kapouka Place, City Center, Makakilo City, Kapolei, Honolulu County, Hawaii, 96707, United States amenity fuel 0.001 United States us Americas Northern America
+the woodrow wilson international center for scholars 2021-02-03 47333285 node Woodrow Wilson International Center for Scholars, 1300, Pennsylvania Avenue Northwest, Penn Quarter, Washington, District of Columbia, 20004, United States office government 1.00659791861715 United States us Americas Northern America
+cowen 2021-02-03 258460482 relation Cowen, Webster County, West Virginia, 26206, United States boundary administrative 0.453558714867367 United States us Americas Northern America
+msu 2021-02-03 165822886 way Montana State University, West College Street, Bozeman, Gallatin County, Montana, 59715, United States amenity university 0.429796188420265 United States us Americas Northern America
+alnylam pharmaceuticals 2021-02-03 43655569 node Alnylam Pharmaceuticals, 300, Third Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States office research 0.201 United States us Americas Northern America
+science and engineering 2021-02-03 105892341 way Science/Engineering, Panorama Drive, Bakersfield, Kern County, California, 93305, United States building yes 0.201 United States us Americas Northern America
+us drug enforcement administration 2021-02-03 56632848 node US Drug Enforcement Administration, 212, East Washington Avenue, James Madison Park, Madison, Dane County, Wisconsin, 53703, United States office government 0.910733717290293 United States us Americas Northern America
+ohio state university 2021-02-03 258076404 relation The Ohio State University, Columbus, Franklin, Ohio, 43210, United States amenity university 0.891055260053775 United States us Americas Northern America
+university of iowa 2021-02-03 258145487 relation The University of Iowa, West Benton Street, Iowa City, Johnson County, Iowa, 52246, United States amenity university 0.864487559394863 United States us Americas Northern America
+people for the ethical treatment of animals 2021-02-03 251457165 way People for the Ethical Treatment of Animals, Front Street, Norfolk, Virginia, 23510, United States amenity social_facility 0.701 United States us Americas Northern America
+wilson center 2021-02-03 198959606 way Wilson Center, 240, Nassau Street, Princeton, Mercer County, New Jersey, 08540, United States building yes 0.201 United States us Americas Northern America
+beagle 2021-02-03 377197 node Beagle, Miami County, Kansas, United States place hamlet 0.35 United States us Americas Northern America
+takeda pharmaceutical company 2021-02-03 235148162 way Takeda Pharmaceutical, Thousand Oaks, Ventura County, California, United States landuse industrial 0.4 United States us Americas Northern America
+intellectual ventures 2021-02-03 70855788 node Intellectual Ventures Laboratory, 14360, Southeast Eastgate Way, Eastgate, Bellevue, King County, Washington, 98007, United States office company 0.201 United States us Americas Northern America
+northern illinois university 2021-02-03 192458528 way Northern Illinois University, Stadium Drive, DeKalb, DeKalb County, Illinois, 60115, United States amenity university 0.301 United States us Americas Northern America
+global health 2021-02-03 118152495 way Global Center for Health Innovation, 133, Saint Clair Avenue Northeast, East 4th Street, Warehouse District, Cleveland, Cuyahoga County, Ohio, 44114, United States building yes 0.494028740055238 United States us Americas Northern America
+nyu 2021-02-03 114164826 way New York University, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States amenity university 0.634621425344776 United States us Americas Northern America
+rowan university 2021-02-03 96572300 way Rowan University, High Street West, Glassboro, Gloucester County, New Jersey, 08028, United States amenity university 0.601881525490356 United States us Americas Northern America
+national energy research scientific computing center 2021-02-03 167787512 way National Energy Research Scientific Computing Center (NERSC), Cyclotron Road, Northside, Berkeley, Alameda County, California, 94720, United States building yes 0.601 United States us Americas Northern America
+radio science 2021-02-03 183870807 way PARS, Polar Aeronomy and Radio Science, Fairbanks, Fairbanks North Star, Alaska, United States landuse industrial 0.4 United States us Americas Northern America
+nationwide children's hospital 2021-02-03 259214398 relation Nationwide Children's Hospital, 700, Children's Drive, Livingston Park, Columbus, Franklin, Ohio, 43205, United States amenity hospital 0.649182950422608 United States us Americas Northern America
+chemosphere 2021-02-03 187794541 way Chemosphere, 7776, Torreyson Drive, Hollywood Hills West, Los Angeles, Los Angeles County, California, 90046, United States building house 0.354365194683011 United States us Americas Northern America
+harvard forest 2021-02-03 97627124 way Harvard Forest, Quaker Drive, Petersham, Worcester County, Massachusetts, 01366, United States leisure nature_reserve 0.201 United States us Americas Northern America
+university of kentucky 2021-02-03 258670100 relation University of Kentucky, East Vine Street, Central Business District, Lexington, Fayette County, Kentucky, 40506, United States amenity university 0.850375161540189 United States us Americas Northern America
+vesta 2021-02-03 257790764 relation Vesta, Redwood County, Minnesota, United States boundary administrative 0.52868986151298 United States us Americas Northern America
+natural sciences 2021-02-03 205619227 way Natural Sciences, 34th Avenue, Phoenix, Maricopa County, Arizona, 85019, United States building yes 0.201 United States us Americas Northern America
+university of louisiana 2021-02-03 226545942 way University of Kansas, Louisiana Street, Malls Shopping Center, Lawrence, Douglas County, Kansas, 66046, United States amenity university 0.862696980333312 United States us Americas Northern America
+lincoln park zoo 2021-02-03 258697898 relation Lincoln Park Zoo, 2001, North Clark Street, Belgravia Terrace, Lincoln Park, Chicago, Cook County, Illinois, 60614, United States tourism zoo 0.635161875786798 United States us Americas Northern America
+american association 2021-02-03 165272985 way Japanese American Citizens League, 12937, Cortez Avenue, Cortez Growers Association, Turlock, Merced County, California, 95380, United States building public 0.201 United States us Americas Northern America
+environmental science & technology 2021-02-03 136610917 way Environmental Education, Science & Technology (ENV SCI), 1704, West Mulberry Street, Denton, Denton County, Texas, 76201, United States building university 0.301 United States us Americas Northern America
+ethical treatment of animals 2021-02-03 251457165 way People for the Ethical Treatment of Animals, Front Street, Norfolk, Virginia, 23510, United States amenity social_facility 0.401 United States us Americas Northern America
+pacific biosciences 2021-02-03 95009258 way Pacific Biosciences, 1305, O'Brien Drive, Menlo Park, San Mateo County, California, 94025, United States office company 0.201 United States us Americas Northern America
+nature center 2021-02-03 107104919 way Nature Center, Mendon, Monroe County, New York, United States landuse construction 0.4 United States us Americas Northern America
+hill 2021-02-03 258432168 relation Hill County, Texas, United States boundary administrative 0.654736575831137 United States us Americas Northern America
+antarctic marine geology research facility 2021-02-03 145738961 way Antarctic Marine Geology Research Facility, Academic Way, Tallahassee, Leon County, Florida, 32306, United States building university 0.501 United States us Americas Northern America
+voice of america 2021-02-03 243204715 way Voice of America, Marathon, Monroe County, Florida, United States landuse industrial 0.5 United States us Americas Northern America
+stanford university in california 2021-02-03 97833344 way Stanford University, 408, Panama Mall, Stanford, Santa Clara County, California, 94305, United States amenity university 0.955492545367418 United States us Americas Northern America
+lee university 2021-02-03 217690083 way Lee University, North Ocoee Street, Cleveland, Bradley County, Tennessee, 37311, United States amenity university 0.562774714414326 United States us Americas Northern America
+orasure technologies 2021-02-03 69665845 node OraSure Technologies - Eaton Avenue Facility, 1745, Eaton Avenue, Kaywin, Bethlehem, Lehigh County, Pennsylvania, 18018, United States man_made works 0.201 United States us Americas Northern America
+dow agrosciences 2021-02-03 158311065 way Dow AgroSciences, Ruby H Harper Boulevard, Gilbert Gardens, Plunket Town, Atlanta, Fulton County, Georgia, 30354, United States building warehouse 0.201 United States us Americas Northern America
+sri international 2021-02-03 2879218 node SRI International, 333, Ravenswood Avenue, Menlo Park, San Mateo County, California, 94025, United States office research 0.201 United States us Americas Northern America
+us agency for international development 2021-02-03 19295624 node US Agency for International Development, 14th Street Northwest, Washington, District of Columbia, 20230, United States office government 0.998819499208192 United States us Americas Northern America
+harvard medical school 2021-02-03 146981708 way Harvard Medical School, Longwood Avenue, Roxbury, Boston, Suffolk County, Massachusetts, 02120, United States amenity university 0.301 United States us Americas Northern America
+the circuit court 2021-02-03 20736035 node Circuit Court, Maryland Avenue, Croydon Park, Rockville, Montgomery County, Maryland, 20850, United States amenity courthouse 0.403130333992136 United States us Americas Northern America
+scripps research 2021-02-03 2879141 node Scripps Research Institute, 10666, Coast Highway, Torrey Pines, San Diego, San Diego County, California, 92093-0068, United States office research 0.201 United States us Americas Northern America
+un general assembly 2021-02-03 50098618 node General Assembly, 675, Ponce de Leon Avenue Northeast, Atlanta, Fulton County, Georgia, 30306, United States amenity school 0.301 United States us Americas Northern America
+atlantis bank 2021-02-03 258253193 relation Atlantis, Palm Beach County, Florida, United States boundary administrative 0.514922298920702 United States us Americas Northern America
+pennsylvania 2021-02-03 295875619 relation Pennsylvania, United States boundary administrative 0.857742643241961 United States us Americas Northern America
+diamond and washington university 2021-02-03 189612585 way West Diamond Drive, University House, Fayetteville, Washington County, Arkansas, 72701, United States highway service 0.375 United States us Americas Northern America
+haverford college 2021-02-03 115142668 way Haverford College, East Railroad Avenue, Haverford Township, Delaware County, Pennsylvania, 19010, United States amenity college 0.657348082673311 United States us Americas Northern America
+rcr 2021-02-03 132953507 way Fulton County Airport, SR 25, Rochester, Fulton County, Indiana, 46975, United States aeroway aerodrome 0.260058384040688 United States us Americas Northern America
+guam 2021-02-03 258022039 relation Guam, Santa Rita Municipality, Guam, United States place island 0.789784943797409 United States us Americas Northern America
+psc 2021-02-03 119085054 way Peter W. Stott Center, 930, Southwest Hall Street, University District, Downtown, Portland, Metro, Oregon, 97201, United States leisure sports_centre 0.3277684953714 United States us Americas Northern America
+auburn university 2021-02-03 259125839 relation Auburn University, Lem Morrison Drive, Woodfield, Auburn, Lee County, Alabama, 36849, United States amenity university 0.726936083135026 United States us Americas Northern America
+kings 2021-02-03 258002610 relation Kings County, California, United States boundary administrative 0.648553789525574 United States us Americas Northern America
+doe joint genome institute 2021-02-03 235834399 way Joint Genome Institute, Smoot Road, Berkeley, Alameda County, California, 94720, United States building yes 0.610439474412231 United States us Americas Northern America
+common fund 2021-02-03 56944182 node Staunton Creative Community Fund, 10, Byers Street, Dogwood Hill, Staunton, Virginia, 24401, United States office nonprofit 0.101 United States us Americas Northern America
+metropolitan state university of denver 2021-02-03 20321803 node Metropolitan State University of Denver, Lawrence Street Mall, Auraria, Denver, Denver County, Colorado, 80217, United States amenity university 0.851537799411788 United States us Americas Northern America
+alaska 2021-02-03 258358045 relation Alaska, United States boundary administrative 0.821112507250872 United States us Americas Northern America
+georgia tech research institute 2021-02-03 82853123 node Georgia Tech Research Institute, 2970, Presidential Drive, Wright Executive Center, Fairborn, Greene County, Ohio, 45324, United States office educational_institution 0.401 United States us Americas Northern America
+rhode island 2021-02-03 258435553 relation Rhode Island, United States boundary administrative 0.888026902639812 United States us Americas Northern America
+salk institute 2021-02-03 3058237 node Salk Institute Library, Salk Institute Road, La Jolla Farms, Torrey Pines, San Diego, San Diego County, California, 92093, United States amenity library 0.201 United States us Americas Northern America
+us national robotics engineering center 2021-02-03 162468249 way National Robotics Engineering Center, 10, 40th Street, Lawrenceville, Central Lawrenceville, Pittsburgh, Allegheny County, Pennsylvania, 15201, United States building industrial 0.590508362962683 United States us Americas Northern America
+collins 2021-02-03 258356239 relation Collins, Story County, Iowa, United States boundary administrative 0.534140648717751 United States us Americas Northern America
+mbl 2021-02-03 133977853 way Manistee County-Blacker Airport, Chippewa Highway, Manistee Township, Manistee County, Michigan, 49660, United States aeroway aerodrome 0.252344279227432 United States us Americas Northern America
+baylor 2021-02-03 258348836 relation Baylor County, Texas, 76380, United States boundary administrative 0.656007857309354 United States us Americas Northern America
+university of wisconsin 2021-02-03 53450184 node UWRF Fast Copy, 410, South 3rd Street, River Falls, Pierce County, Wisconsin, 54022, United States shop copyshop 0.101 United States us Americas Northern America
+jacksonville state university 2021-02-03 258550067 relation Jacksonville State University, 700, Pelham Road North, Jacksonville, Calhoun County, Alabama, 36265, United States amenity university 0.301 United States us Americas Northern America
+us justice department 2021-02-03 75624556 node US Justice Department, 9257, Lee Avenue, Manassas, Prince William County, Virginia, 20110, United States office government 0.301 United States us Americas Northern America
+university of california at riverside 2021-02-03 33709158 node UCR ARTSblock, 3824, Main Street, Riverside, Riverside County, California, 92501, United States tourism museum 0.558218474293395 United States us Americas Northern America
+parker institute 2021-02-03 297677026 way Quad Park, Institute, Jefferson, Kanawha County, West Virginia, United States leisure park 0.25 United States us Americas Northern America
+union carbide 2021-02-03 49293344 node Union Carbide, Odessa, Ector County, Texas, 79763, United States place neighbourhood 0.45 United States us Americas Northern America
+national park service 2021-02-03 97935238 way The Battle of Bunker Hill Museum, 43, Monument Square, Charlestown, Boston, Suffolk County, Massachusetts, 02129, United States tourism museum 0.479827038246968 United States us Americas Northern America
+humpty dumpty 2021-02-03 164108425 way Humpty Dumpty, West Barnstable, Barnstable, Barnstable County, Massachusetts, 0264, United States highway path 0.275 United States us Americas Northern America
+charles stark draper laboratory 2021-02-03 98075251 way The Charles Stark Draper Laboratory, Inc, 555, Technology Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02238, United States office research 0.401 United States us Americas Northern America
+b612 foundation 2021-02-03 80081794 node B612 Foundation, 20, Sunnyside Avenue, Mill Valley, Marin County, California, 94941, United States office foundation 0.201 United States us Americas Northern America
+uc-davis 2021-02-03 258689332 relation University of California, Davis, Russell Boulevard, Davis, Yolo County, California, 95616, United States amenity university 0.101 United States us Americas Northern America
+american institute of physics in college park 2021-02-03 210348591 way American Institute of Physics, 500, Sunnyside Boulevard, Oyster Bay, Nassau County, New York, 11797, United States building university 0.501 United States us Americas Northern America
+evergreen state college 2021-02-03 258893745 relation The Evergreen State College, Brenner Road Northwest, Thurston County, Washington, 98505, United States amenity university 0.301 United States us Americas Northern America
+the new york times 2021-02-03 138755486 way The New York Times, Woodbridge Avenue, Bonhamtown, Edison, Middlesex County, New Jersey, 08818, United States building warehouse 0.401 United States us Americas Northern America
+sandoz 2021-02-03 356860 node Sandoz, Calaveras County, California, United States place hamlet 0.35 United States us Americas Northern America
+lawrence university 2021-02-03 258589542 relation Lawrence University, 711, East Boldt Way, Appleton, Outagamie County, Wisconsin, 54911, United States amenity university 0.624872581583534 United States us Americas Northern America
+florida gulf coast university in fort myers 2021-02-03 35558902 node Florida Gulf Coast University, 10501, FGCU Boulevard South, North Lake Village, Fort Myers, Lee County, Florida, 33965-6565, United States building school 0.975561325671519 United States us Americas Northern America
+goddard space flight center 2021-02-03 258921089 relation Goddard Space Flight Center, Greenbelt Road, Brookland, Glenn Dale, Prince George's County, Maryland, 20769, United States amenity research_institute 0.900582931635345 United States us Americas Northern America
+us geological survey 2021-02-03 135946356 way US Geological Survey, Wilson Avenue, Pasadena, Los Angeles County, California, 91125, United States building yes 0.301 United States us Americas Northern America
+boston university school of law 2021-02-03 2695220 node Boston University School of Law, Bay State Road, Audubon Square, Boston, Suffolk County, Massachusetts, 02215, United States amenity school 0.501 United States us Americas Northern America
+mcafee 2021-02-03 98813875 way McAfee, Mission College Boulevard, Santa Clara, Santa Clara County, California, 95054-1231, United States building yes 0.566266067536779 United States us Americas Northern America
+pan american health organization 2021-02-03 106697416 way Pan-American Health Organization, 2121, Virginia Avenue Northwest, Foggy Bottom, Washington, District of Columbia, 20037, United States office government 1.00046431649804 United States us Americas Northern America
+mci 2021-02-03 140762532 way Kansas City International Airport, 1, Northwest Cookingham Drive, Kansas City, Platte County, Missouri, 64153, United States aeroway aerodrome 0.411679724670082 United States us Americas Northern America
+united states department of agriculture 2021-02-03 21512544 node United States Department of Agriculture, Jefferson Drive Southwest, Washington, District of Columbia, 20013, United States office government 0.501 United States us Americas Northern America
+turner 2021-02-03 258422326 relation Turner County, South Dakota, United States boundary administrative 0.573546604210725 United States us Americas Northern America
+mount st helens 2021-02-03 2373758 node Mount St. Helens, Skamania County, Washington, United States natural volcano 0.790999852984371 United States us Americas Northern America
+george washington university 2021-02-03 106978219 way George Washington University, I Street Northwest, Golden Triangle, Washington, District of Columbia, 20006, United States amenity university 0.861031504404982 United States us Americas Northern America
+foundation center 2021-02-03 51536219 node Foundation Center, 33, Old Slip, Financial District, Manhattan Community Board 1, Manhattan, New York County, New York, 10005, United States amenity library 0.201 United States us Americas Northern America
+university of north florida 2021-02-03 2878760 node University of North Florida, South U N F Drive, Jacksonville, Duval County, Florida, 32246-6624, United States amenity school 0.401 United States us Americas Northern America
+commercial spaceflight federation 2021-02-03 80658144 node Commercial Spaceflight Federation, 1444, I Street Northwest, Downtown, Washington, District of Columbia, 20006, United States office ngo 0.301 United States us Americas Northern America
+nightingale 2021-02-03 439499 node Nightingale, Frederick County, Maryland, 21774, United States place hamlet 0.35 United States us Americas Northern America
+denver museum of nature and science 2021-02-03 99790553 way Denver Museum of Nature and Science, 2001, Colorado Boulevard, Denver, Denver County, Colorado, 80205, United States tourism museum 0.933256970094253 United States us Americas Northern America
+us national wildlife federation 2021-02-03 232820332 way National Wildlife Federation, Business Center Drive, Pinecrest, Reston, Fairfax County, Virginia, 20190, United States man_made works 0.401 United States us Americas Northern America
+university of northern colorado 2021-02-03 167749471 way University of Northern Colorado, 501, 20th Street, Jackson Field, Greeley, Weld County, Colorado, 80631, United States amenity university 0.814405926306359 United States us Americas Northern America
+fertile crescent 2021-02-03 92672618 way Fertile Crescent, Prince William County, Virginia, United States highway residential 0.3 United States us Americas Northern America
+international development research centre 2021-02-03 8421794 node Office Of International Research & Development, 840, University City Boulevard, Longview Estates, McBryde Village, Blacksburg, Montgomery County, Virginia, 24060, United States place house 0.301 United States us Americas Northern America
+planned parenthood 2021-02-03 44150828 node Planned Parenthood, 183, Saint Paul Street, Downtown, Burlington, Chittenden County, Vermont, 05401, United States amenity clinic 0.201 United States us Americas Northern America
+bill & melinda gates foundation 2021-02-03 177964409 way Bill & Melinda Gates Foundation, 500, 5th Avenue North, Lower Queen Anne, Belltown, Seattle, King County, Washington, 98109, United States office foundation 0.833000783214491 United States us Americas Northern America
+fdna 2021-02-03 90193129 way Fdna Lane, Las Vegas, Clark County, Nevada, 89102-4345, United States highway residential 0.2 United States us Americas Northern America
+jet propulsion laboratory 2021-02-03 178071948 way Jet Propulsion Laboratory, 4800, Oak Grove Drive, Pasadena, Los Angeles County, California, 91109, United States office research 0.997556545369086 United States us Americas Northern America
+chrysler 2021-02-03 412742 node Chrysler, Monroe County, Alabama, United States place hamlet 0.35 United States us Americas Northern America
+us national park service 2021-02-03 229380168 way Longleaf Campground, National Park Road, Richland County, South Carolina, United States tourism camp_site 0.201 United States us Americas Northern America
+blue origin 2021-02-03 224462797 way Blue Origin, Kent, King County, Washington, United States landuse industrial 0.4 United States us Americas Northern America
+pg&e 2021-02-03 105553435 way PG&E, Fresno, Fresno County, California, United States landuse industrial 0.4 United States us Americas Northern America
+calvin college 2021-02-03 258188696 relation Calvin, Cavalier County, North Dakota, United States boundary administrative 0.48265030002841 United States us Americas Northern America
+interior 2021-02-03 257566293 relation Interior, Jackson County, South Dakota, United States boundary administrative 0.441036070852761 United States us Americas Northern America
+marine biological laboratory 2021-02-03 20613776 node Marine Biological Laboratory, Marine Biological Lab Street, Woods Hole, Falmouth, Barnstable County, Massachusetts, 02543, United States amenity school 0.301 United States us Americas Northern America
+translational research 2021-02-03 100492214 way Translational Genomics Research Institute, East Taylor Street, Phoenix, Maricopa County, Arizona, 85004, United States building yes 0.415498150437213 United States us Americas Northern America
+florida 2021-02-03 257824147 relation Florida, United States boundary administrative 0.851213972798062 United States us Americas Northern America
+a123 systems 2021-02-03 149702337 way A123 Systems, CBS Fox Drive, Livonia, Wayne County, Michigan, 48167-3958, United States building yes 0.201 United States us Americas Northern America
+university of california santa cruz 2021-02-03 224580983 way University of California Santa Cruz, CA 9, Santa Cruz, Santa Cruz County, California, 95064, United States amenity university 1.00220825756689 United States us Americas Northern America
+california air resources board 2021-02-03 51708475 node California Air Resources Board, 1001, I Street, Sacramento, Sacramento County, California, 95814, United States office government 0.780761518938055 United States us Americas Northern America
+thomas jefferson university 2021-02-03 259368934 relation Thomas Jefferson University, Ranstead Street, Society Hill, Philadelphia, Philadelphia County, Pennsylvania, 19107, United States amenity university 0.709231479174104 United States us Americas Northern America
+xerox 2021-02-03 197336370 way Xerox, Wilsonville, Metro, Oregon, United States landuse industrial 0.3 United States us Americas Northern America
+arecibo 2021-02-03 258975408 relation Arecibo, Puerto Rico, United States boundary administrative 0.563856464536119 United States us Americas Northern America
+united states patent and trademark office 2021-02-03 55565757 node Silicon Valley United States Patent and Trademark Office, South 4th Street, Saint James Square Historic District, Japantown, San Jose, Santa Clara County, California, 95112-3580, United States office government 0.601 United States us Americas Northern America
+aamc 2021-02-03 113401404 way Anne Arundel Medical Center, 2001, Medical Parkway, Bestgate Terrace, Annapolis, Anne Arundel County, Maryland, 21401, United States amenity hospital 0.271596680569804 United States us Americas Northern America
+rainbow babies and children's hospital 2021-02-03 64089560 node UH Rainbow Babies & Children’s Hospital, 2101, Adelbert Road, University Circle, Cleveland, Cuyahoga County, Ohio, 44106, United States amenity hospital 0.909633810660442 United States us Americas Northern America
+syracuse university 2021-02-03 258567940 relation Syracuse University, East Adams Street, University Hill, Syracuse, Onondaga County, New York, 13210-1053, United States amenity university 0.763992465055935 United States us Americas Northern America
+navajo nation reservation 2021-02-03 259240483 relation Navajo Nation, United States boundary aboriginal_lands 0.692311230103081 United States us Americas Northern America
+stanford university 2021-02-03 97833344 way Stanford University, 408, Panama Mall, Stanford, Santa Clara County, California, 94305, United States amenity university 0.855492545367418 United States us Americas Northern America
+toyota technological institute 2021-02-03 67853957 node Toyota Technological Institute, 6045, South Kenwood Avenue, Woodlawn, Chicago, Hyde Park Township, Cook County, Illinois, 60637, United States office research 0.638803667479001 United States us Americas Northern America
+chicago zoological society 2021-02-03 132582604 way Brookfield Zoo, 8400, 31st Street, Brookfield, Proviso Township, Cook County, Illinois, 60513, United States tourism zoo 0.319018527529768 United States us Americas Northern America
+stanford libraries 2021-02-03 147987374 way Lathrop Library, 518, Memorial Way, Stanford, Santa Clara County, California, 94305-6015, United States amenity library 0.406301518086152 United States us Americas Northern America
+food and drug administration 2021-02-03 161684229 way Food and Drug Administration, San Juan Antiguo, San Juan, Puerto Rico, United States landuse industrial 0.6 United States us Americas Northern America
+cdb 2021-02-03 899163 node Cold Bay Airport, North to South Apron Service Road, Cold Bay, Aleutians East, Alaska, 99571, United States aeroway aerodrome 0.281311730611622 United States us Americas Northern America
+nashville zoo 2021-02-03 7117976 node Croft House, Elysian Fields Road, Paragon Mills, Nashville-Davidson, Davidson County, Tennessee, 37211, United States tourism museum 0.101 United States us Americas Northern America
+academic board 2021-02-03 2617885 node Middle School M256 Academic and Athletic Excellence, 154, West 93rd Street, Upper West Side, Manhattan Community Board 7, Manhattan, New York County, New York, 10025, United States amenity school 0.201 United States us Americas Northern America
+oakland university 2021-02-03 101157737 way Oakland University, 201, Meadow Brook Road, Rochester, Oakland County, Michigan, 48309-4401, United States amenity university 0.611679724670082 United States us Americas Northern America
+harvard university lab 2021-02-03 258370425 relation Harvard University, Kingsley Street, North Brighton, Allston, Boston, Suffolk County, Massachusetts, 02134-1420, United States amenity university 0.977190722653673 United States us Americas Northern America
+florida atlantic university 2021-02-03 259120576 relation Florida Atlantic University, 111, East Las Olas Boulevard, Fort Lauderdale, Broward County, Florida, 33301, United States building yes 0.301 United States us Americas Northern America
+molycorp 2021-02-03 174420277 way Molycorp Evaporation Ponds, San Bernardino County, California, United States landuse disused:industrial 0.3 United States us Americas Northern America
+washington 2021-02-03 259037983 relation Washington, District of Columbia, United States boundary administrative 0.849288898611582 United States us Americas Northern America
+magee-womens research institute 2021-02-03 174580335 way Magee-Womens Research Institute, 204, Craft Avenue, South Oakland, Pittsburgh, Allegheny County, Pennsylvania, 15213, United States building apartments 0.401 United States us Americas Northern America
+foundation for the nih 2021-02-03 154743130 way The Annenberg Space for Photography, 2000, Avenue of the Stars, Century City, Los Angeles, Los Angeles County, California, 90067, United States tourism museum 0.523710213530857 United States us Americas Northern America
+bassett medical center 2021-02-03 209192057 way Bassett Medical Center, 1, Atwell Road, Cooperstown, Town of Otsego, Otsego County, New York, 13326, United States amenity hospital 0.507534521399027 United States us Americas Northern America
+risk management solutions 2021-02-03 65756807 node Risk Management Solutions, 799, West Gaines Street, Tallahassee, Leon County, Florida, 32304, United States office yes 0.301 United States us Americas Northern America
+department of homeland security 2021-02-03 128703019 way Department Of Homeland Security, Upper Express Drive, O'Hare, Chicago, Jefferson Township, Cook County, Illinois, 60666, United States building yes 0.401 United States us Americas Northern America
+northwest research associates 2021-02-03 2985973 node Santa Barbara County Building;Lompoc Museum;Lompoc Museum Associates Research Library, 200, South H Street, Lompoc, Santa Barbara County, California, 93436, United States tourism museum 0.328160971568546 United States us Americas Northern America
+cir 2021-02-03 99147609 way Circle, Unorganized Borough, Alaska, United States boundary administrative 0.472859588409935 United States us Americas Northern America
+the university of california at san diego 2021-02-03 94305187 way University of California, San Diego, 9500, Gilman Drive, San Diego, San Diego County, California, 92093, United States amenity university 1.14938836421927 United States us Americas Northern America
+federal aviation administration 2021-02-03 129948979 way Federal Aviation Administration, Bernalillo County, New Mexico, United States boundary administrative 0.65 United States us Americas Northern America
+fermi national accelerator laboratory 2021-02-03 99059145 way Fermi National Accelerator Laboratory, DuPage County, Illinois, United States landuse industrial 0.863054296170656 United States us Americas Northern America
+transportation 2021-02-03 248523248 way Transportation, Willard, Greene County, Missouri, 65781, United States highway unclassified 0.2 United States us Americas Northern America
+llnl 2021-02-03 95865246 way Lawrence Livermore National Laboratory, South Vasco Road, Livermore, Alameda County, California, 94550, United States amenity science_park 0.493328255224182 United States us Americas Northern America
+tufts university 2021-02-03 258528054 relation Tufts University, Whitman Street, West Somerville, Somerville, Middlesex County, Massachusetts, 02144, United States amenity university 0.726756832210693 United States us Americas Northern America
+carnegie endowment for international peace 2021-02-03 2981835 node The Carnegie Endowment for International Peace, Massachusetts Avenue Northwest, Dupont Circle and surrunding block, Dupont Circle, Washington, District of Columbia, 20036, United States building yes 0.501 United States us Americas Northern America
+white house office of management and budget 2021-02-03 152300809 way Office of Management and Budget, 254, Calle Cruz, La Perla, San Juan Antiguo, San Juan, Puerto Rico, 00901, United States office government 0.501 United States us Americas Northern America
+post 2021-02-03 259216694 relation Post, Garza County, Texas, United States boundary administrative 0.567279572790411 United States us Americas Northern America
+ieee-usa 2021-02-03 258920692 relation IEEE, 445, Hoes Lane, Piscataway Township, Middlesex County, New Jersey, 08854, United States building yes 0.101 United States us Americas Northern America
+vermont law school 2021-02-03 2406305 node Vermont Law School, Chelsea Street, South Royalton, Royalton, Windsor County, Vermont, 05068, United States amenity school 0.612795139465266 United States us Americas Northern America
+worcester polytechnic institute 2021-02-03 299167589 relation Worcester Polytechnic Institute, 100, Institute Road, Lincoln Square, Hammond Heights, Worcester, Worcester County, Massachusetts, 01609, United States amenity university 0.727443521124928 United States us Americas Northern America
+wash 2021-02-03 257846660 relation Washington, United States boundary administrative 0.812929792315567 United States us Americas Northern America
+us centers for disease control 2021-02-03 245173649 way Centers for Disease Control, Chester Creek Connector, Anchorage, Alaska, 99508-3501, United States building yes 0.401 United States us Americas Northern America
+takeda pharmaceuticals 2021-02-03 43478299 node Takeda Pharmaceuticals, 300, Massachusetts Avenue, Central Square, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02139, United States place house 0.201 United States us Americas Northern America
+caledonia 2021-02-03 258349656 relation Caledonia, Boone County, Illinois, United States boundary administrative 0.522709819346418 United States us Americas Northern America
+wildlife service 2021-02-03 85634178 way Wildlife, Choctaw County, Alabama, United States highway residential 0.2 United States us Americas Northern America
+institute 2021-02-03 451003 node Institute, Jefferson, Kanawha County, West Virginia, 25064, United States place hamlet 0.454934934074513 United States us Americas Northern America
+forest service 2021-02-03 88138445 way Forest Service, Calaveras County, California, United States highway residential 0.3 United States us Americas Northern America
+national museum of natural history 2021-02-03 107528703 way National Museum of Natural History, Smithsonian Pollinator Garden Path, Penn Quarter, Washington, District of Columbia, 20560, United States tourism museum 0.992769930727232 United States us Americas Northern America
+san josé state university 2021-02-03 258921314 relation San José State University, Woodborough Place, San Jose, Santa Clara County, California, 95116-2246, United States amenity university 0.896654046833393 United States us Americas Northern America
+lake mercer 2021-02-03 258399251 relation Grand Lake–Saint Marys, Montezuma, Mercer County, Ohio, 45822, United States natural water 0.522734482343971 United States us Americas Northern America
+office of science 2021-02-03 258762307 relation Science, East Reserve Street, Officers Row, Vancouver, Clark County, Washington, 98661, United States building yes 0.301 United States us Americas Northern America
+j&j 2021-02-03 49289982 node J and J, Ward County, Texas, 79756, United States place neighbourhood 0.45 United States us Americas Northern America
+university of north texas 2021-02-03 259116319 relation University of North Texas, 1155, Union Circle, Denton, Denton County, Texas, 76203, United States amenity university 0.884465837950001 United States us Americas Northern America
+boston biomedical research institute 2021-02-03 97416620 way Boston Biomedical Research Institute, 64, Grove Street, East Watertown, Watertown, Middlesex County, Massachusetts, 02135, United States building yes 0.401 United States us Americas Northern America
+global security 2021-02-03 177539015 way Global Security, East 33rd Street, Vancouver, Clark County, Washington, 98663, United States office company 0.201 United States us Americas Northern America
+operation campus 2021-02-03 230031793 way Faculties Operation, Campus Drive, Concord, Contra Costa County, California, 94521, United States building school 0.201 United States us Americas Northern America
+university of alaska fairbanks 2021-02-03 259286295 relation University of Alaska Fairbanks, 1731, College, Fairbanks North Star, Alaska, 99775, United States amenity university 0.827623120278844 United States us Americas Northern America
+us department of the interior 2021-02-03 148880750 way Rincon Mountain Visitor Center, 3693, South Old Spanish Trail, Tucson, Pima County, Arizona, 85748, United States tourism information 0.001 United States us Americas Northern America
+clio 2021-02-03 257120514 relation Clio, Wayne County, Iowa, 50052, United States boundary administrative 0.531727684347105 United States us Americas Northern America
+superior court 2021-02-03 89146279 way Superior Court, The Landings, Toms River, Ocean County, New Jersey, 08755, United States highway residential 0.3 United States us Americas Northern America
+national audubon society 2021-02-03 227896739 way Audubon Society, Sky Londa, San Mateo County, California, United States boundary protected_area 0.325 United States us Americas Northern America
+berkeley 2021-02-03 258426548 relation Berkeley, Alameda County, California, United States boundary administrative 0.704505510928137 United States us Americas Northern America
+king 2021-02-03 258455752 relation King County, Texas, 79236, United States boundary administrative 0.652064928459235 United States us Americas Northern America
+national center for genome resources in santa fe 2021-02-03 234806388 way National Center for Genome Resources, Santa Fe, Santa Fe County, New Mexico, United States landuse commercial 0.9 United States us Americas Northern America
+alaska fisheries science center 2021-02-03 300441187 way University of Alaska Fairbanks School of Fisheries and Ocean Science, 17101, Point Lena Loop Road, NOAA Fisheries, Lena Beach, Juneau, Alaska, 99801, United States building university 0.301 United States us Americas Northern America
+ekström 2021-02-03 89393268 way Ekstrom, Pierce County, Washington, 98327, United States highway residential 0.1 United States us Americas Northern America
+new york university medical center 2021-02-03 158641184 way New York University Medical Center, East 38th Street, Murray Hill, Manhattan Community Board 6, Manhattan, New York County, New York, 10016, United States amenity clinic 0.501 United States us Americas Northern America
+university of louisville 2021-02-03 259182645 relation University of Louisville, East Brandeis Avenue, Louisville, Jefferson County, Kentucky, 40217, United States amenity university 0.820740059627089 United States us Americas Northern America
+lifelong medical care 2021-02-03 52123935 node Lifelong Medical Care, 11th Street, Iron Triangle, Richmond, Contra Costa County, California, 94801, United States amenity clinic 0.301 United States us Americas Northern America
+ok 2021-02-03 258391951 relation Oklahoma, United States boundary administrative 0.814016195392348 United States us Americas Northern America
+north carolina 2021-02-03 258457663 relation North Carolina, United States boundary administrative 0.920364397898499 United States us Americas Northern America
+ibm research at almaden research center 2021-02-03 98702289 way IBM Almaden Research Center, 650, Harry Road, IBM Almaden Research Center, San Jose, Santa Clara County, California, 95120, United States building yes 0.883827688081076 United States us Americas Northern America
+mass 2021-02-03 258278823 relation Massachusetts, United States boundary administrative 0.836449761303479 United States us Americas Northern America
+green bank 2021-02-03 102881650 way Green Bank Telescope, Slavin Hollow Road, Pocahontas County, West Virginia, 24944, United States man_made telescope 0.590988572487363 United States us Americas Northern America
+national geographic society 2021-02-03 104285798 way National Geographic Society, Sumner Row, Golden Triangle, Washington, District of Columbia, 20006-5346, United States building government 0.85218387169211 United States us Americas Northern America
+jaguar 2021-02-03 83098527 node Jaguar, Gurabo, Puerto Rico, 00778, United States place suburb 0.375 United States us Americas Northern America
+feld entertainment 2021-02-03 189595545 way Entertainment, Foothill Ranch Towne Center, Foothill Ranch, Lake Forest, Orange County, California, 92610, United States highway service 0.175 United States us Americas Northern America
+oneweb 2021-02-03 219129611 way OneWeb Satellites Manufacturing Facility, Odyssey Way, Brevard County, Florida, United States building industrial 0.447724269818501 United States us Americas Northern America
+cobb institute 2021-02-03 153585197 way Georgia Tech Research Institute Cobb County Research Facility South, 1941, Dixie Avenue Southeast, Smyrna, Cobb County, Georgia, 30080, United States building yes 0.201 United States us Americas Northern America
+fred hutchinson cancer center 2021-02-03 179513052 way Fred Hutchinson Cancer Research Center, 1100, Fairview Avenue North, South Lake Union, Capitol Hill, Seattle, King County, Washington, 98109, United States amenity research_institute 0.731005307834616 United States us Americas Northern America
+barnard college 2021-02-03 100812162 way Barnard College, Reunion Plaza, Morningside Heights, Manhattan Community Board 9, Manhattan, New York County, New York, United States amenity university 0.708762447831959 United States us Americas Northern America
+brandeis university 2021-02-03 128290139 way Brandeis University, Boynton Street, Banks Square, Riverview, Waltham, Middlesex County, Massachusetts, 02453-2728, United States amenity university 0.201 United States us Americas Northern America
+american college of physicians 2021-02-03 2973429 node American College of Physicians, 190, North Independence Mall West, Philadelphia, Philadelphia County, Pennsylvania, 19106, United States amenity doctors 0.401 United States us Americas Northern America
+climate home 2021-02-03 78587650 node Climate, 5282, Monahans Avenue, The Shops at Clearfork, Fort Worth, Tarrant County, Texas, 76109, United States shop sports 0.101 United States us Americas Northern America
+clinical services 2021-02-03 258895288 relation Clinical Services, East 18th Avenue, Eugene, Lane County, Oregon, 907403, United States building university 0.201 United States us Americas Northern America
+apple 2021-02-03 22363154 node Apple Store, 815, Boylston Street, Block F, Back Bay, Boston, Suffolk County, Massachusetts, 02116, United States shop electronics 0.760382661059545 United States us Americas Northern America
+usaid 2021-02-03 19295624 node US Agency for International Development, 14th Street Northwest, Washington, District of Columbia, 20230, United States office government 0.498819499208192 United States us Americas Northern America
+north carolina department of environmental quality 2021-02-03 220675454 way Department of Environmental Quality, Aspen Street, Helena, Lewis and Clark County, Montana, 59602-1217, United States office government 0.401 United States us Americas Northern America
+california medical facility 2021-02-03 213015691 way California Medical Facility, 1600, California Drive, Vacaville, Solano County, California, 95696, United States amenity prison 0.574532111506442 United States us Americas Northern America
+oxford 2021-02-03 468374 node Oxford, Chester County, Pennsylvania, 19363, United States place suburb 0.760604041060727 United States us Americas Northern America
+loyola university chicago 2021-02-03 259482995 relation Loyola University Chicago, 1032, West Sheridan Road, Rogers Park, Chicago, Rogers Park Township, Cook County, Illinois, 60660, United States amenity university 0.78906723611033 United States us Americas Northern America
+princeton university 2021-02-03 259109522 relation Princeton University, Brunswick Pike, Penns Neck, Princeton, Mercer County, New Jersey, 08540, United States amenity university 0.846017552564293 United States us Americas Northern America
+vickers 2021-02-03 404820 node Vickers, Northwood, Wood County, Ohio, 43619, United States place hamlet 0.35 United States us Americas Northern America
+institute of life sciences 2021-02-03 126803509 way Life Sciences Institute, Washtenaw Avenue, Ann Arbor, Washtenaw County, Michigan, 48108, United States building university 0.478140546517606 United States us Americas Northern America
+texas a&m in college station 2021-02-03 104362432 way Texas A & M, Lakeway Drive, College Station, Brazos County, Texas, 77845, United States building yes 0.501 United States us Americas Northern America
+health and human services 2021-02-03 159574403 way Health and Human Services, Dove Street, Clinton Township, Macomb County, Michigan, 48038, United States building university 0.401 United States us Americas Northern America
+us marine corps 2021-02-03 11558120 node US Marine Corps, 64, Kala Bagai Way, Downtown Berkeley, Berkeley, Alameda County, California, 94704, United States office government 0.301 United States us Americas Northern America
+gulfstream v 2021-02-03 152738447 way Gulfstream, Conroe, Montgomery County, Texas, 77303, United States highway residential 0.2 United States us Americas Northern America
+janelia research campus 2021-02-03 258401070 relation Janelia Research Campus, 19700, Helix Drive, Ashburn, Loudoun County, Virginia, 20147, United States amenity research_institute 0.546981559290857 United States us Americas Northern America
+florida institute of technology 2021-02-03 159357166 way Florida Institute of Technology, East Ashley Court, Melbourne, Brevard County, Florida, 32901, United States amenity university 0.401 United States us Americas Northern America
+wyeth 2021-02-03 384418 node Wyeth, Andrew County, Missouri, 64483, United States place hamlet 0.35 United States us Americas Northern America
+ms 2021-02-03 258375642 relation Mississippi, United States boundary administrative 0.700391778545257 United States us Americas Northern America
+thomas jefferson national accelerator facility in newport news 2021-02-03 150234788 way Thomas Jefferson National Accelerator Facility, Oyster Point, Newport News, Virginia, United States landuse industrial 1 United States us Americas Northern America
+montana state 2021-02-03 258349675 relation Montana, United States boundary administrative 0.901736049923475 United States us Americas Northern America
+wisconsin 2021-02-03 257826400 relation Wisconsin, United States boundary administrative 0.830625593637679 United States us Americas Northern America
+inouye solar telescope 2021-02-03 150478014 way Daniel K. Inouye Solar Telescope, Crater Road, Maui County, Hawaii, United States man_made telescope 0.551308416199056 United States us Americas Northern America
+university of buffalo 2021-02-03 666703 node University, Main Circle, University Heights, Buffalo, Erie County, New York, 14215, United States railway station 0.390508362962683 United States us Americas Northern America
+university of texas at austin 2021-02-03 57760018 node University of Texas at Austin, 2152, San Jacinto Boulevard, Eastwoods, Austin, Travis County, Texas, 78712, United States amenity college 0.501 United States us Americas Northern America
+uc-berkeley 2021-02-03 258416614 relation University of California, Berkeley, North Street, Panoramic Hill, Berkeley, Alameda County, California, 94720-1076, United States amenity university 0.748194378261701 United States us Americas Northern America
+kent state university 2021-02-03 134730614 way Kent State University, Health Center Drive, Kent, Portage County, Ohio, 44242-0001, United States amenity university 0.781992451472996 United States us Americas Northern America
+national radio astronomy observatory 2021-02-03 103730706 way National Radio Astronomy Observatory, East End Road, Saint Croix District, United States Virgin Islands, United States building yes 0.401 United States us Americas Northern America
+npr 2021-02-03 49983705 node WVXU 91.7 FM, Central Parkway, Betts-Longworth Historic District, West End, Cincinnati, Hamilton County, Ohio, 45210, United States amenity studio 0.299997827209804 United States us Americas Northern America
+esc 2021-02-03 98380724 way Delta County Airport, Birch Street, Woodland Estates, Escanaba, Delta County, Michigan, 49829, United States aeroway aerodrome 0.4004701084432 United States us Americas Northern America
+broad institute 2021-02-03 97512477 way Broad Institute, Charles Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02141, United States building university 0.593012981942171 United States us Americas Northern America
+college of public health 2021-02-03 102868021 way College of Public Health, USF Banyan Circle, Tampa, Hillsborough County, Florida, 33612, United States building yes 0.401 United States us Americas Northern America
+salesforce 2021-02-03 70950029 node Salesforce, 433, North Capitol Avenue, Fayette Street Conservation Area, Indianapolis, Marion, Indiana, 46204, United States office company 0.101 United States us Americas Northern America
+bti 2021-02-03 153377685 way Barter Island Long Range Radar Site Airport, Pipsuk Avenue, Kaktovik, North Slope, Alaska, United States aeroway aerodrome 0.242327847659036 United States us Americas Northern America
+us air national guard 2021-02-03 259576829 relation US Air National Guard, Savannah, Chatham County, Georgia, United States landuse military 0.6 United States us Americas Northern America
+university at buffalo 2021-02-03 106901822 way University at Buffalo, The State University of New York, South Campus, Parkridge Avenue, University Heights, Buffalo, Erie County, New York, 14215, United States amenity university 0.301 United States us Americas Northern America
+national marine fisheries service 2021-02-03 98716401 way National Marine Fisheries Service, Santa Cruz, Santa Cruz County, California, United States boundary administrative 0.525 United States us Americas Northern America
+powell center 2021-02-03 187415894 way Powell Center, Creston-Kenilworth, Portland, Metro, Oregon, United States landuse retail 0.4 United States us Americas Northern America
+federal communications commission 2021-02-03 301202937 node Federal Communications Commission, 45, L Street Northeast, NoMa, Near Northeast, Washington, District of Columbia, 20554, United States office government 0.894765406107107 United States us Americas Northern America
+michigan state university 2021-02-03 94305089 way Michigan State University, Short Street, Bailey, East Lansing, Ingham County, Michigan, 48823, United States amenity university 0.869602686432449 United States us Americas Northern America
+biogen 2021-02-03 191876081 way Biogen, 225, Binney Street, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02142, United States building commercial 0.101 United States us Americas Northern America
+chinook 2021-02-03 258340210 relation Chinook, Blaine County, Montana, 59523, United States boundary administrative 0.445725205949526 United States us Americas Northern America
+nucor 2021-02-03 132810990 way Nucor Steel, Montgomery County, Indiana, United States landuse industrial 0.3 United States us Americas Northern America
+johnson space center 2021-02-03 99133114 way Lyndon B. Johnson Space Center, 2101, NASA Parkway, Houston, Harris County, Texas, 77058, United States tourism attraction 0.818056742388072 United States us Americas Northern America
+heidelberg university hospital 2021-02-03 164310513 way Heidelberg University, Governor's Trail, College Hill, Tiffin, Seneca County, Ohio, 44883, United States amenity university 0.519018527529768 United States us Americas Northern America
+henry ford hospital 2021-02-03 193942596 way Henry Ford Hospital, 2799, West Grand Boulevard, Henry Ford, New Center, Detroit, Wayne County, Michigan, 48202, United States amenity hospital 0.670940340656356 United States us Americas Northern America
+guardian 2021-02-03 2795396 node The Guardian, San Juan County, Colorado, United States natural peak 0.4 United States us Americas Northern America
+meharry medical college 2021-02-03 195325955 way Meharry Medical College, 1005, Dr D B Todd Jr Boulevard, Nashville-Davidson, Davidson County, Tennessee, 37208, United States amenity university 0.301 United States us Americas Northern America
+nature conservancy 2021-02-03 175509415 way Nature Conservancy, Ballston, Arlington, Arlington County, Virginia, United States leisure park 0.35 United States us Americas Northern America
+cprs 2021-02-03 171962530 way CPRS, Dairy Lane, Lancaster County, Pennsylvania, 17022, United States leisure sports_centre 0.101 United States us Americas Northern America
+us national institute of aerospace 2021-02-03 181006875 way National Institute of Aerospace (NIA) and U.S. Representative Scott Rigell, 1100, Exploration Way, Hampton Roads Center - North Campus, Hampton, Virginia, 23666, United States building commercial 0.501 United States us Americas Northern America
+fsi 2021-02-03 3120194 node Henry Post Army Airfield, Condon Road, Lawton, Comanche County, Oklahoma, 73503, United States aeroway aerodrome 0.23181178765026 United States us Americas Northern America
+axial 2021-02-03 378998 node Axial, Moffat County, Colorado, United States place hamlet 0.35 United States us Americas Northern America
+st. jude children's research hospital 2021-02-03 258425834 relation St. Jude Children's Research Hospital, 262, Danny Thomas Place, Lauderdale Courts, Memphis, Shelby County, Tennessee, 38105, United States amenity hospital 1.00269308307499 United States us Americas Northern America
+natural resources defense council 2021-02-03 48705927 node Natural Resources Defense Council, 317, East Mendenhall Street, Bozeman, Gallatin County, Montana, 59715, United States place house 0.401 United States us Americas Northern America
+arizona state university 2021-02-03 258489814 relation Arizona State University, East Apache Boulevard, Tempe Junction, Tempe, Maricopa County, Arizona, 85287, United States amenity university 0.854736575831137 United States us Americas Northern America
+european society 2021-02-03 84196080 node European Republic, 213, Chestnut Street, Society Hill, Philadelphia, Philadelphia County, Pennsylvania, 19106, United States amenity fast_food 0.201 United States us Americas Northern America
+pacific northwest research station 2021-02-03 7571845 node Pacific Star, Research Boulevard, Woodland Village, Pond Springs, Austin, Williamson County, Texas, 78759, United States amenity restaurant 0.201 United States us Americas Northern America
+national comprehensive cancer center 2021-02-03 170461892 way Comprehensive Cancer Center, 340, Exempla Circle, Lafayette, Boulder County, Colorado, 80026, United States office yes 0.301 United States us Americas Northern America
+fred hutchinson cancer research center 2021-02-03 179513052 way Fred Hutchinson Cancer Research Center, 1100, Fairview Avenue North, South Lake Union, Capitol Hill, Seattle, King County, Washington, 98109, United States amenity research_institute 0.831005307834616 United States us Americas Northern America
+southern gardens citrus 2021-02-03 88472039 way West Southern Street, Homosassa Springs, Citrus County, Florida, 34461, United States highway residential 0.3 United States us Americas Northern America
+orbital atk 2021-02-03 121003549 way Orbital ATK - Allegany Ballistics Laboratory, Bier, Allegany County, Maryland, United States landuse area 0.405371759161912 United States us Americas Northern America
+advancement of science 2021-02-03 8123167 node AAAS / Science, 1200, New York Avenue Northwest, Downtown, Washington, District of Columbia, 20005, United States tourism attraction 0.201 United States us Americas Northern America
+relativistic heavy ion collider 2021-02-03 258938147 relation NSLS II, Brookhaven National Laboratory, Suffolk County, New York, 11961, United States place locality 0.225 United States us Americas Northern America
+harlem junior high school 2021-02-03 194527401 way Harlem Junior High School, Northfield Avenue, Loves Park, Winnebago County, Illinois, 61111, United States amenity school 0.401 United States us Americas Northern America
+chapman university in orange 2021-02-03 258413846 relation Chapman University, 1, University Drive, Orange, Orange County, California, 92866, United States amenity university 0.732173490264596 United States us Americas Northern America
+children's cancer research institute 2021-02-03 157002637 way Children's Cancer Research Institute, 8403, Floyd Curl Drive, South Texas Medical Center, San Antonio, Bexar County, Texas, 78229, United States building yes 0.501 United States us Americas Northern America
+harris county public health 2021-02-03 70168132 node Dillard St at E Main St (County Public Health), South Dillard Street, Downtown Durham, Durham, Durham County, North Carolina, 27701, United States highway bus_stop 0.301 United States us Americas Northern America
+johns hopkins bayview medical center 2021-02-03 109799549 way Johns Hopkins Bayview Medical Center, 4940, Eastern Avenue, Greektown, Baltimore, Maryland, 21224, United States amenity hospital 0.799042266993274 United States us Americas Northern America
+johnson & johnson of new brunswick 2021-02-03 99014438 way Johnson and Johnson, New Brunswick, Middlesex County, New Jersey, 08903, United States highway service 0.475 United States us Americas Northern America
+des moines university 2021-02-03 126157336 way Des Moines University, 3200, Grand Avenue, Grand Oaks Condominiums, Des Moines, Polk County, Iowa, 50312, United States amenity university 0.625616522175778 United States us Americas Northern America
+university of california in santa barbara 2021-02-03 205319990 way University of California, Santa Barbara, Santa Barbara, Santa Barbara County, California, 93106, United States place locality 0.625 United States us Americas Northern America
+lena foundation 2021-02-03 26990642 node LENA Research Foundation, 5525, Central Avenue, Boulder, Boulder County, Colorado, 80301, United States office research 0.201 United States us Americas Northern America
+us pacific tsunami warning center 2021-02-03 297701617 node Pacific Tsunami Warning Center, Perimeter Road, Pacific Tsunami Warning Center, Ewa Beach, Honolulu County, Hawaii, 96706, United States man_made monitoring_station 0.754544854295327 United States us Americas Northern America
+rosetta stone 2021-02-03 37420348 node Rosetta stone, 6000, North Terminal Parkway, College Park, Clayton County, Georgia, 30337, United States shop jewelry 0.201 United States us Americas Northern America
+macchiarini 2021-02-03 106996300 way Peter Macchiarini Steps, Telegraph Hill, San Francisco, San Francisco City and County, California, 94113, United States highway steps 0.175 United States us Americas Northern America
+coskata 2021-02-03 496405 node Coskata, Nantucket County, Massachusetts, United States place hamlet 0.270881295424728 United States us Americas Northern America
+oklahoma 2021-02-03 258391951 relation Oklahoma, United States boundary administrative 0.814016195392348 United States us Americas Northern America
+wyoming 2021-02-03 257871658 relation Wyoming, United States boundary administrative 0.790706641027201 United States us Americas Northern America
+us department of labor 2021-02-03 196192727 way Department of Labor, 550, South 16th Street, Capitol View, Haymarket, Lincoln, Lancaster County, Nebraska, 68508, United States office government 0.301 United States us Americas Northern America
+university of california in davis 2021-02-03 258689332 relation University of California, Davis, Russell Boulevard, Davis, Yolo County, California, 95616, United States amenity university 0.401 United States us Americas Northern America
+power 2021-02-03 258584590 relation Power County, Idaho, 83211, United States boundary administrative 0.56152149654469 United States us Americas Northern America
+international finance corporation 2021-02-03 106721102 way International Finance Corporation, 2121, Pennsylvania Avenue Northwest, Washington, District of Columbia, 20006, United States office yes 0.301 United States us Americas Northern America
+us national radio astronomy observatory 2021-02-03 103730706 way National Radio Astronomy Observatory, East End Road, Saint Croix District, United States Virgin Islands, United States building yes 0.401 United States us Americas Northern America
+northwestern university 2021-02-03 258324584 relation Northwestern University, 633, Clark Street, Downtown, Evanston, Evanston Township, Cook County, Illinois, 60208, United States amenity university 0.78907157644275 United States us Americas Northern America
+monell chemical senses center 2021-02-03 237615520 way Monell Chemical Senses Center, Market Street, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19104, United States building yes 0.401 United States us Americas Northern America
+new mexico state university 2021-02-03 258148480 relation New Mexico State University, Triviz Drive, Las Cruces, Doña Ana County, New Mexico, 88003, United States amenity university 0.861659299619142 United States us Americas Northern America
+rockefeller 2021-02-03 320163 node Rockefeller, Ogden, Weber County, Utah, 84403, United States place locality 0.225 United States us Americas Northern America
+boston globe 2021-02-03 92324871 way Boston Street, Globe, Gila County, Arizona, 85501, United States highway residential 0.3 United States us Americas Northern America
+henrys 2021-02-03 334760 node Henrys, Maple Valley, King County, Washington, 98010, United States place hamlet 0.35 United States us Americas Northern America
+college of william & mary 2021-02-03 259442397 relation College of William and Mary, Compton Drive, Williamsburg, Williamsburg (city), Virginia, 23186, United States amenity university 0.898687544181304 United States us Americas Northern America
+us patent and trademark office 2021-02-03 55565757 node Silicon Valley United States Patent and Trademark Office, South 4th Street, Saint James Square Historic District, Japantown, San Jose, Santa Clara County, California, 95112-3580, United States office government 0.401 United States us Americas Northern America
+brookhaven national laboratory 2021-02-03 104653350 way Brookhaven National Laboratory, Suffolk County, New York, United States landuse commercial 0.5 United States us Americas Northern America
+university of tennessee 2021-02-03 178444498 way University of Tennessee, Alcoa Highway, Fort Sanders, Knoxville, Knox County, Tennessee, 37996, United States amenity university 0.844319596061909 United States us Americas Northern America
+complete genomics 2021-02-03 94062190 way Complete Genomics, Inc., 2071, Stierlin Court, Britannia Shoreline Technology Park, Mountain View, Santa Clara County, California, 94043, United States building yes 0.201 United States us Americas Northern America
+keystone xl 2021-02-03 83355450 node Keystone XL Whitewater Heliport, East Whitewater Road, Whitewater, Phillips County, Montana, 59544, United States aeroway helipad 0.201 United States us Americas Northern America
+acad 2021-02-03 88308109 way Acad, Parlier, Fresno County, California, 93662, United States highway residential 0.2 United States us Americas Northern America
+regeneron pharmaceuticals 2021-02-03 12282651 node Regeneron Pharmaceuticals, Garden Way, Clinton Park, Town of East Greenbush, Rensselaer County, New York, 12144, United States landuse industrial 0.201 United States us Americas Northern America
+st jude children's research hospital 2021-02-03 258425834 relation St. Jude Children's Research Hospital, 262, Danny Thomas Place, Lauderdale Courts, Memphis, Shelby County, Tennessee, 38105, United States amenity hospital 1.00269308307499 United States us Americas Northern America
+southwest research institute 2021-02-03 258916067 relation Southwest Research Institute, 6220, Culebra Road, San Antonio, Bexar County, Texas, 78228, United States amenity research_institute 0.663793454953531 United States us Americas Northern America
+center for physics research 2021-02-03 96734346 way American Center for Physics, Physics Ellipse Drive, University of Maryland Research Park, Riverdale Park, Prince George's County, Maryland, 20737, United States building office 0.401 United States us Americas Northern America
+stony brook university 2021-02-03 104502319 way Stony Brook University, 100, Nicolls Road, Suffolk County, New York, 11794, United States amenity university 0.803198357564167 United States us Americas Northern America
+central laser facility 2021-02-03 228612591 way Central Laser Facility, West 2500 South, Millard County, Utah, United States man_made observatory 0.301 United States us Americas Northern America
+time machine 2021-02-03 256915027 way Time Machine, 4600, Sea Breeze, Rochester, Monroe County, New York, 14622, United States natural scree 0.4 United States us Americas Northern America
+washington college 2021-02-03 195835630 way Washington College, 300, Washington Avenue, Lees Corner, Chestertown, Kent County, Maryland, 21620, United States amenity university 0.616731953273046 United States us Americas Northern America
+merrimack pharmaceuticals 2021-02-03 43463000 node Merrimack Pharmaceuticals, 1, Broadway, East Cambridge, Cambridge, Middlesex County, Massachusetts, 02139, United States amenity research_institute 0.201 United States us Americas Northern America
+american lung association 2021-02-03 76922142 node American Lung Association, 3000, Kelly Lane, Springfield, Sangamon County, Illinois, 62711, United States amenity social_facility 0.301 United States us Americas Northern America
+center for genomics 2021-02-03 151793647 way Center for Genomics and Systems Biology, 16, Waverly Place, Greenwich Village, Manhattan Community Board 2, Manhattan, New York County, New York, 10003, United States building university 0.301 United States us Americas Northern America
+university of minnesota duluth 2021-02-03 117000042 way University of Minnesota Duluth, West Saint Marie Street, Duluth, Saint Louis County, Minnesota, 55803, United States amenity university 0.808420514850446 United States us Americas Northern America
+winthrop hospital 2021-02-03 258517235 relation Winthrop, Suffolk County, Massachusetts, 02152, United States boundary administrative 0.548258147549701 United States us Americas Northern America
+foothill college 2021-02-03 2853914 node Foothill College, Loop Road, Los Altos Hills, Santa Clara County, California, 94022, United States amenity school 0.201 United States us Americas Northern America
+heart association 2021-02-03 167716675 way Sacred Heart Church Hall, South Military Street, Morley Area Residents Association, Dearborn, Wayne County, Michigan, 481241, United States amenity place_of_worship 0.201 United States us Americas Northern America
+indiana state university 2021-02-03 107213197 way Indiana State University, North 7th Street, Terre Haute, Vigo County, Indiana, 47804, United States amenity university 0.736151154174256 United States us Americas Northern America
+oregon health & science university 2021-02-03 258885522 relation Oregon Health & Science University, Robert Hugh Baldock Freeway, South Portland, Portland, Metro, Oregon, 97258, United States amenity university 0.776527586886318 United States us Americas Northern America
+geha 2021-02-03 257939755 relation Geauga County, Ohio, United States boundary administrative 0.515207975256723 United States us Americas Northern America
+cascadia 2021-02-03 321395 node Cascadia, Linn County, Oregon, United States place hamlet 0.399042266993274 United States us Americas Northern America
+nsa 2021-02-03 135361590 way National Security Agency, Anne Arundel County, Maryland, United States landuse government 0.566177100706018 United States us Americas Northern America
+preparedness and response branch 2021-02-03 2976629 node Office of Emergency Preparedness and Response, 3661, East Virginia Beach Boulevard, Ingleside, Norfolk, Virginia, 23502, United States amenity public_building 0.301 United States us Americas Northern America
+solidarity 2021-02-03 48908995 node The Spirit of Polonia, North 10th Street, Westown, Milwaukee, Milwaukee County, Wisconsin, 53233, United States tourism artwork 0.339306791900516 United States us Americas Northern America
+university of montana 2021-02-03 207899223 way University of Montana, East Beckwith Avenue, University District, Missoula, Missoula County, Montana, 59812, United States amenity university 0.76176245010242 United States us Americas Northern America
+duke university 2021-02-03 259450641 relation Duke University, 15th Street, 9th Street District, Durham, Durham County, North Carolina, 27705, United States amenity university 0.793140337132867 United States us Americas Northern America
+donald danforth plant science center 2021-02-03 257849720 way Donald Danforth Plant Science Center, 975, North Warson Road, Olivette, Saint Louis County, Missouri, 63131, United States office research 0.501 United States us Americas Northern America
+oh 2021-02-03 295875618 relation Ohio, United States boundary administrative 0.8407357649767 United States us Americas Northern America
+cdc 2021-02-03 172987439 way CDC, New Center, Detroit, Wayne County, Michigan, United States landuse farmyard 0.3 United States us Americas Northern America
+u.s. senate 2021-02-03 367209 node Senate, Jack County, Texas, United States place hamlet 0.55 United States us Americas Northern America
+berkley 2021-02-03 257341204 relation Berkley, Boone County, Iowa, United States boundary administrative 0.532062340731545 United States us Americas Northern America
+packard 2021-02-03 408214 node Packard, Town of Wagner, Marinette County, Wisconsin, 49877, United States place hamlet 0.35 United States us Americas Northern America
+university of memphis 2021-02-03 103281268 way The University of Memphis, University, Normal, Memphis, Shelby County, Tennessee, 38152, United States amenity university 0.779389836000794 United States us Americas Northern America
+institute for cancer research 2021-02-03 102403056 way David H. Koch Institute for Integrative Cancer Research, 500, Main Street, East Cambridge, Cambridgeport, Cambridge, Middlesex County, Massachusetts, 02142, United States building university 0.697580560553068 United States us Americas Northern America
+usa 2021-02-03 257984054 relation United States boundary administrative 0.935691367457589 United States us Americas Northern America
+institute of virology 2021-02-03 171936676 way Institute of Human Virology, 725, West Lombard Street, Ridgely's Delight, Baltimore, Maryland, 21201, United States building university 0.301 United States us Americas Northern America
+github 2021-02-03 21615383 node GitHub, 88, Colin P. Kelly Junior Street, South Beach, San Francisco, San Francisco City and County, California, 94107, United States office company 0.101 United States us Americas Northern America
+biohub 2021-02-03 297451046 relation BioHub Boston, Waltham, Middlesex County, Massachusetts, United States landuse commercial 0.3 United States us Americas Northern America
+miami university in oxford 2021-02-03 134890642 way Miami University, McKee Avenue, Oxford, Oxford Township, Butler County, Ohio, 45056, United States amenity university 0.801832830623064 United States us Americas Northern America
+eldora 2021-02-03 258353320 relation Eldora, Hardin County, Iowa, 50627, United States boundary administrative 0.542383952483738 United States us Americas Northern America
+northeastern university 2021-02-03 163110509 way Northeastern University, Ruggles Street, Roxbury Crossing, Roxbury, Boston, Suffolk County, Massachusetts, 02120, United States amenity university 0.692915167891094 United States us Americas Northern America
+ford 2021-02-03 258207918 relation Ford County, Illinois, United States boundary administrative 0.635552540995357 United States us Americas Northern America
+department of state 2021-02-03 46783150 node National foreign affairs, training center, Shultz, department of state, 4000, NFATC, Alcova Heights, Arlington, Arlington County, Virginia, 22204, United States place house 0.301 United States us Americas Northern America
+dlr 2021-02-03 41377326 node Disneyland Resort, 1313, South Harbor Boulevard, Anaheim Resort District, Anaheim, Orange County, California, 92802, United States tourism theme_park 0.484442064603758 United States us Americas Northern America
+lunar planetary institute 2021-02-03 2467172 node Lunar and Planetary Institute Rice University, West Oaks Drive, Pasadena, Harris County, Texas, 77058, United States amenity school 0.301 United States us Americas Northern America
+university of wisconsin–madison 2021-02-03 259436351 relation University of Wisconsin-Madison, Lake Mendota Drive, Madison, Dane County, Wisconsin, 53705, United States amenity university 0.980768897517013 United States us Americas Northern America
+public lab 2021-02-03 61104485 node Public Lab (NYC), 19, Morris Avenue, Brooklyn Navy Yard, Brooklyn, Kings County, New York, 11205, United States office ngo 0.201 United States us Americas Northern America
+hampton university 2021-02-03 258960793 relation Hampton University, 100, East Queen Street, Kecoughtan, Hampton, Virginia, 23668, United States amenity university 0.637183546812171 United States us Americas Northern America
+centers for disease control and prevention 2021-02-03 96695743 way Centers for Disease Control and Prevention Edward R. Roybal Campus, Clifton Heights Lane Northeast, Druid Hills, DeKalb County, Georgia, 1540, United States office research 0.601 United States us Americas Northern America
+brain science institute 2021-02-03 176152346 way Allen Institute for Brain Science, 615, Westlake Avenue North, South Lake Union, Belltown, Seattle, King County, Washington, 98109, United States office research 0.301 United States us Americas Northern America
+whittemore peterson institute in reno 2021-02-03 174133369 way Whittemore Peterson Institute, North Medical Way, Reno, Washoe County, Nevada, 89557, United States building university 0.501 United States us Americas Northern America
+us national weather service 2021-02-03 226762473 way National Weather Service, Valley, Douglas County, Nebraska, United States landuse commercial 0.5 United States us Americas Northern America
+galveston national laboratory 2021-02-03 229364111 way NMFS - Galveston Laboratory, NOAA, Galveston, Galveston County, Texas, 77551, United States office government 0.201 United States us Americas Northern America
+trump white house 2021-02-03 445769 node Trump, Baltimore County, Maryland, 21161, United States place hamlet 0.375244632729739 United States us Americas Northern America
+university of naples 2021-02-03 2738023 node Walden University, Bahia Point, Naples, Collier County, Florida, 34103, United States amenity school 0.201 United States us Americas Northern America
+larsen c 2021-02-03 445188 node Larsen, Jacksonville, Duval County, Florida, 32207, United States place hamlet 0.45 United States us Americas Northern America
+san francisco department of public health 2021-02-03 51450093 node IL Department of Public Health, 422, South 5th Street, Springfield, Sangamon County, Illinois, 62701, United States office government 0.501 United States us Americas Northern America
+calico 2021-02-03 330304 node Calico, Kern County, California, 93250, United States place locality 0.507681409931154 United States us Americas Northern America
+npa 2021-02-03 10613845 node Pensacola Naval Air Station/Forrest Sherman Field, Skyhawk Drive, Pensacola, Escambia County, Florida, 32508, United States aeroway aerodrome 0.426476718565125 United States us Americas Northern America
+climate research 2021-02-03 137741682 way NOAA Center for Weather and Climate Prediction, 5830, University Research Court, University of Maryland Research Park, College Park, Prince George's County, Maryland, 20740, United States building office 0.201 United States us Americas Northern America
+kuhlman 2021-02-03 427205 node Kuhlman, Highlands County, Florida, 33872:33875, United States place hamlet 0.35 United States us Americas Northern America
+state university of new york 2021-02-03 176996050 way University at Albany, The State University of New York, Tricentenial Drive, Albany, Albany County, New York, 12203, United States amenity university 0.941578907776644 United States us Americas Northern America
+environmental research 2021-02-03 145493547 way Environmental Research, South Euclid Avenue, Boise, Ada County, Idaho, 83706, United States building yes 0.201 United States us Americas Northern America
+cgs 2021-02-03 258450803 relation College Park Airport, 1909, Corporal Frank Scott Drive, University of Maryland Research Park, Old Town, College Park, Prince George's County, Maryland, 20740, United States aeroway aerodrome 0.290812406874276 United States us Americas Northern America
+environmental sciences 2021-02-03 143791307 way Environmental Sciences, East Ermina Avenue, Chief Garry Park, Spokane, Spokane County, Washington, 99211, United States building yes 0.201 United States us Americas Northern America
+naval postgraduate school 2021-02-03 199378988 way US Naval Postgraduate School, 1, Del Monte, Monterey, Monterey County, California, 93943, United States landuse military 0.5 United States us Americas Northern America
+butler hospital 2021-02-03 185761944 way Butler Hospital, 345, Blackstone Boulevard, Blackstone, Providence, Providence County, Rhode Island, 02906-4800, United States amenity hospital 0.453363019766637 United States us Americas Northern America
+loyola university of chicago 2021-02-03 123418197 way Loyola University Water Tower Campus, North Rush Street, Magnificent Mile, Near North Side, Chicago, Cook County, Illinois, 60611, United States amenity university 0.78906723611033 United States us Americas Northern America
+balearics 2021-02-03 168510467 way Balearics Drive, Saint Augustine Shores, St. Augustine Shores, St. Johns County, Florida, 32086, United States highway residential 0.2 United States us Americas Northern America
+orbital sciences 2021-02-03 247187997 way Orbital Sciences, New South Road, Santa Barbara County, California, United States building yes 0.201 United States us Americas Northern America
+stetson university 2021-02-03 258984879 relation Stetson University, 421, DeLand Greenway, DeLand, Volusia County, Florida, 32723, United States amenity university 0.601059138797379 United States us Americas Northern America
+usgs 2021-02-03 198081067 way U.S. Geological Survey Great Lakes Science Center, Ann Arbor, Washtenaw County, Michigan, United States landuse industrial 0.2 United States us Americas Northern America
+kentucky 2021-02-03 257850228 relation Kentucky, United States boundary administrative 0.81140476114566 United States us Americas Northern America
+vanderbilt university medical center 2021-02-03 198973508 way Vanderbilt University Medical Center, 1211, Medical Center Drive, Nashville-Davidson, Davidson County, Tennessee, 37232, United States amenity hospital 0.7277684953714 United States us Americas Northern America
+big bear solar observatory 2021-02-03 124213771 way Big Bear Solar Observatory, San Bernardino County, California, United States landuse observatory 0.678015094618814 United States us Americas Northern America
+guardian angels 2021-02-03 52339565 node Guardian Angels, 581, East 14 Mile Road, Clawson, Oakland County, Michigan, 48014, United States amenity place_of_worship 0.201 United States us Americas Northern America
+new bedford whaling museum 2021-02-03 142269179 way New Bedford Whaling Museum, 18, Johnny Cake Hill, New Bedford, Bristol County, Massachusetts, 02740, United States tourism museum 0.660958143076972 United States us Americas Northern America
+tlr 2021-02-03 102668648 way Mefford Field, Golden State Highway, Tulare, Tulare County, California, 93274-8029, United States aeroway aerodrome 0.166903631515068 United States us Americas Northern America
+bryn mawr college 2021-02-03 116358987 way Bryn Mawr College, Old Gulph Road, Lower Merion Township, Montgomery County, Pennsylvania, 19085, United States amenity college 0.78287678963334 United States us Americas Northern America
+national solar observatory 2021-02-03 51609551 node National Solar Observatory, 3665, Discovery Drive, Boulder, Boulder County, Colorado, 80303, United States office research 0.56358119422997 United States us Americas Northern America
+general services administration 2021-02-03 258573536 relation General Services Administration, 1800, F Street Northwest, Golden Triangle, Washington, District of Columbia, 20037, United States office government 0.466903631515068 United States us Americas Northern America
+mexican national forest commission 2021-02-03 69476412 node San Antonio and Mexican Gulf Railroad, FM 1090, Port Lavaca, Calhoun County, Texas, 77979, United States tourism information 0.101 United States us Americas Northern America
+cascades volcano observatory 2021-02-03 3002655 node David A Johnston Cascades Volcano Observatory, Southeast Tech Center Drive, Columbia Tech Center, Vancouver, Clark County, Washington, 98683, United States building yes 0.301 United States us Americas Northern America
+beth israel deaconess medical center 2021-02-03 147022219 way Beth Israel Deaconess Medical Center East Campus, 330, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States amenity hospital 0.859613385609502 United States us Americas Northern America
+hess 2021-02-03 464089 node Hess, Harford County, Maryland, United States place hamlet 0.35 United States us Americas Northern America
+boston common 2021-02-03 94132085 way Boston Common, Beacon Hill, Boston, Suffolk County, Massachusetts, United States leisure park 0.618142367209955 United States us Americas Northern America
+drexel university 2021-02-03 104178294 way Drexel University, West Bank Greenway, Powelton Village, Philadelphia, Philadelphia County, Pennsylvania, 19104-2892, United States amenity university 0.682066632905469 United States us Americas Northern America
+sloan digital sky 2021-02-03 3752682 node Sloan Digital Sky Survey telescope, Apache Point Road, Otero County, New Mexico, 88349, United States man_made telescope 0.301 United States us Americas Northern America
+nomad 2021-02-03 259247036 relation NoMad, Manhattan Community Board 5, Manhattan, New York County, New York, United States boundary administrative 0.429555066820797 United States us Americas Northern America
+creative commons 2021-02-03 2584381 node Creative Learning Center School, Avenue of the Commons, Shrewsbury, Monmouth County, New Jersey, 07702, United States amenity school 0.201 United States us Americas Northern America
+farber cancer institute 2021-02-03 145616376 way Dana-Farber Cancer Institute, 450, Brookline Avenue, Boston, Suffolk County, Massachusetts, 02215, United States amenity hospital 0.61689306175332 United States us Americas Northern America
+lloyd 2021-02-03 506446 node Lloyd, Town of Lloyd, Ulster County, New York, 12528, United States place town 0.4 United States us Americas Northern America
+recognition 2021-02-03 213255421 way Volunteer Recognition Park, Schuylerville, Town of Saratoga, Saratoga County, New York, United States leisure park 0.25 United States us Americas Northern America
+lbnl 2021-02-03 201093023 way Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States amenity research_institute 0.001 United States us Americas Northern America
+green bank observatory 2021-02-03 299024599 relation Green Bank Observatory, ICB Road, Green Bank, Pocahontas County, West Virginia, 24944, United States amenity research_institute 0.301 United States us Americas Northern America
+doe's lawrence berkeley national laboratory 2021-02-03 201093023 way Lawrence Berkeley National Laboratory, Lower Jordan Fire Trail, Oakland, Alameda County, California, 94720-1076, United States amenity research_institute 0.501 United States us Americas Northern America
+idaho 2021-02-03 257490816 relation Idaho, United States boundary administrative 0.791516533107901 United States us Americas Northern America
+nnsa 2021-02-03 170892516 way NNSA Gun Range, North Base Road, Kern County, California, United States building industrial 0.101 United States us Americas Northern America
+pti 2021-02-03 166146214 way Parque Tecnológico Industrial del Cerro, Tres Ombúes, Montevideo, Uruguay landuse industrial 0.2 Uruguay uy Americas South America
+mpp 2021-02-03 39550688 node Movimiento de Participación Popular, 1368, Mercedes, Cordón, Montevideo, 11200, Uruguay office political_party 0.280014158487789 Uruguay uy Americas South America
+ocean doctor 2021-02-03 146694002 way Ocean Drive, Punta Del Este, Maldonado, 20100, Uruguay landuse residential 0.3 Uruguay uy Americas South America
+uruguay 2021-02-03 257746160 relation Uruguay boundary administrative 0.835509004923576 Uruguay uy Americas South America
+uzbekistan 2021-02-03 257555259 relation Oʻzbekiston boundary administrative 0.709755684022544 Oʻzbekiston uz Asia Central Asia
+food and agricultural organization 2021-02-03 51698085 node ПродовольÑ<81>твеннаÑ<8f> и СельÑ<81>кохозÑ<8f>йÑ<81>твеннаÑ<8f> ОрганизациÑ<8f> ООÐ<9d> (ФÐ<90>О), 2, УниверÑ<81>итетÑ<81>каÑ<8f> улица, Yunusobod tumani, Salar, Qibray tumani, Toshkent Viloyati, 100140, OÊ»zbekiston office government 0.001 OÊ»zbekiston uz Asia Central Asia
+food and agricultural organization of the united nations 2021-02-03 51698085 node ПродовольÑ<81>твеннаÑ<8f> и СельÑ<81>кохозÑ<8f>йÑ<81>твеннаÑ<8f> ОрганизациÑ<8f> ООÐ<9d> (ФÐ<90>О), 2, УниверÑ<81>итетÑ<81>каÑ<8f> улица, Yunusobod tumani, Salar, Qibray tumani, Toshkent Viloyati, 100140, OÊ»zbekiston office government 0.001 OÊ»zbekiston uz Asia Central Asia
+nuclear institute 2021-02-03 138409897 way ИнÑ<81>титут Ñ<8f>дерной физики Ð<90>кадемии наук РеÑ<81>публики УзбекиÑ<81>тан, Xuroson ko'chasi, Mirzo Ulug‘bek tumani, Toshkent, Qibray tumani, Toshkent Viloyati, 100214, OÊ»zbekiston office research 0.128160971568546 OÊ»zbekiston uz Asia Central Asia
+pontifical academy of sciences 2021-02-03 58730114 node Pontificia Accademia delle Scienze, Viale del Giardino Quadrato, Città del Vaticano, 00120, Città del Vaticano office educational_institution 0.483796693268388 Città del Vaticano va Europe Southern Europe
+enea 2021-02-03 255171662 way La Enea, Parroquia Urbana Biruaca, Municipio Biruaca, Apure, Venezuela place town 0.4 Venezuela ve Americas South America
+ccs 2021-02-03 245233315 way Aeropuerto Internacional de MaiquetÃa Simón BolÃvar, Avenida La Entrada, Playa Grande, Parroquia Raul Leoni, Municipio Vargas, La Guaira, 1262, Venezuela aeroway aerodrome 0.437029786068705 Venezuela ve Americas South America
+yanomami 2021-02-03 256039598 way Shabono Yanomami, Parroquia Alto Orinoco, Municipio Autònomo Alto Orinoco, Amazonas, Venezuela place village 0.375 Venezuela ve Americas South America
+simón bolívar university 2021-02-03 125491265 way Universidad Simón BolÃvar, Carretera: Hoyo de la Puerta - El Placer, Hoyo de La Puerta, Caracas, Parroquia Baruta, Municipio Baruta, Miranda, 1086, Venezuela amenity university 0.201 Venezuela ve Americas South America
+veritas 2021-02-03 64466466 node Veritas, Calabozo, Parroquia Calabozo, Municipio Francisco de Miranda, Guárico, 2312, Venezuela place suburb 0.375 Venezuela ve Americas South America
+falcon 2021-02-03 1238826 node Falcón, Región Centroccidental, Venezuela place state 0.55 Venezuela ve Americas South America
+myc 2021-02-03 244232769 way Aeropuerto Nacional Los Tacariguas, Carretera: Maracay - Valencia, Alezurca, Maracay, Parroquia Aguas Calientes, Municipio Diego Ibarra, Aragua, 2103, Venezuela aeroway aerodrome 0.328369791841981 Venezuela ve Americas South America
+venezuela 2021-02-03 258211725 relation Venezuela boundary administrative 0.857303027661612 Venezuela ve Americas South America
+virgin islands 2021-02-03 258226789 relation British Virgin Islands boundary administrative 0.809067636380411 British Virgin Islands vg Americas Caribbean
+cuc tran 2021-02-03 199887384 way Chi cục Hải quan Móng Cái, Trần Phú, Thà nh phố Móng Cái, Việt Nam landuse commercial 0.2 Việt Nam vn Asia South-Eastern Asia
+vietnam 2021-02-03 258322044 relation Việt Nam boundary administrative 0.751194527333514 Việt Nam vn Asia South-Eastern Asia
+neo 2021-02-03 3168841 node Neo, Yên Dũng, Tỉnh Bắc Giang, Việt Nam place town 0.4 Việt Nam vn Asia South-Eastern Asia
+htv 2021-02-03 127533062 way 9, Ä<90>aÌ€i Truyền hiÌ€nh TP.HCM (HTV), PhÆ°á»<9d>ng Bến Nghé, Quáºn 1, Thà nh phố Hồ Chà Minh, Việt Nam landuse commercial 0.3 Việt Nam vn Asia South-Eastern Asia
+u.n. 2021-02-03 81631376 node U Na, Huyện MÆ°á»<9d>ng Tè, Tỉnh Lai Châu, Việt Nam place hamlet 0.45 Việt Nam vn Asia South-Eastern Asia
+oxford university clinical research unit 2021-02-03 234394315 way Oxford University Clinical Research Unit, Ä<90>Æ°á»<9d>ng Huỳnh Mẫn Ä<90>ạt, PhÆ°á»<9d>ng 1, Quáºn 5, Thà nh phố Hồ Chà Minh, 72000, Việt Nam building yes 0.501 Việt Nam vn Asia South-Eastern Asia
+tb 2021-02-03 258596011 relation Tỉnh Thái Bình, Việt Nam boundary administrative 0.503635282684637 Việt Nam vn Asia South-Eastern Asia
+oceanographic institute 2021-02-03 4007088 node Oceanographic Institute of Nha Trang, Trần Phú, VÄ©nh TrÆ°á»<9d>ng, Nha Trang, Tỉnh Khánh Hòa, 652510, Việt Nam tourism museum 0.201 Việt Nam vn Asia South-Eastern Asia
+politburo 2021-02-03 138890529 way Nhà Há»<8d>p bá»™ ChÃnh trị, Phố Ông Ã<8d>ch Khiêm, Ä<90>iện Biên, PhÆ°á»<9d>ng Ä<90>iện Biên, Quáºn Ba Ä<90>ình, Hà Ná»™i, 100901, Việt Nam building yes 0.001 Việt Nam vn Asia South-Eastern Asia
+vale 2021-02-03 258322044 relation Việt Nam boundary administrative 0.751194527333514 Việt Nam vn Asia South-Eastern Asia
+marie curie university 2021-02-03 164542463 way Marie Curie, Vietnam National University HCMC, PhÆ°á»<9d>ng Ä<90>ông Hòa, Thà nh phố DÄ© An, Tỉnh Bình DÆ°Æ¡ng, 7200000, Việt Nam highway residential 0.4 Việt Nam vn Asia South-Eastern Asia
+institute of plant protection 2021-02-03 230206488 way Viện Bảo vệ Thá»±c váºt, Ngõ 68 Nông Lâm, PhÆ°á»<9d>ng Ä<90>ức Thắng, Quáºn Bắc Từ Liêm, Hà Ná»™i, 04, Việt Nam amenity research_centre 0.001 Việt Nam vn Asia South-Eastern Asia
+barrick 2021-02-03 68461868 node Barrick, Sanma, Vanuatu place village 0.375 Vanuatu vu Oceania Melanesia
+pepsi 2021-02-03 67666711 node Pepsi, Luganville, Sanma, Vanuatu place neighbourhood 0.35 Vanuatu vu Oceania Melanesia
+vanuatu 2021-02-03 258495458 relation Vanuatu boundary administrative 0.741390776726574 Vanuatu vu Oceania Melanesia
+japan international cooperation agency 2021-02-03 301319209 way Japan International Cooperation Agency, Main Beach Road, Apia, SÄ<81>moa office foreign_national_agency 0.401 SÄ<81>moa ws Oceania Polynesia
+samoa 2021-02-03 258569989 relation SÄ<81>moa boundary administrative 0.643977564870154 SÄ<81>moa ws Oceania Polynesia
+kosovo 2021-02-03 258483176 relation Kosova / Kosovo boundary administrative 0.780306211882666 Kosova / Kosovo xk NA NA
+prn 2021-02-03 160024167 way Aeroporti Ndërkombëtar i Prishtinës "Adem Jashari", Aeroporti, Vrellë e Goleshit, Komuna e Lipjanit / Opština Lipljan, 12050, Kosova / Kosovo aeroway aerodrome 0.410428262396698 Kosova / Kosovo xk NA NA
+university of priština 2021-02-03 179041192 way University for Business and Technology, Rexhep Krasniqi, Arbëri, Kalabria, Prishtinë, Komuna e Prishtinës / OpÅ¡tina PriÅ¡tina, 10000, Kosova / Kosovo amenity university 0.201 Kosova / Kosovo xk NA NA
+assaf 2021-02-03 75461355 node عسـاÙ<81>, ميلات, مديرية جبل Øبشي, Ù…ØاÙ<81>ظة تعز, اليمن place hamlet 0.25 اليمن ye Asia Western Asia
+university of science and technology 2021-02-03 104295063 way جامعة العلوم والتكنولوجيا, شارع القاهرة, الجامعة, مديرية معين, مدينة صنعاء, أمانة العاصمة, 0022, اليمن amenity university 0.001 اليمن ye Asia Western Asia
+faah 2021-02-03 74355990 node Ù<81>اعة السÙ<81>لى, النائÙ<81>, مديرية قضاء خمر, Ù…ØاÙ<81>ظة عمران, اليمن place hamlet 0.25 اليمن ye Asia Western Asia
+dmh 2021-02-03 74835575 node ضمØ, مديرية مناخة, Ù…ØاÙ<81>ظة صنعاء, اليمن place hamlet 0.25 اليمن ye Asia Western Asia
+al-qaeda 2021-02-03 75395984 node القضاء, المسالم, مديرية المدان, Ù…ØاÙ<81>ظة عمران, اليمن place suburb 0.275 اليمن ye Asia Western Asia
+hadza 2021-02-03 12334974 node Øجة, مديرية مدينة Øجة, Ù…ØاÙ<81>ظة Øجة, اليمن place town 0.409632994596587 اليمن ye Asia Western Asia
+nsb 2021-02-03 12427666 node نصب, مديرية ميدي, Ù…ØاÙ<81>ظة Øجة, اليمن place island 0.325 اليمن ye Asia Western Asia
+dhl 2021-02-03 12533753 node دØÙ„, مديرية خب والشعÙ<81>, Ù…ØاÙ<81>ظة الجوÙ<81>, اليمن place village 0.275 اليمن ye Asia Western Asia
+office of health 2021-02-03 57114512 node مكتب الصØØ©, شارع رداع, ذمار, مجمع المØاÙ<81>ظة, ذمار, مديرية مدينة ذمار, Ù…ØاÙ<81>ظة ذمار, اليمن amenity doctors 0.001 اليمن ye Asia Western Asia
+ais 2021-02-03 12332501 node العيص, مديرية المسيلة, Ù…ØاÙ<81>ظة المهرة, اليمن place town 0.3 اليمن ye Asia Western Asia
+yemen 2021-02-03 258075923 relation اليمن boundary administrative 0.734163292678192 اليمن ye Asia Western Asia
+asim 2021-02-03 12526109 node عاصم, مديرية خب والشعÙ<81>, Ù…ØاÙ<81>ظة الجوÙ<81>, اليمن natural peak 0.3 اليمن ye Asia Western Asia
+nabr 2021-02-03 12269571 node Øبر, مديرية ساقين, Ù…ØاÙ<81>ظة صعدة, اليمن place village 0.275 اليمن ye Asia Western Asia
+department of environmental affairs 2021-02-03 202039404 way Department of Economic Development and Environmental Affairs, 5, Huntley Street, Makana Ward 8, Makhanda (Grahamstown), Makana Local Municipality, Sarah Baartman District Municipality, Eastern Cape, 6139, South Africa office government 0.401 South Africa za Africa Southern Africa
+kwazulu-natal sharks board 2021-02-03 54691458 node Kwazulu-Natal Sharks Board, Herrwood Drive, Westridge, eThekwini Ward 35, Umhlanga Rocks, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4319, South Africa tourism attraction 0.401 South Africa za Africa Southern Africa
+south africa 2021-02-03 258310948 relation South Africa boundary administrative 0.982907627703066 South Africa za Africa Southern Africa
+monash 2021-02-03 101123044 way Monash, Monash Boulevard, Johannesburg Ward 97, Roodepoort, City of Johannesburg Metropolitan Municipality, Gauteng, South Africa amenity university 0.373081870492623 South Africa za Africa Southern Africa
+public library of sciences 2021-02-03 258298973 relation Sciences, Constitution Street, Cape Town Ward 77, Cape Town, City of Cape Town, Western Cape, 7925, South Africa building university 0.201 South Africa za Africa Southern Africa
+south african medical research council 2021-02-03 230613646 way South African Medical Research Council, 1, Soutpansberg Road, Tshwane Ward 58, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0007, South Africa office research 0.501 South Africa za Africa Southern Africa
+metropolitan municipality 2021-02-03 107180662 way The Metropolitan, Johannesburg Ward 64, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa landuse residential 0.4 South Africa za Africa Southern Africa
+fish hoek 2021-02-03 258440959 relation Fish Hoek, City of Cape Town, Western Cape, South Africa place town 0.5 South Africa za Africa Southern Africa
+olympus 2021-02-03 726108 node Olympus, Aganang Local Municipality, Capricorn District Municipality, Limpopo, South Africa place town 0.4 South Africa za Africa Southern Africa
+stellenbosch university 2021-02-03 208348417 way Universiteit Stellenbosch, Smuts, Stellenbosch Ward 9, Dalsig, Stellenbosch Local Municipality, Cape Winelands District Municipality, Western Cape, 7599, South Africa amenity university 0.554011689337226 South Africa za Africa Southern Africa
+east asian observatory 2021-02-03 120613 node Observatory, Lynton Road, Observatory, Cape Town Ward 57, Cape Town, City of Cape Town, Western Cape, 7925, South Africa railway station 0.241913844040538 South Africa za Africa Southern Africa
+rhodes university 2021-02-03 116210497 way Rhodes University, Allen Street, Makana Ward 8, Makhanda (Grahamstown), Makana Local Municipality, Sarah Baartman District Municipality, Eastern Cape, 6139, South Africa amenity university 0.621665177399236 South Africa za Africa Southern Africa
+south african national space agency 2021-02-03 48876053 node South African National Space Agency, Mark Shuttleworth, Innovation Hub, Tshwane Ward 82, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0087, South Africa office government 0.887075864564083 South Africa za Africa Southern Africa
+new horizons 2021-02-03 724484 node New Horizons, Bitou Ward 4, Plettenberg Bay, Bitou Local Municipality, Garden Route District Municipality, Western Cape, 6600, South Africa place suburb 0.475 South Africa za Africa Southern Africa
+nisar 2021-02-03 1162528 node Nisar, Stegmann Street, East Lynne, Tshwane Ward 87, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0159, South Africa shop supermarket 0.101 South Africa za Africa Southern Africa
+university of kwazulu-natal 2021-02-03 118132354 way University of KwaZulu-Natal, Fairfield Avenue, Scottsville, Msunduzi Ward 33, Pietermaritzburg, Msunduzi Local Municipality, uMgungundlovu District Municipality, KwaZulu-Natal, 3200, South Africa amenity university 0.401 South Africa za Africa Southern Africa
+us ivy league 2021-02-03 220001773 way Ivy League, 6, Cluver Road, Simonswyk, Stellenbosch Ward 7, Bo-Dalsig, Stellenbosch, Cape Winelands District Municipality, Western Cape, 7599, South Africa building dormitory 0.201 South Africa za Africa Southern Africa
+cpt 2021-02-03 106046279 way Cape Town International Airport, New Eisleben Road, Crossroads, Cape Town Ward 36, City of Cape Town, Western Cape, 7490, South Africa aeroway aerodrome 0.434462489654698 South Africa za Africa Southern Africa
+south african astronomical observatory 2021-02-03 149374012 way South African Astronomical Observatory, Observatory, Cape Town Ward 57, Cape Town, City of Cape Town, Western Cape, 7925, South Africa landuse observatory 0.6 South Africa za Africa Southern Africa
+university of johannesburg 2021-02-03 112776222 way University of Johannesburg, Kingsway Avenue, Rossmore, Johannesburg Ward 69, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa amenity university 0.301 South Africa za Africa Southern Africa
+csir 2021-02-03 217011667 way CSIR, Carlow Road, Melville, Johannesburg Ward 87, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa building commercial 0.101 South Africa za Africa Southern Africa
+rsa 2021-02-03 258310948 relation South Africa boundary administrative 0.782907627703066 South Africa za Africa Southern Africa
+department of energy 2021-02-03 228853589 way Department of Energy, 192, Visagie Street, Pretoria Central, Tshwane Ward 80, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0126, South Africa office government 0.6004701084432 South Africa za Africa Southern Africa
+bp 2021-02-03 82642393 node BP, Azalea Street, Lenasia South, Johannesburg Ward 120, City of Johannesburg Metropolitan Municipality, Gauteng, 1835, South Africa amenity fuel 0.65852441040192 South Africa za Africa Southern Africa
+george church 2021-02-03 122429 node George, George Local Municipality, Garden Route District Municipality, Western Cape, 6529, South Africa place town 0.541004242546897 South Africa za Africa Southern Africa
+university of pretoria 2021-02-03 162398262 way Geography, Geoinformatics and Meteorology Building, Tukkie, Baileys Muckleneuk, Tshwane Ward 56, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0001, South Africa building Campus 0.201 South Africa za Africa Southern Africa
+university of the witwatersrand 2021-02-03 95936135 way University of the Witwatersrand, Empire Road, Parktown, Johannesburg Ward 87, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa amenity university 0.87569370880422 South Africa za Africa Southern Africa
+mangosuthu university of technology 2021-02-03 205967123 way Mangosuthu University of Technology, 1706 Street, Isipingo, eThekwini Ward 89, Umlazi, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4066, South Africa amenity university 0.697580560553068 South Africa za Africa Southern Africa
+ska observatory 2021-02-03 54591242 node SKA South Africa, Park Road, Maitland Garden Village, Cape Town Ward 53, Cape Town, City of Cape Town, Western Cape, 7925, South Africa office ngo 0.101 South Africa za Africa Southern Africa
+international court of justice 2021-02-03 230999389 way Curious Minds International School, 1016, Justice Mahomed Street, Menlo Park, Tshwane Ward 82, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0011, South Africa amenity kindergarten 0.301 South Africa za Africa Southern Africa
+university of venda 2021-02-03 193237675 way University of Venda, Agric, Thulamela Ward 36, Thohoyandou, Thulamela Local Municipality, Vhembe District Municipality, Limpopo, 0950, South Africa amenity university 0.60799018260571 South Africa za Africa Southern Africa
+us department of energy 2021-02-03 228853589 way Department of Energy, 192, Visagie Street, Pretoria Central, Tshwane Ward 80, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0126, South Africa office government 0.6004701084432 South Africa za Africa Southern Africa
+cape peninsula university of technology 2021-02-03 203129734 way Navarre, Cummings Street, Berg en Dal, Drakenstein Ward 2, Berg en Dal, Drakenstein Local Municipality, Cape Winelands District Municipality, Western Cape, 7655, South Africa tourism hostel 0.101 South Africa za Africa Southern Africa
+school of the coast 2021-02-03 119488567 way School, Main, Laaiplek, Bergrivier Ward 6, Dwarskersbos, Bergrivier Local Municipality, West Coast District Municipality, Western Cape, 7365, South Africa amenity school 0.201 South Africa za Africa Southern Africa
+eskom 2021-02-03 119951369 way Eskom, Sol Plaatje Ward 28, Kimberley, Frances Baard District Municipality, Northern Cape, South Africa landuse industrial 0.3 South Africa za Africa Southern Africa
+de vries 2021-02-03 101129802 way De Vries, Newton-Wes, Newtown-Wes, Drakenstein Local Municipality, Cape Winelands District Municipality, Western Cape, 7654, South Africa highway residential 0.3 South Africa za Africa Southern Africa
+klaas post 2021-02-03 132193285 way Klaas, Zolani, Langeberg Ward 10, Langeberg Local Municipality, Cape Winelands District Municipality, Western Cape, South Africa highway residential 0.2 South Africa za Africa Southern Africa
+department of defence 2021-02-03 182271634 way Department of Defence, Rigel Avenue South, Erasmuskloof, Tshwane Ward 83, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0048, South Africa office government 0.700038865094841 South Africa za Africa Southern Africa
+africa health research institute 2021-02-03 54489356 node Africa Health Research Institute, 719, Umbilo Road, Carrington Heights, eThekwini Ward 33, Durban, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4001, South Africa amenity school 0.401 South Africa za Africa Southern Africa
+higher education south africa 2021-02-03 241460340 way Embury Institute for Higher Education, Silverton Road, Musgrave, eThekwini Ward 31, Durban, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4001, South Africa amenity university 0.401 South Africa za Africa Southern Africa
+university of south africa 2021-02-03 126210070 way University of South Africa, Rabe Street, Polokwane Ward 22, Polokwane, Polokwane Local Municipality, Capricorn District Municipality, Limpopo, 0690, South Africa amenity university 0.401 South Africa za Africa Southern Africa
+association 2021-02-03 98557179 way Association, Homevale, Sol Plaatje Ward 3, Kimberley, Frances Baard District Municipality, Northern Cape, South Africa highway residential 0.2 South Africa za Africa Southern Africa
+university of the western cape 2021-02-03 106377209 way University of the Western Cape, Chancellor Street, Belhar, Cape Town Ward 22, City of Cape Town, Western Cape, 7493, South Africa amenity university 0.883144349963485 South Africa za Africa Southern Africa
+academy of science of south africa 2021-02-03 234711560 way Cape Academy of Maths, Science and Technology, Cushat Close, Sweet Valley, Constantia, City of Cape Town, Western Cape, 7806, South Africa amenity college 0.601 South Africa za Africa Southern Africa
+council of scientific and industrial 2021-02-03 180353667 way CSIR Building 33;Council for Scientific and Industrial Research, Yellowwood Street, Scientia, Tshwane Ward 46, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0040, South Africa amenity university 0.501 South Africa za Africa Southern Africa
+nelson mandela university 2021-02-03 83078177 node Nelson Mandela University, Bushbuck Road, Nelson Mandela Bay Ward 1, Port Elizabeth, Nelson Mandela Bay Metropolitan Municipality, Eastern Cape, 6001, South Africa office company 0.301 South Africa za Africa Southern Africa
+observatory 2021-02-03 258312938 relation Observatory, Cape Town Ward 57, Cape Town, City of Cape Town, Western Cape, 7925, South Africa place suburb 0.433807263030136 South Africa za Africa Southern Africa
+durban university of technology 2021-02-03 136500786 way Durban University of Technology Indumiso Campus, Mthombothi Road, Slangspruit, Msunduzi Ward 19, Pietermaritzburg, Msunduzi Local Municipality, uMgungundlovu District Municipality, KwaZulu-Natal, 3200, South Africa amenity university 0.401 South Africa za Africa Southern Africa
+jacobs 2021-02-03 704227 node Jacobs, eThekwini Ward 75, Durban, eThekwini Metropolitan Municipality, KwaZulu-Natal, 4052, South Africa place suburb 0.375 South Africa za Africa Southern Africa
+university of witwatersrand 2021-02-03 95936135 way University of the Witwatersrand, Empire Road, Parktown, Johannesburg Ward 87, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa amenity university 0.77569370880422 South Africa za Africa Southern Africa
+council for scientific and industrial research 2021-02-03 180353667 way CSIR Building 33;Council for Scientific and Industrial Research, Yellowwood Street, Scientia, Tshwane Ward 46, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0040, South Africa amenity university 0.601 South Africa za Africa Southern Africa
+dell 2021-02-03 721242 node The Dell, Tokai, City of Cape Town, Western Cape, 7945, South Africa place suburb 0.375 South Africa za Africa Southern Africa
+university of the free state 2021-02-03 10968312 node University of the Free State, 205, Nelson Mandela Drive, Brandwag, Mangaung Ward 22, Bloemfontein, Mangaung Metropolitan Municipality, Free State, 9321, South Africa amenity school 0.89425812326797 South Africa za Africa Southern Africa
+council of higher education 2021-02-03 7467290 node Council on higher education, 1, Quentin Brand Street, Persequor Technopark, Tshwane Ward 46, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0020, South Africa office yes 0.401 South Africa za Africa Southern Africa
+gfz 2021-02-03 123536145 way GFZ, R356, Karoo Hoogland Ward 3, Karoo Hoogland Local Municipality, Namakwa District Municipality, Northern Cape, South Africa building yes 0.101 South Africa za Africa Southern Africa
+pluto & ceres 2021-02-03 111213055 way Pluto Street, Witzenberg Ward 3, Ceres, Witzenberg Local Municipality, Cape Winelands District Municipality, Western Cape, 6835, South Africa highway residential 0.3 South Africa za Africa Southern Africa
+wits university 2021-02-03 218343116 way WITS University South Court, 40, Jorissen Street, Braamfontein, Johannesburg Ward 60, Johannesburg, City of Johannesburg Metropolitan Municipality, Gauteng, 2001, South Africa building residential 0.201 South Africa za Africa Southern Africa
+arthur mcdonald 2021-02-03 139766772 way Arthur McDonald Avenue, Edleen, Ekurhuleni Ward 16, Kempton Park, City of Ekurhuleni Metropolitan Municipality, Gauteng, 1619, South Africa highway residential 0.3 South Africa za Africa Southern Africa
+defence department 2021-02-03 182271634 way Department of Defence, Rigel Avenue South, Erasmuskloof, Tshwane Ward 83, Pretoria, City of Tshwane Metropolitan Municipality, Gauteng, 0048, South Africa office government 0.600038865094841 South Africa za Africa Southern Africa
+university of cape town 2021-02-03 258385027 relation University of Cape Town, Grotto Road, Rondebosch, Cape Town, City of Cape Town, Western Cape, 7700, South Africa amenity university 0.902350677963883 South Africa za Africa Southern Africa
+rooibos ltd 2021-02-03 50076730 node Rooibos Ltd, Rooitee Avenue, Cederberg Ward 3, Clanwilliam, Cederberg Local Municipality, West Coast District Municipality, Western Cape, 8135, South Africa shop tea 0.201 South Africa za Africa Southern Africa
+front national party 2021-02-03 60650639 node Patrotic Front Party Office, D79, Mwense, Mwense District, Luapula Province, P.O BOX 760001 MWENSE, Zambia office political_party 0.201 Zambia zm Africa Eastern Africa
+zambia 2021-02-03 257858630 relation Zambia boundary administrative 0.78492269201686 Zambia zm Africa Eastern Africa
+dfid 2021-02-03 57737308 node Department for International Development (DFID), Independence Avenue, Ridgeway, Lusaka, Lusaka District, Lusaka Province, 10101, Zambia office government 0.101 Zambia zm Africa Eastern Africa
+university of zambia 2021-02-03 259195591 relation University of Zambia (UNZA), 32379, Great East Road, Handsworth Park, Lusaka, Lusaka District, Lusaka Province, 10101, Zambia amenity university 0.649871957480668 Zambia zm Africa Eastern Africa
+zimbabwe 2021-02-03 257847347 relation Zimbabwe boundary administrative 0.797897126879187 Zimbabwe zw Africa Eastern Africa
+university of zimbabwe 2021-02-03 182258631 way University of Zimbabwe, 630, Churchill Avenue, Avondale, Harare, Harare Province, 04-263, Zimbabwe amenity university 0.685910756155564 Zimbabwe zw Africa Eastern Africa
+vfa 2021-02-03 156186847 way Victoria Falls International Airport, A8, Hwange, Matabeleland North, Zimbabwe aeroway aerodrome 0.322405775434826 Zimbabwe zw Africa Eastern Africa
+national university of science and technology 2021-02-03 182853582 way National University of Science & Technology, Cecil Avenue, Bulawayo, Bulawayo Province, Zimbabwe amenity university 0.748092083018094 Zimbabwe zw Africa Eastern Africa
+norwegian polar institute 2021-02-03 109644344 way Troll workshop, Flyplassveien, Troll shop car_repair 0.001 NA NA Africa Southern Africa
+hind 2021-02-03 1244386 node Indian Ocean place ocean 0.676747312216863 NA NA Africa Southern Africa
+mariana trench 2021-02-03 259298637 relation Mariana Trench National Wildlife Refuge boundary protected_area 0.325 NA NA Africa Southern Africa
+us antarctic program 2021-02-03 17620139 node Concordia Station, Route 66, Camp d'été, Concordia Station tourism attraction 0.347285603202449 NA NA Africa Southern Africa
+jang bogo station 2021-02-03 76959223 node Jang Bogo Station office research 0.301 NA NA Africa Southern Africa
+neutrino observatory 2021-02-03 59696254 node IceCube Neutrino Observatory office research 0.603758799530623 NA NA Africa Southern Africa
+mcmurdo station 2021-02-03 4327209 node McMurdo Station place town 0.673603329846918 NA NA Africa Southern Africa
+southern ocean 2021-02-03 1180665 node Southern Ocean place ocean 0.804907554591729 NA NA Africa Southern Africa
+icecube neutrino observatory 2021-02-03 59696254 node IceCube Neutrino Observatory office research 0.703758799530623 NA NA Africa Southern Africa
+flower garden banks national marine sanctuary 2021-02-03 259278410 relation Flower Garden Banks National Marine Sanctuary boundary protected_area 0.896586468044334 NA NA Africa Southern Africa
+ross ice shelf 2021-02-03 258745006 relation Ross Ice Shelf natural glacier 0.793636263858092 NA NA Africa Southern Africa
+ou 2021-02-03 299876346 node أوروبا place continent 0.820706719188318 NA NA Africa Southern Africa
+deepwater horizon 2021-02-03 6855110 node Deepwater Horizon man_made pumping_rig 0.629506969685059 NA NA Africa Southern Africa
+europa 2021-02-03 299876346 node أوروبا place continent 0.820706719188318 NA NA Africa Southern Africa
+concordia station 2021-02-03 17620139 node Concordia Station, Route 66, Camp d'été, Concordia Station tourism attraction 0.54728560320245 NA NA Africa Southern Africa
+adelie land 2021-02-03 258784652 relation French Antarctic Territory boundary region 0.512160492428557 NA NA Africa Southern Africa
diff --git a/nature_news_scraper/run_target_year_scrape.sh b/nature_news_scraper/run_target_year_scrape.sh
index 0b95ea950..00d57307b 100644
--- a/nature_news_scraper/run_target_year_scrape.sh
+++ b/nature_news_scraper/run_target_year_scrape.sh
@@ -9,7 +9,7 @@ DIR="$( cd "$( dirname "${BASH_SOURCE[0]}" )" >/dev/null 2>&1 && pwd )"
cd ${DIR}/nature_news_scraper
# now crawl over the years of interest
-TARGET_YRS=( 2015 2016 2017 2018 2019 2020 )
+TARGET_YRS=( 2011 2012 2013 2014 )
for TARGET_YEAR in "${TARGET_YRS[@]}"
do
JSON_OUT_FILE="${DIR}/../data/scraped_data/downloads/links_crawled_${TARGET_YEAR}.json"
diff --git a/process_scraped_data/process_corenlp_locations_corenlp_output.R b/process_scraped_data/process_corenlp_locations_corenlp_output.R
index 74e6af14e..e90eab215 100644
--- a/process_scraped_data/process_corenlp_locations_corenlp_output.R
+++ b/process_scraped_data/process_corenlp_locations_corenlp_output.R
@@ -3,9 +3,12 @@ require(data.table)
require(here)
proj_dir = here()
-source(paste(proj_dir, "/utils/scraper_processing_utils.R", sep=""))
-
+source(file.path(proj_dir, "/utils/scraper_processing_utils.R"))
+#' Read in the location informations from the coreNLP JSON output
+#'
+#' @param corenlp_output_dir The directory containing all JSON result files, one per article
+#' @return a dataframe of the location information
read_result_files <- function(corenlp_output_dir){
json_res_files = list.files(corenlp_output_dir, pattern=".txt.json", full.names = TRUE)
@@ -20,7 +23,7 @@ read_result_files <- function(corenlp_output_dir){
## get location info
print(file_id)
- loc_df = get_locations(json_res)
+ loc_df = get_osm_locations(json_res)
## format final df
if(!is.na(loc_df)){
@@ -30,12 +33,12 @@ read_result_files <- function(corenlp_output_dir){
}
all_locations = rbind(all_locations, loc_df)
+ # clean up in case memory issues
+ gc()
+
}
all_locations = all_locations[-1,]
- all_locations$country = unlist(all_locations$location)
- all_locations$location = NULL
- all_locations = apply(all_locations, 2, unlist)
return(all_locations)
}
@@ -49,3 +52,6 @@ outfile = args[2]
loc_res = read_result_files(corenlp_output_dir)
write.table(loc_res, file=outfile, sep="\t", quote=F, row.names=F)
+
+rm(list=ls())
+gc()
diff --git a/process_scraped_data/process_corenlp_quotes_corenlp_output.R b/process_scraped_data/process_corenlp_quotes_corenlp_output.R
index b26158e14..2bd9fedb0 100644
--- a/process_scraped_data/process_corenlp_quotes_corenlp_output.R
+++ b/process_scraped_data/process_corenlp_quotes_corenlp_output.R
@@ -3,9 +3,19 @@ require(data.table)
require(here)
proj_dir = here()
-source(paste(proj_dir, "/utils/scraper_processing_utils.R", sep=""))
-
-
+source(file.path(proj_dir, "/utils/scraper_processing_utils.R"))
+
+#' Get the gender of the speakers from the genderize.io cache
+#'
+#' @param in_df, dataframe containing the speaker information
+#' it must have a column "gender",
+#' "canonical_speaker", and "partial_name"
+#' Each row is assumed to be a speaker
+#'
+#' @return list, full_gender_df: dataframe with the names and gender
+#' information of those found in the cache.
+#' names_not_processed: dataframe of speaker information where they were
+#' not found in the cache
format_gender_canonical_speaker <- function(in_df){
@@ -45,9 +55,9 @@ format_gender_canonical_speaker <- function(in_df){
names_missing = data.frame(first_name=unique(unknown_gendered_df$first_name))
- gender_io_file = paste(proj_dir, "/data/reference_data/genderize.tsv", sep="")
+ gender_io_file = file.path(proj_dir, "/data/reference_data/genderize.tsv")
names_processed = data.frame(fread(gender_io_file))
- gender_io_file = paste(proj_dir, "/data/reference_data/genderize_update.tsv", sep="")
+ gender_io_file = file.path(proj_dir, "/data/reference_data/genderize_update.tsv")
names_processed = rbind(names_processed, data.frame(fread(gender_io_file)))
colnames(names_processed)[1] = "first_name"
@@ -76,6 +86,14 @@ format_gender_canonical_speaker <- function(in_df){
}
+#' Read in coreNLP speaker information and query the gender information
+#' in the genderize.io cache. All names not found in the cache will
+#' be written to a file for later querying in corenlp_output_dir
+#' named "missed_generize_io_names"
+#'
+#' @param corenlp_output_dir, directory containing coreNLP JSON output
+#'
+#' @return dataframe, all_quotes_gender all gender information from speakers
read_result_files <- function(corenlp_output_dir){
json_res_files = list.files(corenlp_output_dir, pattern=".txt.json", full.names = TRUE)
@@ -140,7 +158,7 @@ read_result_files <- function(corenlp_output_dir){
# write out any names that were not in the reference for batch update later
unprocessed_names_gender = res[[2]]
- outfile = paste(corenlp_output_dir, "/missed_generize_io_names.tsv", sep="")
+ outfile = file.path(corenlp_output_dir, "/missed_generize_io_names.tsv")
if(file.exists(outfile)){
prev_unprocessed = data.frame(fread(outfile))
unprocessed_names_gender = rbind(unprocessed_names_gender, prev_unprocessed)
diff --git a/process_scraped_data/process_scrape.R b/process_scraped_data/process_scrape.R
index 845ba3d18..948d7c2bd 100644
--- a/process_scraped_data/process_scrape.R
+++ b/process_scraped_data/process_scrape.R
@@ -1,7 +1,11 @@
library(jsonlite)
library(data.table)
-
+#' read in JSON file and convert to dataframe
+#'
+#' @param infile, JSON file path
+#'
+#' @return json_res, dataframe version of JSON object
read_json <- function(infile){
json_res = fromJSON(infile)
@@ -10,6 +14,14 @@ read_json <- function(infile){
}
+#' Format the body of the article to remove
+#' have a unified encoding
+#'
+#' @param in_df, data frame with a column "body"
+#' that contains all the text from the article.
+#' Each row is assumed to be an article
+#'
+#' @return in_df, data frame where the "body" column is now formatted
process_body <- function(in_df){
library(stringr)
@@ -30,6 +42,14 @@ process_body <- function(in_df){
}
+#' For coreNLP each article needs to be in its own file
+#' and we have to make a reference file (file_list.txt) containing all the
+#' file names we would like coreNLP to look over
+#'
+#' @param in_df, data frame with a column "body"
+#' that contains all the text from the article.
+#' Each row is assumed to be an article
+#' @param out_dir, directory path where the files should be written
write_sep_files <- function(in_df, out_dir){
# for easier processing with coreNLP write out the files
@@ -37,7 +57,7 @@ write_sep_files <- function(in_df, out_dir){
all_files = c()
for(curr_article_idx in 1:nrow(in_df)){
curr_article = in_df[curr_article_idx,]
- outfile = paste(outdir, curr_article$file_id, ".txt", sep="")
+ outfile = file.path(outdir, curr_article$file_id, ".txt")
article_body = unlist(curr_article$body)
if(nchar(article_body) == 0){
next
@@ -46,7 +66,7 @@ write_sep_files <- function(in_df, out_dir){
all_files = paste(all_files, outfile, "\n", sep="")
}
- outfile = paste(outdir, "file_list.txt", sep="")
+ outfile = file.path(outdir, "file_list.txt")
writeLines(all_files, outfile)
}
@@ -62,5 +82,5 @@ bm_data_df = process_body(bm_data_df)
# write out the files for coreNLP
write_sep_files(bm_data_df, outdir)
-id_year_file = paste(outdir, "/fileID_year.tsv", sep="")
+id_year_file = file.path(outdir, "/fileID_year.tsv")
write.table(bm_data_df[,c("file_id", "year")], id_year_file, sep="\t", quote=F, row.names=F)
diff --git a/process_scraped_data/run_process_all_years.sh b/process_scraped_data/run_process_all_years.sh
index 2e2141b02..205602961 100755
--- a/process_scraped_data/run_process_all_years.sh
+++ b/process_scraped_data/run_process_all_years.sh
@@ -7,7 +7,7 @@
DIR="$( cd "$( dirname "${BASH_SOURCE[0]}" )" >/dev/null 2>&1 && pwd )"
# process each year individually
-TARGET_YRS=( 2010 2015 2016 2017 2018 2019 2020 )
+TARGET_YRS=( 2011 2012 2013 2014 )
for TARGET_YEAR in "${TARGET_YRS[@]}"
do
sh ${DIR}/run_process_target_year.sh ${TARGET_YEAR}
diff --git a/utils/plotting_utils.R b/utils/plotting_utils.R
index 4d44d96bf..639a82ab3 100644
--- a/utils/plotting_utils.R
+++ b/utils/plotting_utils.R
@@ -1,4 +1,12 @@
+#' Method to plot a CARET confusion matrix and basic prediction stats
+#' for a binary prediction task
+#'
+#' @param cm, confusion matrix output from CARET
+#' @param c1_name, class 1 name
+#' @param c2_name, class 2 name
+#' @param title, name of the plot
+#' @return plot object
draw_confusion_matrix <- function(cm, c1_name, c2_name, title="CONFUSION MATRIX") {
### taken from https://stackoverflow.com/questions/23891140/r-how-to-visualize-confusion-matrix-using-the-caret-package
@@ -67,3 +75,41 @@ draw_confusion_matrix <- function(cm, c1_name, c2_name, title="CONFUSION MATRIX"
text(70, 20, round(as.numeric(cm$overall[2]), 3), cex=1.4)
}
+
+#' Method to plot a confusion matrix
+#' for a multi-class prediction task
+#' Actual and Predict must be in the same order
+#' and they must have the same number of levels
+#'
+#' @param Actual, true labels
+#' @param Predict, predicted labels
+#' @param colors, color scale palette (mid, low, high)
+#' @param text.scl, scaled size of text in the confusion matrix
+#' @return ggplot object
+prettyConfused <- function(Actual, Predict, colors=c("white","red4","dodgerblue3"), text.scl=5){
+
+ #### taken from https://stackoverflow.com/questions/37897252/plot-confusion-matrix-in-r-using-ggplot
+ actual = as.data.frame(table(Actual))
+ names(actual) = c("Actual","ActualFreq")
+
+ #build confusion matrix
+ confusion = as.data.frame(table(Actual, Predict))
+ names(confusion) = c("Actual","Predicted","Freq")
+
+ #calculate percentage of test cases based on actual frequency
+
+ confusion = merge(confusion, actual, by=c('Actual','Actual'))
+ confusion$Percent = confusion$Freq/(confusion$ActualFreq+0.000001)*100
+ confusion$ColorScale<-confusion$Percent*-1
+ confusion[which(confusion$Actual==confusion$Predicted),]$ColorScale<-confusion[which(confusion$Actual==confusion$Predicted),]$ColorScale*-1
+ confusion$Label<-paste(round(confusion$Percent,0),"%, \nn=",confusion$Freq,sep="")
+ tile <- ggplot() +
+ geom_tile(aes(x=Actual, y=Predicted,fill=ColorScale),data=confusion, color="black",size=0.1) +
+ labs(x="Actual",y="Predicted")
+
+ tile = tile +
+ geom_text(aes(x=Actual,y=Predicted, label=Label),data=confusion, size=text.scl, colour="black") +
+ scale_fill_gradient2(low=colors[2],high=colors[3],mid=colors[1],midpoint = 0,guide='none')
+
+ return(tile)
+}
\ No newline at end of file
diff --git a/utils/scraper_processing_utils.R b/utils/scraper_processing_utils.R
index e9e7cb522..0644dce53 100644
--- a/utils/scraper_processing_utils.R
+++ b/utils/scraper_processing_utils.R
@@ -25,6 +25,11 @@ gender = c(NA, NA, NA, NA, NA,
pronouns_df = data.frame(pronouns, gender)
+#' Format string version of a name
+#'
+#' @param in_str, string; a name
+#' @return format_str, string; formatted name
+#' (no white space, no non-letter characters)
format_name_str <- function(in_str){
require("stringr")
@@ -53,8 +58,16 @@ format_name_str <- function(in_str){
# remove trailing white space
format_str = trimws(format_str)
+ return(format_str)
+
}
+#' Given a query string, return closest string in the
+#' vector of reference strings (no penalty for deletion)
+#'
+#' @param key_str, a query string
+#' @param str_vec, a string vector
+#' @return string, a string from str_vec that has closest distance to key_str
get_matched_string <- function(key_str, str_vec){
require("stringdist")
@@ -66,6 +79,10 @@ get_matched_string <- function(key_str, str_vec){
}
+#' get all named entities found in coreNLP output JSON
+#'
+#' @param json_res, JSON object that was output from coreNLP
+#' @return dataframe of all named entities in json_res
get_ner <- function(json_res){
# get named entities
@@ -77,154 +94,42 @@ get_ner <- function(json_res){
return(ner_df)
}
-get_ref_location_file <- function(){
-
- ref_file = paste(ref_data_dir, "nature_index_export.csv", sep="")
- if(!file.exists(ref_file)){
- stop("nature_index_export file not found, please run setup.sh to get it")
- }
-
- ref_df = data.frame(fread(ref_file))
-
- # now split abbr
- ref_split_df = separate(data = ref_df, col = Institution, into = c("Inst", "abbr"), sep = " \\(")
- ref_split_df$abbr = gsub(")", "", ref_split_df$abbr)
- return(ref_split_df)
-
-}
-
-format_country_name <- function(ref_df, in_df){
-
- if(!"country" %in% colnames(in_df)){
- stop("input data frame must have a column named country")
- }
-
-
- full_loc_name = unique(unlist(ref_df$Country))
- in_df$location = NA
- for(idx in 1:nrow(in_df)){
- curr_text = unlist(in_df$country[idx])
-
- matched_country = grep(curr_text, full_loc_name, fixed = TRUE, value=T)
- if(length(matched_country) == 0){
- in_df$location[idx] = curr_text
- }else if(length(matched_country) > 1){
- in_df$location[idx] = "NOT_CLEAR"
- }else{
- in_df$location[idx] = matched_country
- }
-
- }
-
- return(in_df)
-
-}
-
-
-get_country_state_info <- function(){
+#' read in and return the reference country information
+#'
+#' @return dataframe of all reference country information
+get_country_info <- function(){
- ref_org_df = get_ref_location_file()
-
- country_file = paste(ref_data_dir, "cdh_country_codes.txt", sep="")
+ # now get the UN region info
+ country_file = file.path(ref_data_dir, "cdh_country_codes.txt")
if(!file.exists(country_file)){
stop("cdh_country_codes file not found, please run setup.sh to get it")
}
- state_file = paste(ref_data_dir, "cdh_state_codes.txt", sep="")
- if(!file.exists(state_file)){
- stop("cdh_country_codes file not found, please run setup.sh to get it")
- }
-
# format country file
- country_df = data.frame(fread(country_file))
+ country_df = data.frame(fread(country_file, skip=1))
+ colnames(country_df) = c("idx_name", "country_alt_name", "ISO.3166.1.COUNTRY.CHAR.2.CODE",
+ "ISO.3166.1.COUNTRY.CHAR.3.CODE", "ISO.3166.1.COUNTRY.NUMBER.CODE",
+ "FIPS.COUNTRY.CODE", "FIPS.COUNTRY.NAME", "UN.REGION",
+ "UN.SUB.REGION.NAME", "CDH.ID")
colnames(country_df)[which(colnames(country_df) == "FIPS.COUNTRY.NAME")] = "country"
+ colnames(country_df)[which(colnames(country_df) == "ISO.3166.1.COUNTRY.CHAR.2.CODE")] = "address.country_code"
colnames(country_df)[which(colnames(country_df) == "UN.REGION")] = "un_region"
colnames(country_df)[which(colnames(country_df) == "UN.SUB.REGION.NAME")] = "un_subregion"
- country_df = country_df[,c("country", "un_region", "un_subregion")]
-
- # format state file
- state_df = data.frame(fread(state_file))
- colnames(state_df)[which(colnames(state_df) == "V1")] = "country"
- colnames(state_df)[which(colnames(state_df) == "SUBDIVISION.STATE.ALTERNATE.NAMES")] = "province_state_alt"
- colnames(state_df)[which(colnames(state_df) == "ISO.3166.2.SUBDIVISION.STATE.NAME")] = "province_state"
- state_df = state_df[,c("country", "province_state_alt", "province_state")]
-
- # now we have a location annotation file
- full_loc_df = merge(country_df, state_df, by="country")
-
- #make all province_state options into long form table
- require("stringr")
- max_num_names = grep(", ", full_loc_df$province_state_alt, value=T)
- max_num_names = max(unlist(lapply(max_num_names, str_count, ",")))
- into_vec = paste("vers", 1:max_num_names, sep="_")
- full_loc_df = separate(data = full_loc_df, col = province_state, sep = ", ", into=into_vec)
- full_loc_df = melt(full_loc_df, id.vars=c("country", "un_region", "un_subregion"))
- full_loc_df = subset(full_loc_df, variable != "province_state_alt")
- full_loc_df = full_loc_df[,c("country", "un_region", "un_subregion", "value")]
- colnames(full_loc_df)[4] = "province_state"
- full_loc_df = unique(full_loc_df)
-
-
- # format the country name to match the organization style
- full_loc_df_formatted = format_country_name(ref_org_df, full_loc_df)
-
-
- return(full_loc_df_formatted[,2:5])
-
+ country_df = country_df[,c( "country", "address.country_code", "un_region", "un_subregion")]
+ country_df$address.country_code = tolower(country_df$address.country_code)
+ return(country_df)
}
-get_org_country_inner <- function(org_name, ref_df){
-
- substr_idx = which(grepl(tolower(org_name), tolower(ref_df$Inst), fixed=T))
- country_found = unique(ref_df$Country[substr_idx])
-
- if(length(country_found) > 1 ){
- country_found = "NOT_CLEAR"
- }
-
- if(length(country_found) == 0 ){
- country_found = "NOT_FOUND"
- }
-
- return(unique(country_found))
-
-}
-
-get_org_country <- function(ref_df, all_orgs){
-
- return(lapply(all_orgs, get_org_country_inner, ref_df))
-
-
-}
-
-
-get_prov_country_inner <- function(prov_name, ref_df){
-
- substr_idx = which(grepl(tolower(prov_name), tolower(ref_df$province_state), fixed=T))
- country_found = unique(ref_df$location[substr_idx])
-
- if(length(country_found) > 1 ){
- country_found = "NOT_CLEAR"
- }
-
- if(length(country_found) == 0 ){
- country_found = "NOT_FOUND"
- }
-
- return(unique(country_found))
-
-}
-
-get_prov_country <- function(ref_df, all_prov){
-
- return(lapply(all_prov, get_prov_country_inner, ref_df))
-
-
-}
-
-
-get_locations <- function(json_res){
+#' get the OSM location information for all
+#' organization, country, or state/province NERs
+#' identified in corenLP JSON output.
+#' OSM location information first comes from the cache,
+#' if not found it will query the online database
+#'
+#' @param json_res, JSON object that was output from coreNLP
+#' @return dataframe of all OSM information for each location NER
+get_osm_locations <- function(json_res){
# get named entities --locations
ner_df = get_ner(json_res)
@@ -233,85 +138,43 @@ get_locations <- function(json_res){
return(NA)
}
- ner_locs_df = subset(ner_df, ner %in% c("ORGANIZATION"))
+ ner_locs_df = subset(ner_df, ner %in%
+ c("ORGANIZATION", "COUNTRY", "STATE_OR_PROVINCE"))
ner_locs_df = unique(ner_locs_df)
- ref_df = get_ref_location_file()
- ner_locs_df$country = get_org_country(ref_df, ner_locs_df$text)
- ner_locs_df$location = ner_locs_df$country
-
- # accumulator
- locs_df = NA
-
- ### now do COUNTRY DISABIGUATION
- ner_country_df = subset(ner_df, ner %in% c("COUNTRY"))
- if(nrow(ner_country_df) != 0){
-
- ner_country_df$country = ner_country_df$text
- ner_country_df = format_country_name(ref_df, ner_country_df)
-
- locs_df = rbind(ner_locs_df, ner_country_df)
-
- }
-
- ### now do state_province disambiguation
- ner_province_df = subset(ner_df, ner %in% c("STATE_OR_PROVINCE"))
- ref_provence_df = get_country_state_info()
- if(nrow(ner_province_df) != 0){
-
- ner_province_df$province_state = ner_province_df$text
- ner_province_df$location = unlist(get_prov_country(ref_provence_df, ner_province_df$province_state))
- ner_province_df$country = ner_province_df$location
- ner_province_df = ner_province_df[,c("text", "ner", "country", "location")]
-
- if(is.na(locs_df)){
- locs_df = rbind(ner_locs_df, ner_province_df)
- }else{
- locs_df = rbind(locs_df, ner_province_df)
- }
+ if(length(ner_locs_df) == 0){
+ return(NA)
}
- if(is.na(locs_df) & nrow(ner_locs_df) != 0){
- locs_df = ner_locs_df
- }
- if(is.na(locs_df)){
+ if(all(is.na(ner_locs_df))){
return(NA)
}
+ # now query open street map to get the country codes
+ ner_locs_df$text = tolower(ner_locs_df$text)
+ osm_res = batch_osm_query(unique(ner_locs_df$text))
+ colnames(osm_res)[which(colnames(osm_res) == "query")] = "text"
+ ner_locs_df = merge(ner_locs_df,
+ osm_res[,c("text", "address.country_code")],
+ all=T)
+ ner_locs_df$address.country_code[
+ which(is.na(ner_locs_df$address.country_code))] = "NOT_FOUND"
- locs_df$location = unlist(locs_df$location)
- locs_df = unique(locs_df)
-
- locs_df = merge(locs_df, ref_provence_df[,c("location", "un_region", "un_subregion")], all.x=T)
- locs_df = unique(locs_df)
-
- # post process for consistency
- locs_df$un_region[locs_df$location != "NOT_FOUND" &
- locs_df$location != "NOT_CLEAR" &
- is.na(locs_df$un_region)] =
-
- locs_df$country[locs_df$location != "NOT_FOUND" &
- locs_df$location != "NOT_CLEAR" &
- is.na(locs_df$un_region)]
-
- locs_df$un_subregion[locs_df$location != "NOT_FOUND" &
- locs_df$location != "NOT_CLEAR" &
- is.na(locs_df$un_subregion)] =
-
- locs_df$country[locs_df$location != "NOT_FOUND" &
- locs_df$location != "NOT_CLEAR" &
- is.na(locs_df$un_subregion)]
+ locs_df = unique(ner_locs_df)
- locs_df$un_region[locs_df$location == "NOT_FOUND" | locs_df$location == "NOT_CLEAR"] = NA
- locs_df$un_subregion[locs_df$location == "NOT_FOUND" | locs_df$location == "NOT_CLEAR"] = NA
-
-
return(locs_df)
-
}
+
+#' get all individual names from coreNLP output
+#' The names either come from NERs or coref.
+#' Partial names are also matched to full names
+#' using the function get_matched_string
+#'
+#' @param json_res, JSON object that was output from coreNLP
+#' @return dataframe of all the name information and a first guess at gender
get_persons <- function(json_res){
# get named entities --names
@@ -393,8 +256,242 @@ get_persons <- function(json_res){
}
+
+#' format query into OSM-appropriate URL query
+#'
+#' @param single_query, string to query OSM
+#' @return string, url
+url_nominatim_search <- function(single_query) {
+ # this code is augmented from
+ # https://towardsdatascience.com/breaking-down-geocoding-in-r-a-complete-guide-1d0f8acd0d4b
+ # load libraries
+ require(RCurl)
+ # nominatim search api url
+ url_nominatim_search_api <- "https://nominatim.openstreetmap.org/search/"
+
+
+ # percent-encode search request
+ single_query <- URLencode(single_query)
+ parameters_url <- paste0("?format=json",
+ "&addressdetails=1&limit=1")
+ # construct search request for geocode
+ url_nominatim_search_call <- paste0(url_nominatim_search_api,
+ single_query, parameters_url)
+
+
+ return(url_nominatim_search_call)
+}
+
+
+#' private internal method that queries OSM
+#'
+#' @param curr_q, string to query OSM
+#' @return OSM JSON response
+internal_osm_query <- function(curr_q){
+
+ url_search = url_nominatim_search(curr_q)
+
+ # block augmented from here:
+ # https://stackoverflow.com/questions/12193779/how-to-write-trycatch-in-r
+ out <- tryCatch(
+ {
+ getURL(url_search, httpheader=c('User-Agent'="nature news scraper v0.1"))
+ },
+ error=function(cond) {
+ message(paste("query error:", curr_q))
+ # Choose a return value in case of error
+ return(NA)
+ }
+ )
+ return(out)
+}
+
+
+#' public method that makes a single query to OSM.
+#' This method takes into account all OSM query guidelines
+#' It first checks the cache for the query,
+#' if it is not there then it will query OSM and
+#' update the cache
+#'
+#' @param curr_q, string to query OSM
+#' @return dataframe result from OSM with formatted location data
+single_osm_query <- function(curr_q){
+
+ # we need to follow OSM quidelines
+ # we MUST cache
+ # no parallel processes
+ # no more than one query per second
+
+ require(tmaptools)
+
+ # make sure query is not in cache
+ cache_file = file.path(ref_data_dir, "/osm_cache.tsv")
+ if(!file.exists(cache_file)){
+ stop("osm_cache file not found, file should be in git,
+ you must download this before querying locations")
+ }
+
+ cache_df = data.frame(fread(cache_file))
+ if(tolower(curr_q) %in% tolower(cache_df$query)){
+ return(subset(cache_df, tolower(query) == tolower(curr_q)))
+ }
+
+ #run query
+ print(paste("running query:", tolower(curr_q)))
+ resp = internal_osm_query(tolower(curr_q))
+ resp_df = data.frame("place_id" = NA,
+ "osm_type" = NA, "display_name" = NA,
+ "class" = NA, "type" = NA, "importance" = NA,
+ "address.country" = NA, "address.country_code" = "NONE",
+ "Freq" = NA, "hand_edited" = FALSE, "reviewed" = FALSE)
+
+
+ if(resp != "[]"){
+ resp = unlist(fromJSON(resp,simplifyVector = FALSE))
+
+ # make sure its in a country
+ in_country = all(c("address.country", "address.country_code") %in% names(resp))
+ if(!in_country){
+ resp_df = data.frame(t(resp[c("place_id", "osm_type",
+ "display_name", "class", "type",
+ "importance")]))
+ resp_df$address.country = NA
+ resp_df$address.country_code = "NONE"
+ }
+ else{
+ resp_df = data.frame(t(resp[c("place_id", "osm_type",
+ "display_name", "class", "type",
+ "importance", "address.country",
+ "address.country_code")]))
+ }
+ }
+
+ #process query info
+ resp_df$query = curr_q
+
+ # get metadata
+ query_date = as.Date(Sys.Date(), format = "%B %d %Y")
+ resp_df$query_date = query_date
+
+ ref_code_df = get_country_info()
+ resp_df = merge(resp_df, ref_code_df, all.x=T)
+ resp_df$Freq = NA
+ resp_df$hand_edited = FALSE
+ resp_df$reviewed = FALSE
+
+
+ # format the data frame
+ resp_df = resp_df[,colnames(cache_df)]
+
+
+ # append to the cache
+ cache_df = rbind(cache_df, resp_df)
+ cache_file = file.path(ref_data_dir, "/osm_cache.tsv")
+ write.table(cache_df, cache_file, sep="\t", quote=F, row.names=F)
+
+ Sys.sleep(1)
+
+ return(resp_df)
+
+
+}
+
+#' public method that makes multiple queries to OSM.
+#' This method takes into account all OSM query guidelines
+#' It first checks the cache for the query,
+#' if it is not there then it will query OSM and
+#' update the cache
+#'
+#' @param query_vec, vector of strings to query OSM
+#' @return dataframe result from OSM with formatted location data
+batch_osm_query <- function(query_vec){
+
+ # query one at a time and append together
+ batch_resp = NA
+ for(curr_q in query_vec){
+
+ curr_resp = single_osm_query(curr_q)
+
+ batch_resp = rbind(batch_resp, curr_resp)
+
+ }
+ batch_resp = batch_resp[-1,]
+ return(batch_resp)
+
+}
+
+#' private method that runs the first population of the OSM
+#' cache.
+#' This method should not be run by users since they
+#' should always have a populated cache.
+#'
+#' @param in_dir, full location of folder that contains all location tables
+#' from pipeline step 4. Files must contain the string location_table_raw
+#' in the name
+initial_osm_query <- function(in_dir) {
+
+ # this method will just populate the cache with any locations
+ # that are missing
+
+ # people should never use this method, this is only
+ # for me to run the first instance of the cache, others
+ # should already have a populated cache file from github
+
+ # find all files that unfound locations
+ all_loc_files = list.files(in_dir,
+ pattern="location_table_raw",
+ recursive=F,
+ full.names=T)
+ if(length(all_loc_files) == 0){
+ warn_str = "No location files found. Are you supplying the correct input dir?"
+ warning(warn_str)
+ return()
+ }
+
+ # read in location files
+ all_missing_locs = NA
+ for(curr_file in all_loc_files){
+ in_df = data.frame(fread(curr_file))
+ all_missing_locs = rbind(all_missing_locs, in_df[,c("file_id", "text")])
+ }
+ all_missing_locs = all_missing_locs[-1,]
+ query_locs = unique(tolower(all_missing_locs$text))
+
+
+ batch_resp = batch_osm_query(query_locs)
+
+ # write out the frequncies of organizations,
+ # we want to make sure that the top ones are correct
+ freq_locs = as.data.frame(table(all_missing_locs$text))
+ colnames(freq_locs)[1] = "query"
+
+ cache_file = file.path(ref_data_dir, "/osm_cache.tsv")
+ cache_df = data.frame(fread(cache_file))
+ freq_locs = merge(freq_locs, cache_df)
+ freq_locs = freq_locs[order(freq_locs$Freq, decreasing=T),]
+ freq_locs$hand_edited = F
+
+ cache_edit_file = file.path(ref_data_dir, "/osm_cache_edited2.tsv")
+ write.table(freq_locs, cache_edit_file, sep="\t", quote=F, row.names=F)
+
+
+}
+
+#' private method that updates the gender cache.
+#' This method should not be run by users since they
+#' should always have a fully populated cache.
+#'
+#' @param in_dir, full location of folder that contains all location tables
+#' from pipeline step 4. Files must contain the string missed_generize_io_names
+#' in the name
query_genderize_io <- function(in_dir) {
+ # this method will just populate the cache with any locations
+ # that are missing
+
+ # people should never use this method, this is only
+ # for me to run once in a while if I scraped new articles
+
# find all files that contain missed names
missed_gender_files = list.files(in_dir,
pattern="missed_generize_io_names",
@@ -418,9 +515,9 @@ query_genderize_io <- function(in_dir) {
# make sure names weren't missed in the already existing genderize reference files
- reference_files = paste(ref_data_dir, "/genderize.tsv", sep="")
+ reference_files = file.path(ref_data_dir, "/genderize.tsv")
ref_df = data.frame(fread(reference_files))
- reference_files = paste(ref_data_dir, "/genderize_update.tsv", sep="")
+ reference_files = file.path(ref_data_dir, "/genderize_update.tsv")
ref_update_df = data.frame(fread(reference_files))
ref_df = rbind(ref_df, ref_update_df)
@@ -456,7 +553,7 @@ query_genderize_io <- function(in_dir) {
ref_update_df = unique(ref_update_df)
# now write it out
- outfile = paste(ref_data_dir, "/genderize_update.tsv", sep="")
+ outfile = file.path(ref_data_dir, "/genderize_update.tsv")
write.table(ref_update_df, outfile, sep="\t", quote=F, row.names=F)
# now delete the files